##com.oracle.truffle.r.test.S4.TestR5.testAllocation# #env0 <- new.env(); setRefClass('Foo17R5', where = env0); grep('Foo17R5', ls(topenv(parent.frame()), all.names = T), value = TRUE); ls(env0, all.names = T) character(0) [1] ".__C__Foo17R5" ".__global__" ".requireCachedGenerics" ##com.oracle.truffle.r.test.S4.TestR5.testAllocation# #{ DummyClass0 <- setRefClass('DummyClass0'); DummyClass0$new() } Reference class object of class "DummyClass0" ##com.oracle.truffle.r.test.S4.TestR5.testAllocation# #{ DummyClass1 <- setRefClass('DummyClass1'); is(DummyClass1, 'refClass') } [1] TRUE ##com.oracle.truffle.r.test.S4.TestR5.testAllocation# #{ DummyClass2 <- setRefClass('DummyClass2'); obj <- DummyClass2$new(); is(obj, 'refObject') } [1] TRUE ##com.oracle.truffle.r.test.S4.TestR5.testAllocation# #{ fooClass <- setRefClass('Foo6R5', fields = list( a = 'numeric')); fooClass$new(a = 1) } Reference class object of class "Foo6R5" Field "a": [1] 1 ##com.oracle.truffle.r.test.S4.TestR5.testAllocation# #{ fooClass <- setRefClass('Foo7R5', fields = list( a = 'numeric')); fooClass$new(1) } Reference class object of class "Foo7R5" Field "a": numeric(0) Warning message: In methods::initRefFields(.Object, classDef, selfEnv, list(...)) : unnamed arguments to $new() must be objects from a reference class; got an object of class “numeric” ##com.oracle.truffle.r.test.S4.TestR5.testAllocation# #{ setRefClass('Foo16R5'); grep('Foo16R5', ls(topenv(parent.frame()), all.names = T), value = TRUE) } [1] ".__C__Foo16R5" ##com.oracle.truffle.r.test.S4.TestR5.testAttributes# #{ clazz <- setRefClass('Foo13R5'); clazz$methods() } [1] ".objectPackage" ".objectParent" "callSuper" "copy" [5] "export" "field" "getClass" "getRefClass" [9] "import" "initFields" "show" "trace" [13] "untrace" "usingMethods" ##com.oracle.truffle.r.test.S4.TestR5.testCheckedAssign# #clazz <- setRefClass('Foo10R5', fields = list(a = 'numeric')); obj <- clazz$new(); obj$a <- 10; obj$a; obj$a <- 'hello'; obj$a [1] 10 Error: invalid assignment for reference class field ‘a’, should be from class “numeric” or a subclass (was class “character”) ##com.oracle.truffle.r.test.S4.TestR5.testCheckedAssign# #clazz <- setRefClass('Foo11R5', fields = list(a = 'character')); obj <- clazz$new(); obj$a <- 'hello'; obj$a; obj$a <- 10; obj$a [1] "hello" Error: invalid assignment for reference class field ‘a’, should be from class “character” or a subclass (was class “numeric”) ##com.oracle.truffle.r.test.S4.TestR5.testCheckedAssign# #clazz <- setRefClass('Foo8R5', fields = list(a = 'numeric')); obj <- clazz$new(); bindingIsActive('a', as.environment(obj)) [1] TRUE ##com.oracle.truffle.r.test.S4.TestR5.testCheckedAssign# #clazz <- setRefClass('Foo9R5', fields = list(a = 'numeric')); obj <- clazz$new(); bindingIsActive('a', as.environment(obj)); obj$a <- 123; bindingIsActive('a', as.environment(obj)) [1] TRUE [1] TRUE ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess#Ignored.OutputFormatting# #print(suppressMessages({clazz <- setRefClass('Foo20R5', methods = list(foo = function() NULL)); clazz$methods('foo')})) function() NULL attr(,"mayCall") character(0) attr(,"name") [1] "foo" attr(,"refClassName") [1] "Foo20R5" attr(,"superClassMethod") [1] "" attr(,"class") [1] "refMethodDef" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #print(suppressMessages({clazz <- setRefClass('Foo21R5', methods = list(foo = function() NULL)); clazz$new()$foo(); clazz$methods(foo = function(x) x); clazz$new()$foo(3)})) [1] 3 ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #{ clazz <- setRefClass('Foo14R5'); obj <- clazz$new(); obj$inexistingMethod() } Error in envRefInferField(x, what, getClass(class(x)), selfEnv) : ‘inexistingMethod’ is not a valid field or method name for reference class “Foo14R5” ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #{ clazz <- setRefClass('Foo14R5', fields = c('a')); obj <- clazz$new(); obj$a } An object of class "uninitializedField" Slot "field": [1] "a" Slot "className": [1] "ANY" ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #{ clazz <- setRefClass('Foo14R5', fields = c('a')); obj <- clazz$new(a = 1); print(obj$a); obj$a <- 'hello'; print(obj$a) } [1] 1 [1] "hello" ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #{ clazz <- setRefClass('Foo19R5'); clazz$methods('inexistingMethod') } NULL Warning message: In .getMethodDefs(methodDefs[[1]], methodsEnv) : Methods not found: “.objectPackage”, “.objectParent”, “callSuper”, “copy”, “export”, “field”, “getClass”, “getRefClass”, “import”, “initFields”, “show”, “trace”, “untrace”, “usingMethods” ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #{ clazz <- setRefClass('Foo22R5'); clazz$fields() } NULL ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #{ clazz <- setRefClass('Foo23R5', fields = c('a', 'b', 'c')); clazz$fields() } a b c "ANY" "ANY" "ANY" ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #{ clazz <- setRefClass('Foo24R5', fields = list(a = 'numeric')); clazz$fields() } a "numeric" ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #{ clazz <- setRefClass('Foo25R5', fields = list(a = 'numeric', b = 'character', c = 'raw')); clazz$fields() } a b c "numeric" "character" "raw" ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #{ clazz <- setRefClass('Foo26R5', fields = list(a = 'numeric')); clazz$lock('a'); obj <- clazz$new(); obj$a <- 10; obj$a } [1] 10 ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess# #{ clazz <- setRefClass('Foo27R5', fields = list(a = 'numeric')); clazz$lock('a'); obj <- clazz$new(); obj$a <- 10; obj$a <- 20 } Error: invalid replacement: reference class field ‘a’ is read-only ##com.oracle.truffle.r.test.S4.TestR5.testFieldAccess#Output.ImprovedErrorContext# #{ clazz <- setRefClass('Foo28R5', fields = list(a = 'numeric', b = 'character')); clazz$accessors(); clazz$methods() } Error in `substr<-`(`*tmp*`, 1, 1, value = character(0)) : replacing substrings in a non-character object ##com.oracle.truffle.r.test.S4.TestR5.testInheritance# #A0R5 <- setRefClass('A0R5', field = list(a = 'numeric')); B0R5 <- setRefClass('B0R5', contains = 'A0R5'); obj <- B0R5$new(a = 1); obj$a [1] 1 ##com.oracle.truffle.r.test.S4.TestR5.testInheritance# #A5R5 <- setRefClass('A5R5', field = c('a'), methods = list(initialize <- function() { a <<- 0 })); B5R5 <- setRefClass('B5R5', field = c('a'), methods = list(initialize <- function() { a <<- 'hello' })); C5R5 <- setRefClass('C5R5', contains = c('A5R5', 'B5R5')); obj <- C5R5$new(); obj$a <- raw(0) ##com.oracle.truffle.r.test.S4.TestR5.testInheritance# #print(suppressMessages({A1R5 <- setRefClass('A1R5', methods = list(foo = function() { print('hello') })); B1R5 <- setRefClass('B1R5', contains = 'A1R5'); obj <- B1R5$new(); obj$foo()})) [1] "hello" [1] "hello" ##com.oracle.truffle.r.test.S4.TestR5.testInheritance# #print(suppressMessages({A2R5 <- setRefClass('A2R5', methods = list(foo = function() { print('hello') })); B2R5 <- setRefClass('B2R5', methods = list(foo = function() { print('world') }), contains = 'A2R5'); obj <- B2R5$new(); obj$foo()})) [1] "world" [1] "world" ##com.oracle.truffle.r.test.S4.TestR5.testInheritance# #print(suppressMessages({A3R5 <- setRefClass('A3R5', methods = list(foo = function() { print('hello') })); B3R5 <- setRefClass('B3R5', methods = list(foo = function() { callSuper(); print('world') }), contains = 'A3R5'); obj <- B3R5$new(); obj$foo()})) [1] "hello" [1] "world" [1] "world" ##com.oracle.truffle.r.test.S4.TestR5.testInheritance#Ignored.OutputFormatting# #print(suppressMessages({{ setRefClass('A4R5', fields = c('a')); setRefClass('B4R5', contains = 'A4R5', methods = list(set_a = function(a){ a <<- a })) }})) new("refObjectGenerator", .Data = function (...) new("B4R5", ...), generator = new("refGeneratorSlot", .xData = ), className = "B4R5", package = ".GlobalEnv") attr(,"className") [1] "B4R5" attr(,"className")attr(,"package") [1] ".GlobalEnv" attr(,"package") [1] ".GlobalEnv" attr(,"generator") Reference class object of class "refGeneratorSlot" Field "def": Reference Class "B4R5": Class fields: Name: a Class: ANY Class Methods: "set_a", "import", ".objectParent", "usingMethods", "show", "getClass", "untrace", "export", ".objectPackage", "callSuper", "copy", "initFields", "getRefClass", "trace", "field" Reference Superclasses: "A4R5", "envRefClass" Field "className": [1] "B4R5" attr(,"class") [1] "refObjectGenerator" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods# #clazz <- setRefClass('Foo2R5', c('a', 'b')); obj <- clazz$new(a = 1, b = 5); obj$field('a'); obj$field('b') [1] 1 [1] 5 ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods# #clazz <- setRefClass('Foo3R5', c('a', 'b')); obj <- clazz$new(); obj$initFields(a = 5, b = 6) Reference class object of class "Foo3R5" Field "a": [1] 5 Field "b": [1] 6 ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods#Output.IgnoreWarningMessage# #print(suppressMessages({{ clazz <- setRefClass('Foo0R5', c('a', 'b')); clazz$methods(mean = function() { (a + b) / 2 }); obj <- clazz$new(a = 1, b = 5); obj$mean() }})) [1] 3 ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods# #print(suppressMessages({{ clazz <- setRefClass('Foo12R5', fields = list(a = 'numeric'), methods = list(inc = function() { a <<- a+1 })); obj <- clazz$new(a = 0); obj$inc(); obj$a }})) [1] 1 ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods# #print(suppressMessages({{ clazz <- setRefClass('Foo15R5', fields = c('a'), methods = list(initialize = function() { a <<- 123 })); obj <- clazz$new(); obj$a }})) [1] 123 ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods# #print(suppressMessages({{ clazz <- setRefClass('Foo28R5', fields = list(a = 'numeric'), methods = list(inc = function() { a <<- a+1 })); obj <- clazz$new(a = 0); obj$inc(); obj$a }})) [1] 1 ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods# #print(suppressMessages({{ setRefClass('A6R5', fields = c('a'), methods = list(initialize = function() { a <<- 'hello' })); clazz <- setRefClass('B6R5', fields = c('a'), contains = 'A6R5'); obj <- clazz$new(); obj$a }})) [1] "hello" ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods# #{ clazz <- setRefClass('Foo13R5'); obj <- clazz$new(); obj$inexistingMethod() } Error in envRefInferField(x, what, getClass(class(x)), selfEnv) : ‘inexistingMethod’ is not a valid field or method name for reference class “Foo13R5” ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods#Ignored.ImplementationError# #{ clazz <- setRefClass('Foo18R5', fields = c('a'), methods = list(initialize = function() a <<- 456, finalize = function() { print(sprintf('finalizer: %d', a)) } )); (function () { x <- clazz$new(); print('fun') })(); gc() } [1] "fun" [1] "finalizer: 456" used (Mb) gc trigger (Mb) max used (Mb) Ncells 372717 20 654365 35 654365 35.0 Vcells 773535 6 8388608 64 1849772 14.2 ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods# #{ clazz <- setRefClass('Foo1R5', c('a', 'b')); obj <- clazz$new(a = 1, b = 5); cobj <- obj$copy(); obj$a; cobj$a; obj$a <- 10; obj$a; cobj$a} [1] 1 ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods#Output.IgnoreErrorContext# #{ clazz <- setRefClass('Foo4R5', c('a', 'b')); clazz$accessors() } Error in `substr<-`(`*tmp*`, 1, 1, value = character(0)) : replacing substrings in a non-character object ##com.oracle.truffle.r.test.S4.TestR5.testInstanceMethods# #{ clazz <- setRefClass('Foo5R5', c('a', 'b')); obj <- clazz$new(a = 1, b = 5); attributes(obj$getRefClass())$className } [1] "Foo5R5" attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.S4.TestR5.testReferenceSemantics# #fooClass <- setRefClass('Foo12R5', fields = list( a = 'numeric')); obj0 <- fooClass$new(a = 1); obj1 <- obj0; obj0$a; obj1$a; obj0$a <- 999; obj0$a; obj1$a [1] 1 [1] 1 [1] 999 [1] 999 ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/NextMethod.R") } foo.bar(A, D) foo.bar(C, D) ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/NextMethod1.R") } foo.bar(A, D) foo.bar(B, D) foo.bar(A, D) foo.bar(C, D) foo.bar(C, E) foo.bar(A, D) foo.bar(B, D) ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/activeBinding0.R") } get [1] 1 set get [1] 2 ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/activeBinding1.R") } get 1 ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/activeBinding2.R") } ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/activeBinding3.R") } set get [1] 3 ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/dispatch.R") } Creating a generic function from function ‘foo.bar’ in the global environment [1] 1 [1] 2 [1] 3 [1] "primitive, A, B" [1] "primitive, B, A" ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/dispatchDefaultArgValues.R") } subsetFooMissingDrop[2,3,drop=missing] subsetFoo[2,3,drop=TRUE] ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/groupGenericS4Dispatch.R") } [1] "s4 dispatched" ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests#Output.IgnoreErrorContext# #{ source("tmptest/S4/refClasses0.R") } Error : invalid assignment for reference class field ‘aa’, should be from class “integer” or a subclass (was class “character”) Error : invalid assignment for reference class field ‘dd’, should be from class “numeric” or a subclass (was class “character”) ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/refClasses1.R") } [1] "A5R5$foo" ##com.oracle.truffle.r.test.S4.TestS4.runRSourceTests# #{ source("tmptest/S4/refClasses2.R") } ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings# #.Internal(bindingIsActive(as.name('someSymbol4'), .GlobalEnv)) Error: no binding for "someSymbol4" ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings# #bindingIsActive('someSymbol3', .GlobalEnv) Error in bindingIsActive("someSymbol3", .GlobalEnv) : no binding for "someSymbol3" ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings#Output.IgnoreErrorMessage#Context.NonShared# #lockEnvironment(.GlobalEnv); makeActiveBinding('someSymbol1', function(x) { x }, .GlobalEnv) Error in makeActiveBinding("someSymbol1", function(x) { : cannot add bindings to a locked environment Error during wrapup: cannot add bindings to a locked environment Error: no more error handlers available (recursive errors?); invoking 'abort' restart ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings# #makeActiveBinding('someSymbol10', function(x) { if(missing(x)) print('get0') else print('set0'); NULL }, .GlobalEnv); someSymbol10; someSymbol10 <- 1; makeActiveBinding('someSymbol10', function(x) { if(missing(x)) print('get1') else print('set1'); NULL }, .GlobalEnv); someSymbol10; someSymbol10 <- 1 [1] "get0" NULL [1] "set0" [1] "get1" NULL [1] "set1" ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings# #makeActiveBinding('someSymbol2', function(x) { x }, .GlobalEnv); bindingIsActive('someSymbol2', .GlobalEnv) [1] TRUE ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings# #makeActiveBinding('someSymbol6', function(x) { x }, .GlobalEnv); lockBinding('someSymbol6', .GlobalEnv); makeActiveBinding('someSymbol6', function(x) { print('hello') }, .GlobalEnv) Error in makeActiveBinding("someSymbol6", function(x) { : cannot change active binding if binding is locked ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings#Ignored.ImplementationError# #makeActiveBinding('someSymbol7', function(x) { if(missing(x)) print('get0') else print('set0') }, .GlobalEnv); someSymbol7; someSymbol7 <- 1; makeActiveBinding('someSymbol7', function(x) { if(missing(x)) print('get1') else print('set1') }, .GlobalEnv); someSymbol7; someSymbol7 <- 1 [1] "get0" [1] "set0" [1] "get1" [1] "set1" ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings# #makeActiveBinding('someSymbol8', function(x) { print('hello') }, .GlobalEnv); someSymbol9 <- 'world'; print(someSymbol8); print(someSymbol9) [1] "hello" [1] "hello" [1] "world" ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings# #makeActiveBinding('var_a', function(x) { if(missing(x)) { print('get'); return(123) } else { print('set'); return(x) } }, .GlobalEnv); inherits(var_a, 'numeric') [1] "get" [1] TRUE ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings# #someSymbol0 <- 1; makeActiveBinding('someSymbol0', function(x) { x }, .GlobalEnv) Error in makeActiveBinding("someSymbol0", function(x) { : symbol already has a regular binding ##com.oracle.truffle.r.test.S4.TestS4.testActiveBindings# #someSymbol5 <- 0; lockBinding('someSymbol5', .GlobalEnv); makeActiveBinding('someSymbol5', function(x) { x }, .GlobalEnv) Error in makeActiveBinding("someSymbol5", function(x) { : symbol already has a regular binding ##com.oracle.truffle.r.test.S4.TestS4.testAllocation# #{ new("numeric") } numeric(0) ##com.oracle.truffle.r.test.S4.TestS4.testAllocation#Output.IgnoreErrorContext# #{ setClass("foo", representation(j="numeric")); new("foo", inexisting=42) } Error in initialize(value, ...) : invalid name for slot of class “foo”: inexisting ##com.oracle.truffle.r.test.S4.TestS4.testAllocation# #{ setClass("foo", representation(j="numeric")); new("foo", j='text') } Error in validObject(.Object) : invalid class “foo” object: invalid object for slot "j" in class "foo": got class "character", should be or extend class "numeric" ##com.oracle.truffle.r.test.S4.TestS4.testAllocation# #{ setClass("foo", representation(j="numeric")); new("foo", j=42) } An object of class "foo" Slot "j": [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testAs# #{ my_as <- function(object, to) { class(object) <- to; object }; A12 <- setClass('A12', slots=c(data='numeric')); a <- A12(); x <- my_as(a, 'X'); class(a) } [1] "A12" attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.S4.TestS4.testAs# #{ setClass('A13', slots=c(data='numeric')); B13 <- setClass('B13', contains='A13'); b <- B13(data=42); as(b, 'A13') } An object of class "A13" Slot "data": [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testClassCreation# #{ setClass("foo"); setClass("bar", representation(j = "numeric"), contains = "foo"); is.null(getClass("foo")@prototype) } [1] FALSE ##com.oracle.truffle.r.test.S4.TestS4.testClassCreation# #{ setClass("foo", representation(j="numeric")); getClass("foo") } Class "foo" [in ".GlobalEnv"] Slots: Name: j Class: numeric ##com.oracle.truffle.r.test.S4.TestS4.testClassCreation# #{ setClass('foo', contains='standardGeneric'); getClass('foo') } Class "foo" [in ".GlobalEnv"] Slots: Name: .Data generic package group Class: function character character list Name: valueClass signature default skeleton Class: character character optionalMethod call Extends: Class "standardGeneric", directly Class "genericFunction", by class "standardGeneric", distance 2 Class "function", by class "standardGeneric", distance 3 Class "OptionalFunction", by class "standardGeneric", distance 4 Class "PossibleMethod", by class "standardGeneric", distance 4 Class "optionalMethod", by class "standardGeneric", distance 5 ##com.oracle.truffle.r.test.S4.TestS4.testConversions# #{ asS4(7:42) } [1] 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 [26] 32 33 34 35 36 37 38 39 40 41 42 ##com.oracle.truffle.r.test.S4.TestS4.testConversions# #{ asS4(NULL); isS4(NULL) } [1] TRUE ##com.oracle.truffle.r.test.S4.TestS4.testConversions# #{ isS4(NULL) } [1] FALSE ##com.oracle.truffle.r.test.S4.TestS4.testConversions# #{ x<-42; isS4(x) } [1] FALSE ##com.oracle.truffle.r.test.S4.TestS4.testConversions# #{ x<-42; y<-asS4(x); isS4(y) } [1] TRUE ##com.oracle.truffle.r.test.S4.TestS4.testDispatchToS3ForBuiltins# #{ setClass('TestS4S31', representation(f = 'numeric')); p <- new('TestS4S31', f = 2); `$.TestS4S31` <- function(...) 42; p$field } [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testInternalDispatch# #setClass('foo', representation(d='numeric')); setMethod(`$`, signature('foo'), function(x, name) 'FOO'); obj <- new('foo'); obj$asdf [1] "FOO" ##com.oracle.truffle.r.test.S4.TestS4.testMethods# #setGeneric('do.call', signature = c('what', 'args')) Creating a new generic function for ‘do.call’ in the global environment [1] "do.call" ##com.oracle.truffle.r.test.S4.TestS4.testMethods#Ignored.OutputFormatting# #{ gen<-function(object) 0; setGeneric("gen"); res<-print(gen); removeGeneric("gen"); res } new("standardGeneric", .Data = function (object) standardGeneric("gen"), generic = "gen", package = ".GlobalEnv", group = list(), valueClass = character(0), signature = "object", default = new("derivedDefaultMethod", .Data = function (object) 0, target = new("signature", .Data = "ANY", names = "object", package = "methods"), defined = new("signature", .Data = "ANY", names = "object", package = "methods"), generic = "gen"), skeleton = (new("derivedDefaultMethod", .Data = function (object) 0, target = new("signature", .Data = "ANY", names = "object", package = "methods"), defined = new("signature", .Data = "ANY", names = "object", package = "methods"), generic = "gen"))(object)) attr(,"generic") [1] "gen" attr(,"generic")attr(,"package") [1] ".GlobalEnv" attr(,"package") [1] ".GlobalEnv" attr(,"group") list() attr(,"valueClass") character(0) attr(,"signature") [1] "object" attr(,"default") Method Definition (Class "derivedDefaultMethod"): function (object) 0 Signatures: object target "ANY" defined "ANY" attr(,"skeleton") (new("derivedDefaultMethod", .Data = function (object) 0, target = new("signature", .Data = "ANY", names = "object", package = "methods"), defined = new("signature", .Data = "ANY", names = "object", package = "methods"), generic = "gen"))(object) attr(,"class") [1] "standardGeneric" attr(,"class")attr(,"package") [1] "methods" standardGeneric for "gen" defined from package ".GlobalEnv" function (object) standardGeneric("gen") Methods may be defined for arguments: object Use showMethods("gen") for currently available ones. ##com.oracle.truffle.r.test.S4.TestS4.testMethods# #{ gen<-function(object) 0; setGeneric("gen"); setClass("foo", representation(d="numeric")); setMethod("gen", signature(object="foo"), function(object) object@d); res<-print(gen(new("foo", d=42))); removeGeneric("gen"); res } [1] 42 [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testMethods# #{ setClass("foo"); setMethod("diag<-", "foo", function(x, value) 42); removeMethod("diag<-", "foo"); removeGeneric("diag<-"); removeClass("foo") } Creating a generic function for ‘diag<-’ from package ‘base’ in the global environment [1] TRUE ##com.oracle.truffle.r.test.S4.TestS4.testMethods# #{ setClass("foo", representation(d="numeric")); setClass("bar", contains="foo"); setGeneric("gen", function(o) standardGeneric("gen")); setMethod("gen", signature(o="foo"), function(o) "FOO"); setMethod("gen", signature(o="bar"), function(o) "BAR"); res<-print(c(gen(new("foo", d=7)), gen(new("bar", d=42)))); removeGeneric("gen"); res } [1] "FOO" "BAR" [1] "FOO" "BAR" ##com.oracle.truffle.r.test.S4.TestS4.testMethods# #{ setClass('A'); setClass('A1', contains = 'A'); setClass('A2', contains = 'A1'); setGeneric('foo', function(a, b) standardGeneric('foo')); setMethod('foo', signature('A1', 'A2'), function(a, b) '1-2'); setMethod('foo', signature('A2', 'A1'), function(a, b) '2-1'); foo(new('A2'), new('A2')) } Note: method with signature ‘A2#A1’ chosen for function ‘foo’, target signature ‘A2#A2’. "A1#A2" would also be valid [1] "2-1" ##com.oracle.truffle.r.test.S4.TestS4.testMethods# #{ setClass('A1', representation(a='numeric')); setMethod('length', 'A1', function(x) x@a); obj <- new('A1'); obj@a <- 10; length(obj) } [1] 10 ##com.oracle.truffle.r.test.S4.TestS4.testMethods# #{ setClass('A2', representation(a = 'numeric')); setMethod('rep', 'A2', function(x, a, b, c) { c(x@a, a, b, c) }); setMethod('ifelse', c(yes = 'A2'), function(test, yes, no) print(test)) } Creating a generic function for ‘ifelse’ from package ‘base’ in the global environment ##com.oracle.truffle.r.test.S4.TestS4.testMethods# #{ setGeneric("gen", function(o) standardGeneric("gen")); res<-print(setGeneric("gen", function(o) standardGeneric("gen"))); removeGeneric("gen"); res } [1] "gen" [1] "gen" ##com.oracle.truffle.r.test.S4.TestS4.testMethods#Ignored.OutputFormatting# #{ setGeneric("gen", function(object) standardGeneric("gen")); res<-print(gen); removeGeneric("gen"); res } function(object) standardGeneric("gen") attr(,"generic") [1] "gen" attr(,"generic")attr(,"package") [1] ".GlobalEnv" attr(,"package") [1] ".GlobalEnv" attr(,"group") list() attr(,"valueClass") character(0) attr(,"signature") [1] "object" attr(,"default") `\001NULL\001` attr(,"skeleton") (function (object) stop("invalid call in method dispatch to 'gen' (no default method)", domain = NA))(object) attr(,"class") [1] "standardGeneric" attr(,"class")attr(,"package") [1] "methods" standardGeneric for "gen" defined from package ".GlobalEnv" function (object) standardGeneric("gen") Methods may be defined for arguments: object Use showMethods("gen") for currently available ones. ##com.oracle.truffle.r.test.S4.TestS4.testObjectValidity# #{ check <- function(object) length(object@n) == 1; setClass('SingleInt', representation(n = 'numeric'), validity = check); new('SingleInt', n = 1) } An object of class "SingleInt" Slot "n": [1] 1 ##com.oracle.truffle.r.test.S4.TestS4.testObjectValidity# #{ check <- function(object) length(object@n) == 1; setClass('SingleInt', representation(n = 'numeric'), validity = check); new('SingleInt', n = c(1, 2)) } Error in validObject(.Object) : invalid class “SingleInt” object: FALSE ##com.oracle.truffle.r.test.S4.TestS4.testObjectValueSemantics# #{ setClass('WrappedIntVec', representation(n = 'numeric')); x0 <- new('WrappedIntVec', n = 1); x1 <- x0; x1@n <- 2; x0@n == x1@n } [1] FALSE ##com.oracle.truffle.r.test.S4.TestS4.testPrototype# #{ C11 <- setClass('C11', slots=c(data='numeric'), prototype=list(data=1)); C11() } An object of class "C11" Slot "data": [1] 1 ##com.oracle.truffle.r.test.S4.TestS4.testPrototype# #{ C11 <- setClass('C11', slots=c(data='numeric'), prototype=list(data=1)); C11(data=42) } An object of class "C11" Slot "data": [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testPrototype# #{ C11 <- setClass('C11', slots=c(data='numeric'), prototype=list(data=1)); setMethod('initialize', 'C11', function(.Object, ...) {print(.Object@data); callNextMethod(.Object, ...)}); C11() } [1] 1 An object of class "C11" Slot "data": [1] 1 ##com.oracle.truffle.r.test.S4.TestS4.testPrototype# #{ C11 <- setClass('C11', slots=c(data='numeric'), prototype=list(data=1)); setMethod('initialize', 'C11', function(.Object, ...) {print(.Object@data); callNextMethod(.Object, ...)}); C11(data=42) } [1] 1 An object of class "C11" Slot "data": [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testRegularFieldAssign# #{ setClass('TestS4CornerCases', representation(fld = 'character')); obj <- new('TestS4CornerCases', fld = 'xyz'); attr(obj, '.Data') <- new.env(); obj$fld2 <- 'value'; list(obj, as.list(attr(obj, '.Data')), obj$fld2); } [[1]] An object of class "TestS4CornerCases" Slot "fld": [1] "xyz" [[2]] [[2]]$fld2 [1] "value" [[3]] [1] "value" ##com.oracle.truffle.r.test.S4.TestS4.testRegularFieldAssign# #{ setClass('TestS4CornerCases', representation(fld = 'character')); obj <- new('TestS4CornerCases', fld = 'xyz'); attr(obj, '.xData') <- new.env(); obj$fld2 <- 'value'; list(obj, as.list(attr(obj, '.xData')), obj$fld2); } [[1]] An object of class "TestS4CornerCases" Slot "fld": [1] "xyz" [[2]] [[2]]$fld2 [1] "value" [[3]] [1] "value" ##com.oracle.truffle.r.test.S4.TestS4.testRegularFieldAssign#Output.IgnoreErrorContext# #{ setClass('TestS4CornerCases', representation(fld = 'character')); obj <- new('TestS4CornerCases', fld = 'xyz'); obj$fld2 <- 'value'; } Error in `$<-`(`*tmp*`, fld2, value = "value") : no method for assigning subsets of this S4 class ##com.oracle.truffle.r.test.S4.TestS4.testRegularFieldAssign#Output.IgnoreErrorContext# #{ setClass('TestS4CornerCases', representation(fld = 'character')); obj <- new('TestS4CornerCases', fld = 'xyz'); obj$fld2; } Error in obj$fld2 : $ operator not defined for this S4 class ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess#Output.IgnoreErrorContext# # { x<-42; attr(x, "foo")<-7; x@foo } Error: trying to get slot "foo" from an object of a basic class ("numeric") with no slots ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ `@`(getClass("ClassUnionRepresentation"), "virtual") } [1] FALSE ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ `@`(getClass("ClassUnionRepresentation"), c("virtual", "foo")) } Error: invalid type or length for slot name ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ `@`(getClass("ClassUnionRepresentation"), virtual) } [1] FALSE ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ c(42)@.Data } [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess#Output.IgnoreErrorContext# #{ c(42)@foo } Error: trying to get slot "foo" from an object of a basic class ("numeric") with no slots ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ getClass("ClassUnionRepresentation")@.S3Class } [1] "classRepresentation" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess#Output.IgnoreErrorContext# #{ getClass("ClassUnionRepresentation")@foo } Error: no slot of name "foo" for this object of class "classRepresentation" ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ getClass("ClassUnionRepresentation")@virtual } [1] FALSE ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess#Ignored.SideEffects# #{ setClass("foo", contains="numeric"); x<-new("foo"); res<-slot(x, ".Data"); removeClass("foo"); res } numeric(0) ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess#Ignored.SideEffects# #{ setClass("foo", contains="numeric"); x<-new("foo"); res<-x@.Data; removeClass("foo"); res } numeric(0) ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ setClass('A0', representation(name = 'character', age = 'numeric')); getSlots('A0') } name age "character" "numeric" ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ setClass('A1', representation(name = 'character', age = 'numeric'), prototype(name = NA_character_, age = NA_real_)); obj <- new('A1', name = 'FastR'); obj@age } [1] NA ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ setClass('A2', representation(name = 'character', age = 'numeric')); obj <- new('A2', name = 'FastR'); obj@age } numeric(0) ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ setClass('A3', representation(name = 'character', age = 'numeric')); obj <- new('A3', name = 'FastR'); slot(obj, 'age') <- 5; obj@age } [1] 5 ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ x<-42; `@`(x, ".Data") } [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ x<-42; `@`(x, .Data) } [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ x<-42; attr(x, "foo")<-7; slot(x, "foo") } [1] 7 ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ x<-42; slot(x, ".Data") } [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess#Output.IgnoreErrorContext# #{ x<-NULL; `@`(x, foo) } Error: trying to get slot "foo" from an object of a basic class ("NULL") with no slots ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess#Output.IgnoreErrorContext# #{ x<-NULL; x@foo } Error: trying to get slot "foo" from an object of a basic class ("NULL") with no slots ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess#Output.IgnoreErrorContext# #{ x<-c(42); class(x)<-"bar"; x@foo } Error: trying to get slot "foo" from an object (class "bar") that is not an S4 object ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ x<-function() 42; attr(x, "foo")<-7; y<-asS4(x); y@foo } [1] 7 ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ x<-getClass("ClassUnionRepresentation"); slot(x, "virtual") } [1] FALSE ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess#Output.IgnoreErrorContext# #{ x<-getClass("ClassUnionRepresentation"); slot(x, virtual) } Error in slot(x, virtual) : object 'virtual' not found ##com.oracle.truffle.r.test.S4.TestS4.testSlotAccess# #{ x<-paste0(".", "Data"); y<-42; slot(y, x) } [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testSlotUpdate#Output.IgnoreErrorContext# #{ x<-NULL; `@<-`(x, foo, "bar") } Error in (function (cl, name, valueClass) : ‘foo’ is not a slot in class “NULL” ##com.oracle.truffle.r.test.S4.TestS4.testSlotUpdate#Output.IgnoreErrorContext# #{ x<-NULL; x@foo<-"bar" } Error in (function (cl, name, valueClass) : ‘foo’ is not a slot in class “NULL” ##com.oracle.truffle.r.test.S4.TestS4.testSlotUpdate#Output.IgnoreErrorContext# #{ x<-function() 42; attr(x, "foo")<-7; slot(y, "foo")<-42 } Error in slot(y, "foo") <- 42 : object 'y' not found ##com.oracle.truffle.r.test.S4.TestS4.testSlotUpdate#Output.IgnoreErrorContext# #{ x<-function() 42; attr(x, "foo")<-7; x@foo<-42 } Error in (function (cl, name, valueClass) : ‘foo’ is not a slot in class “function” ##com.oracle.truffle.r.test.S4.TestS4.testSlotUpdate#Output.IgnoreErrorContext# #{ x<-function() 42; attr(x, "foo")<-7; y<-asS4(x); y@foo<-42 } Error in (function (cl, name, valueClass) : ‘foo’ is not a slot in class “function” ##com.oracle.truffle.r.test.S4.TestS4.testSlotUpdate# #{ x<-getClass("ClassUnionRepresentation"); slot(x, "virtual", check=TRUE)<-TRUE; x@virtual } [1] TRUE ##com.oracle.truffle.r.test.S4.TestS4.testSlotUpdate# #{ x<-getClass("ClassUnionRepresentation"); x@virtual<-TRUE; x@virtual } [1] TRUE ##com.oracle.truffle.r.test.S4.TestS4.testSlotUpdate# #{ x<-initialize@valueClass; initialize@valueClass<-"foo"; initialize@valueClass<-x } ##com.oracle.truffle.r.test.S4.TestS4.testStdGeneric# #{ setClass('A4', representation(a = 'numeric')); setMethod('[[', 'A4', function(x, i, j, ...) NULL); obj <- new('A4'); obj[[1]] } NULL ##com.oracle.truffle.r.test.S4.TestS4.testStdGeneric# #{ standardGeneric("") } Error in standardGeneric("") : argument to 'standardGeneric' must be a non-empty character string ##com.oracle.truffle.r.test.S4.TestS4.testStdGeneric#Output.IgnoreErrorContext# #{ standardGeneric("foo", 42) } Error: expected a generic function or a primitive for dispatch, got an object of class "numeric" ##com.oracle.truffle.r.test.S4.TestS4.testStdGeneric# #{ standardGeneric(42) } Error in standardGeneric(42) : argument to 'standardGeneric' must be a non-empty character string ##com.oracle.truffle.r.test.S4.TestS4.testStdGeneric# #{ standardGeneric(character()) } Error in standardGeneric(character()) : argument to 'standardGeneric' must be a non-empty character string ##com.oracle.truffle.r.test.S4.TestS4.testStdGeneric# #{ testStdGenericBar <- function(x = {cat('eval y\n');y}) { cat('enter bar\n'); y <- 41; cat('read y\n'); x+1 }; setGeneric('testStdGenericBar'); testStdGenericBar() } enter bar read y eval y [1] 42 ##com.oracle.truffle.r.test.S4.TestS4.testStdGeneric#Output.IgnoreErrorContext# #{ x<-42; class(x)<-character(); standardGeneric("foo", x) } Error: expected a generic function or a primitive for dispatch, got an object of class "numeric" ##com.oracle.truffle.r.test.S4.TestS4.testValidityFunction# #{ setClass('A11', slots=c(data='numeric'), validity=function(object) {class(object); TRUE}); B11 <- setClass('B11', contains='A11'); B11(data=42) } An object of class "B11" Slot "data": [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Arg.testArg1# #argv <- list(1+2i);Arg(argv[[1]]); [1] 1.107149 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Arg.testArg2# #argv <- list(c(1554.86976865791+337.57296578684i, 1953.0195914094+434.16395869265i, 2020.8001333202+267.40279521531i, 12019.4947666225+397.6223289386i, 40989.2104557418+1079.1450107273i, 59779.5384921205+1460.5074297272i, 40703.4141691824+1049.8100128697i, 12234.4562968499+469.0052365648i, 2311.58538965355+142.56529231224i, 2158.93441543181+94.80017111005i, 2768.79882180339+256.05759156168i, 3234.20673958634+282.64174433659i, 2796.76248579155+64.23534085425i, 2030.22757739534-164.56566766766i, 1522.09271008314-273.51503749101i, 1109.23177636373-215.24298332377i, 714.154122222449-75.284630456206i, 509.684427096512-24.577531288476i, 628.214718823948+42.431050163574i, 1053.2295477549+190.4802567974i, 1388.73708931304+133.04405268816i, 1213.97041311196-135.67196064028i, 790.469479873384-232.737914916798i, 503.424076694357-99.275737105817i, 430.214847703846+45.250156289826i, 640.795334515383+121.961327286573i, 794.927869993865+100.643091831764i, 554.394621183915-15.753680159958i, 286.476583987294-104.634488576316i, 232.82067569803-92.469328935268i, 229.472155078088-54.85406188579i, 253.438957119958-65.123390974834i, 285.141954428461-79.653095359009i, 257.168942241366-34.332533775171i, 214.215071612655+18.001149572355i, 199.882436088191+0i));Arg(argv[[1]]); [1] 0.21378910 0.21874682 0.13156088 0.03306939 0.02632146 0.02442670 [7] 0.02578598 0.03831602 0.06159623 0.04388244 0.09221737 0.08716990 [13] 0.02296371 -0.08088091 -0.17779914 -0.19166492 -0.10502999 -0.04818375 [19] 0.06743985 0.17891954 0.09551070 -0.11129703 -0.28633889 -0.19470278 [25] 0.10479506 0.18807855 0.12593654 -0.02840836 -0.35019211 -0.37806413 [31] -0.23464135 -0.25151740 -0.27240160 -0.13271712 0.08383610 0.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Arg.testArg3# #argv <- list(c(-12.561836573133-726.935211685406i, -19.15961591777-1315.40822424617i, -666.84872452586-2013.90899841237i, -5775.9038598237-11495.8986046958i, -19052.0606820086-36788.5714510618i, -27954.209922899-52600.8398855356i, -19930.6456597181-35739.3494902644i, -7168.9170917163-10787.9325286278i, -2331.00733468417-1545.77448035635i, -1953.77845230855-212.90200115993i, -1953.60071030304+1420.43983282655i, -1700.4015174326+2765.31423009739i, -862.10275212019+2693.95914108523i, 163.24691179114+1837.1971341258i, 824.29498680332+1155.03126302727i, 939.495937605926+679.549172893055i, 686.101881005818+305.166761591578i, 460.339323160381-14.067413050801i, 533.688543397269-293.997358985575i, 773.041200043657-698.096300485637i, 716.84959340189-1127.39175172066i, 226.23728166311-1110.40349894929i, -203.687633095422-740.924670781257i, -271.865544904439-437.858153233594i, -316.769706633022-279.671035520361i, -624.842102639273-228.211019456587i, -806.31350008813-164.912647906911i, -506.559675826232+24.376187336594i, -142.784303570554+217.087547410547i, -44.704338624059+260.225831716256i, 10.565037460572+219.942519605707i, 143.643627814428+218.823069474359i, 232.58540850813+214.905815487636i, 223.286482103748+175.139821578561i, 185.008902762186+116.519845434485i, 171.150234739785-0i));Arg(argv[[1]]); [1] -1.58807515 -1.58536083 -1.89055498 -2.03638740 -2.04864530 -2.05927874 [7] -2.07950663 -2.15731903 -2.55603846 -3.03305155 2.51291713 2.12210230 [13] 1.88051133 1.48217258 0.95096394 0.62620121 0.41850738 -0.03054928 [19] -0.50351717 -0.73449866 -1.00443433 -1.36980404 -1.83907890 -2.12644093 [25] -2.41831456 -2.79141494 -2.93984830 3.09350869 2.15258425 1.74092622 [31] 1.52279777 0.98990906 0.74591046 0.66513920 0.56204835 0.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Arg.testArg4# #argv <- list(logical(0));Arg(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Arg.testArg5# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));Arg(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_Arg.testArg6# #argv <- list(FALSE);Arg(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Arg.testArg8# #argv <- list(-1);do.call('Arg', argv) [1] 3.141593 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testConj1# #argv <- list(NA_complex_);Conj(argv[[1]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testConj2# #argv <- list(c(-1.18540307978262+0i, 1.21560120163195-1.53371687180917i, 2.77616253887119+2.49241439707552i, -0.34590612779948+5.91601304866405i, -4.79620377219434-5.1021793804514i, -0.76948538129694-3.75787028288235i, 7.35246399396265+3.06008718716048i, 3.29255418488526-1.70891939683671i, -4.06380659430245+3.06999922353505i, -3.09223641978001-1.96417605896538i, -0.92141308753853+1.40901240924205i, -2.00249720671212-2.68610936520658i, -0.36243789137685+2.82396143864819i, 0.970540333825845-0.827296527575657i, -0.71012351273056-1.58808368514905i, 0.65264999887605-1.47950735242131i, 2.37634963276553+0.56734038764123i, 1.07643410940103-0.27130380644466i, -0.75915222215558-1.26274988364837i, 0.27719717365392+1.892240358725i, -0.486365810527362+0.32331047458147i, 0.458815916572034+0.775988009981045i, -1.62795265860628+1.25968253919881i, -0.31369767965175+2.67392540646143i, 1.35480053490252+0i, -0.31369767965175-2.67392540646143i, -1.62795265860628-1.25968253919881i, 0.458815916572035-0.775988009981044i, -0.486365810527364-0.323310474581469i, 0.27719717365392-1.892240358725i, -0.75915222215558+1.26274988364837i, 1.07643410940103+0.27130380644466i, 2.37634963276553-0.56734038764123i, 0.65264999887605+1.47950735242131i, -0.71012351273056+1.58808368514905i, 0.970540333825845+0.827296527575658i, -0.36243789137685-2.82396143864819i, -2.00249720671212+2.68610936520658i, -0.92141308753853-1.40901240924205i, -3.09223641978001+1.96417605896538i, -4.06380659430245-3.06999922353505i, 3.29255418488526+1.70891939683671i, 7.35246399396266-3.06008718716047i, -0.76948538129694+3.75787028288235i, -4.79620377219434+5.10217938045139i, -0.34590612779948-5.91601304866405i, 2.77616253887119-2.49241439707552i, 1.21560120163195+1.53371687180917i));Conj(argv[[1]]); [1] -1.1854031+0.0000000i 1.2156012+1.5337169i 2.7761625-2.4924144i [4] -0.3459061-5.9160130i -4.7962038+5.1021794i -0.7694854+3.7578703i [7] 7.3524640-3.0600872i 3.2925542+1.7089194i -4.0638066-3.0699992i [10] -3.0922364+1.9641761i -0.9214131-1.4090124i -2.0024972+2.6861094i [13] -0.3624379-2.8239614i 0.9705403+0.8272965i -0.7101235+1.5880837i [16] 0.6526500+1.4795074i 2.3763496-0.5673404i 1.0764341+0.2713038i [19] -0.7591522+1.2627499i 0.2771972-1.8922404i -0.4863658-0.3233105i [22] 0.4588159-0.7759880i -1.6279527-1.2596825i -0.3136977-2.6739254i [25] 1.3548005+0.0000000i -0.3136977+2.6739254i -1.6279527+1.2596825i [28] 0.4588159+0.7759880i -0.4863658+0.3233105i 0.2771972+1.8922404i [31] -0.7591522-1.2627499i 1.0764341-0.2713038i 2.3763496+0.5673404i [34] 0.6526500-1.4795074i -0.7101235-1.5880837i 0.9705403-0.8272965i [37] -0.3624379+2.8239614i -2.0024972-2.6861094i -0.9214131+1.4090124i [40] -3.0922364-1.9641761i -4.0638066+3.0699992i 3.2925542-1.7089194i [43] 7.3524640+3.0600872i -0.7694854-3.7578703i -4.7962038-5.1021794i [46] -0.3459061+5.9160130i 2.7761625+2.4924144i 1.2156012-1.5337169i ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testConj3# #argv <- list(structure(c(0.087699990825051-0.22507396943778i, 0.543948655831334+0.33174688242063i, 0.162724647304311-0.15004931295852i, 0.433366361691124+0.22116458828042i, 0.237749303783571-0.07502465647926i, 0.322784067550914+0.11058229414021i, 0.312773960262831+0i, 0.212201773410704-0i, 0.387798616742091+0.07502465647926i, 0.101619479270494-0.11058229414021i, 0.462823273221351+0.15004931295852i, -0.008962814869716-0.22116458828042i, 0.537847929700611+0.22507396943778i, -0.119545109009926-0.33174688242063i), .Dim = c(2L, 7L)));Conj(argv[[1]]); [,1] [,2] [,3] [1,] 0.0877000+0.2250740i 0.1627246+0.1500493i 0.2377493+0.0750247i [2,] 0.5439487-0.3317469i 0.4333664-0.2211646i 0.3227841-0.1105823i [,4] [,5] [,6] [1,] 0.3127740+0i 0.3877986-0.0750247i 0.4628233-0.1500493i [2,] 0.2122018+0i 0.1016195+0.1105823i -0.0089628+0.2211646i [,7] [1,] 0.5378479-0.2250740i [2,] -0.1195451+0.3317469i ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testConj4# #argv <- list(c(1+0i, 0.985449458355365-0.138495889434283i, 0.942642872008266-0.270298493966801i, 0.874055380411015-0.389154527907249i, 0.783616834775482-0.489658143691394i, 0.676434265976222-0.567595743096322i, 0.558433187362516-0.620202886580765i, 0.435944803381395-0.646314749919218i, 0.315270204563124-0.646399711551264i, 0.202254248593737-0.622474571220695i, 0.101900933636988-0.577908912337521i, 0.018058735786294-0.517134531945579i, -0.046801131817278-0.445283024979697i, -0.091697846014566-0.367779972441526i, -0.117138246792619-0.289927334668645i, -0.125-0.21650635094611i, -0.118311211562746-0.151431445234362i, -0.1009450259937-0.097481478474725i, -0.0772542485937368-0.0561284970724482i, -0.0516755705617768-0.027476388254185i, -0.0283351996132097-0.0103131692411995i, -0.0106874359562526-0.0022716846399295i, -1.21500794451954e-03-8.496163204619e-05i, -1.21500794451956e-03+8.49616320463e-05i, -0.0106874359562525+0.0022716846399297i, -0.0283351996132096+0.0103131692411996i, -0.0516755705617767+0.0274763882541851i, -0.0772542485937367+0.0561284970724481i, -0.1009450259937+0.097481478474725i, -0.118311211562746+0.151431445234362i, -0.125+0.21650635094611i, -0.117138246792619+0.289927334668644i, -0.091697846014566+0.367779972441526i, -0.046801131817278+0.445283024979697i, 0.018058735786294+0.517134531945579i, 0.101900933636988+0.577908912337521i, 0.202254248593737+0.622474571220695i, 0.315270204563124+0.646399711551264i, 0.435944803381395+0.646314749919218i, 0.558433187362516+0.620202886580765i, 0.676434265976221+0.567595743096322i, 0.783616834775482+0.489658143691394i, 0.874055380411015+0.389154527907249i, 0.942642872008266+0.270298493966801i, 0.985449458355365+0.138495889434283i));Conj(argv[[1]]); [1] 1.000000000+0.000000000i 0.985449458+0.138495889i [3] 0.942642872+0.270298494i 0.874055380+0.389154528i [5] 0.783616835+0.489658144i 0.676434266+0.567595743i [7] 0.558433187+0.620202887i 0.435944803+0.646314750i [9] 0.315270205+0.646399712i 0.202254249+0.622474571i [11] 0.101900934+0.577908912i 0.018058736+0.517134532i [13] -0.046801132+0.445283025i -0.091697846+0.367779972i [15] -0.117138247+0.289927335i -0.125000000+0.216506351i [17] -0.118311212+0.151431445i -0.100945026+0.097481478i [19] -0.077254249+0.056128497i -0.051675571+0.027476388i [21] -0.028335200+0.010313169i -0.010687436+0.002271685i [23] -0.001215008+0.000084962i -0.001215008-0.000084962i [25] -0.010687436-0.002271685i -0.028335200-0.010313169i [27] -0.051675571-0.027476388i -0.077254249-0.056128497i [29] -0.100945026-0.097481478i -0.118311212-0.151431445i [31] -0.125000000-0.216506351i -0.117138247-0.289927335i [33] -0.091697846-0.367779972i -0.046801132-0.445283025i [35] 0.018058736-0.517134532i 0.101900934-0.577908912i [37] 0.202254249-0.622474571i 0.315270205-0.646399712i [39] 0.435944803-0.646314750i 0.558433187-0.620202887i [41] 0.676434266-0.567595743i 0.783616835-0.489658144i [43] 0.874055380-0.389154528i 0.942642872-0.270298494i [45] 0.985449458-0.138495889i ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testConj5# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));Conj(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testConj6# #argv <- list(FALSE);Conj(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testOther# #{ Conj(42L) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testOther# #{ Conj(7+42i) } [1] 7-42i ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testOther# #{ Conj(FALSE) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testOther# #{ Conj(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testOther# #{ Conj(as.complex(NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testOther# #{ Conj(as.raw(12)) } Error in Conj(as.raw(12)) : non-numeric argument to function ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testOther# #{ typeof(Conj(42L)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testOther# #{ typeof(Conj(FALSE)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Conj.testOther# #{ x<-42+2i; attr(x, "foo")<-"foo"; Conj(x) } [1] 42-2i attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_D.testD# #(df <- D(1, "x"));df(0) [1] 0 Error in df(0) : argument "df1" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_D.testD# #(df <- D(expression(x^2*sin(x)), "x"));df(0) 2 * x * sin(x) + x^2 * cos(x) Error in df(0) : argument "df1" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_D.testD# #(df <- D(quote(x^2*sin(x)), "x"));df(0) 2 * x * sin(x) + x^2 * cos(x) Error in df(0) : argument "df1" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_D.testD# #D(expression(), 'a') [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_D.testD# #g<-quote(x^2);(df <- D(g, "x"));df(0) 2 * x Error in df(0) : argument "df1" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_D.testD# #x<-1;(df <- D(x, "x"));df(0) [1] 0 Error in df(0) : argument "df1" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_Date2POSIXlt.testDate2POSIXlt1# #argv <- list(structure(c(14712, 14712), class = 'Date')); .Internal(Date2POSIXlt(argv[[1]])) [1] "2010-04-13 UTC" "2010-04-13 UTC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Date2POSIXlt.testDate2POSIXlt2# #argv <- list(structure(c(11323, NA, NA, 12717), class = 'Date')); .Internal(Date2POSIXlt(argv[[1]])) [1] "2001-01-01 UTC" NA NA "2004-10-26 UTC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Date2POSIXlt.testDate2POSIXlt3# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L), class = 'Date')); .Internal(Date2POSIXlt(argv[[1]])) POSIXlt of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Date2POSIXlt.testDate2POSIXlt4# #argv <- list(structure(c(FALSE, FALSE), class = 'Date')); .Internal(Date2POSIXlt(argv[[1]])) [1] "1970-01-01 UTC" "1970-01-01 UTC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Date2POSIXlt.testDate2POSIXlt5# #argv <- list(NULL); .Internal(Date2POSIXlt(argv[[1]])) POSIXlt of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Date2POSIXlt.testDate2POSIXlt6# #argv <- list(character(0)); .Internal(Date2POSIXlt(argv[[1]])) POSIXlt of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Date2POSIXlt.testDate2POSIXlt7# #argv <- list(structure(11323.9154302836, class = 'Date')); .Internal(Date2POSIXlt(argv[[1]])) [1] "2001-01-01 UTC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Date2POSIXlt.testDate2POSIXlt8# #argv <- list(structure(c(-21915, -21550, -21185, -20819, -20454, -20089, -19724, -19358, -18993, -18628, -18263, -17897, -17532, -17167, -16802, -16436, -16071, -15706, -15341, -14975, -14610, -14245, -13880, -13514, -13149, -12784, -12419, -12053, -11688, -11323, -10958, -10592, -10227, -9862, -9497, -9131, -8766, -8401, -8036, -7670, -7305, -6940, -6575, -6209, -5844, -5479, -5114, -4748, -4383, -4018, -3653, -3287, -2922, -2557, -2192, -1826, -1461, -1096, -731, -365, 0, 365, 730, 1096, 1461, 1826, 2191, 2557, 2922, 3287, 3652, 4018, 4383, 4748, 5113, 5479, 5844, 6209, 6574, 6940, 7305, 7670, 8035, 8401, 8766, 9131, 9496, 9862, 10227, 10592), class = 'Date')); .Internal(Date2POSIXlt(argv[[1]])) [1] "1910-01-01 UTC" "1911-01-01 UTC" "1912-01-01 UTC" "1913-01-01 UTC" [5] "1914-01-01 UTC" "1915-01-01 UTC" "1916-01-01 UTC" "1917-01-01 UTC" [9] "1918-01-01 UTC" "1919-01-01 UTC" "1920-01-01 UTC" "1921-01-01 UTC" [13] "1922-01-01 UTC" "1923-01-01 UTC" "1924-01-01 UTC" "1925-01-01 UTC" [17] "1926-01-01 UTC" "1927-01-01 UTC" "1928-01-01 UTC" "1929-01-01 UTC" [21] "1930-01-01 UTC" "1931-01-01 UTC" "1932-01-01 UTC" "1933-01-01 UTC" [25] "1934-01-01 UTC" "1935-01-01 UTC" "1936-01-01 UTC" "1937-01-01 UTC" [29] "1938-01-01 UTC" "1939-01-01 UTC" "1940-01-01 UTC" "1941-01-01 UTC" [33] "1942-01-01 UTC" "1943-01-01 UTC" "1944-01-01 UTC" "1945-01-01 UTC" [37] "1946-01-01 UTC" "1947-01-01 UTC" "1948-01-01 UTC" "1949-01-01 UTC" [41] "1950-01-01 UTC" "1951-01-01 UTC" "1952-01-01 UTC" "1953-01-01 UTC" [45] "1954-01-01 UTC" "1955-01-01 UTC" "1956-01-01 UTC" "1957-01-01 UTC" [49] "1958-01-01 UTC" "1959-01-01 UTC" "1960-01-01 UTC" "1961-01-01 UTC" [53] "1962-01-01 UTC" "1963-01-01 UTC" "1964-01-01 UTC" "1965-01-01 UTC" [57] "1966-01-01 UTC" "1967-01-01 UTC" "1968-01-01 UTC" "1969-01-01 UTC" [61] "1970-01-01 UTC" "1971-01-01 UTC" "1972-01-01 UTC" "1973-01-01 UTC" [65] "1974-01-01 UTC" "1975-01-01 UTC" "1976-01-01 UTC" "1977-01-01 UTC" [69] "1978-01-01 UTC" "1979-01-01 UTC" "1980-01-01 UTC" "1981-01-01 UTC" [73] "1982-01-01 UTC" "1983-01-01 UTC" "1984-01-01 UTC" "1985-01-01 UTC" [77] "1986-01-01 UTC" "1987-01-01 UTC" "1988-01-01 UTC" "1989-01-01 UTC" [81] "1990-01-01 UTC" "1991-01-01 UTC" "1992-01-01 UTC" "1993-01-01 UTC" [85] "1994-01-01 UTC" "1995-01-01 UTC" "1996-01-01 UTC" "1997-01-01 UTC" [89] "1998-01-01 UTC" "1999-01-01 UTC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Date2POSIXlt.testDate2POSIXlt9# #argv <- list(structure(c(11354, 11382, 11413), class = 'Date')); .Internal(Date2POSIXlt(argv[[1]])) [1] "2001-02-01 UTC" "2001-03-01 UTC" "2001-04-01 UTC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Download.testDownload# #dstF <- tempfile('fastr-download-test-'); srcF <- paste0('file:///', getwd(), '/', 'com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/bar.txt'); utils::download.file(srcF, dstF); readLines(file(dstF)) [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encoding.testEncoding# #{ x<-42; Encoding(x) } Error in Encoding(x) : a character vector argument expected ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encoding.testEncoding1# #argv <- list('Byte Code Compiler'); .Internal(Encoding(argv[[1]])) [1] "unknown" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encoding.testEncoding2#Ignored.ImplementationError# #argv <- list(c('\n', '\n', '## These cannot be run by examples() but should be OK when pasted\n', '## into an interactive R session with the tcltk package loaded\n', '\n', 'tt <- tktoplevel()\n', 'tkpack(txt.w <- tktext(tt))\n', 'tkinsert(txt.w, \'0.0\', \'plot(1:10)\')\n', '\n', '# callback function\n', 'eval.txt <- function()\n', ' eval(parse(text = tclvalue(tkget(txt.w, \'0.0\', \'end\'))))\n', 'tkpack(but.w <- tkbutton(tt, text = \'Submit\', command = eval.txt))\n', '\n', '## Try pressing the button, edit the text and when finished:\n', '\n', 'tkdestroy(tt)\n', '\n', '\n')); .Internal(Encoding(argv[[1]])) [1] "unknown" "unknown" "unknown" "unknown" "unknown" "unknown" "unknown" [8] "unknown" "unknown" "unknown" "unknown" "unknown" "unknown" "unknown" [15] "unknown" "unknown" "unknown" "unknown" "unknown" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encoding.testEncoding3#Ignored.ImplementationError# #argv <- list('detaching ‘package:nlme’, ‘package:splines’'); .Internal(Encoding(argv[[1]])) [1] "UTF-8" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encoding.testEncoding4#Ignored.ReferenceError# #argv <- list(structure(character(0), class = 'check_code_usage_in_package')); .Internal(Encoding(argv[[1]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encoding.testEncoding5# #argv <- list(structure('Type demo(PKG::FOO) to run demonstration PKG::FOO.', .Names = 'demo')); .Internal(Encoding(argv[[1]])) [1] "unknown" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encoding.testEncoding6# #argv <- list('A shell of class documentation has been written to the file ./myTst2/man/DocLink-class.Rd.\n'); .Internal(Encoding(argv[[1]])) [1] "unknown" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encoding.testEncoding7#Ignored.ImplementationError# #argv <- list(c('* Edit the help file skeletons in man, possibly combining help files for multiple functions.', '* Edit the exports in NAMESPACE, and add necessary imports.', '* Put any C/C++/Fortran code in src.', '* If you have compiled code, add a useDynLib() directive to NAMESPACE.', '* Run R CMD build to build the package tarball.', '* Run R CMD check to check the package tarball.', '', 'Read Writing R Extensions for more information.')); .Internal(Encoding(argv[[1]])) [1] "unknown" "unknown" "unknown" "unknown" "unknown" "unknown" "unknown" [8] "unknown" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encoding.testEncoding9# #argv <- structure(list(x = 'abc'), .Names = 'x');do.call('Encoding', argv) [1] "unknown" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encodingassign_.testEncoding#Output.IgnoreErrorContext# #{ x<-"foo"; Encoding(x)<-42 } Error in `Encoding<-`(`*tmp*`, value = 42) : a character vector 'value' expected ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encodingassign_.testEncoding#Output.IgnoreErrorContext# #{ x<-"foo"; Encoding(x)<-NULL } Error in `Encoding<-`(`*tmp*`, value = NULL) : a character vector 'value' expected ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encodingassign_.testEncoding#Output.IgnoreErrorContext# #{ x<-"foo"; Encoding(x)<-character() } Error in `Encoding<-`(`*tmp*`, value = character(0)) : 'value' must be of positive length ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encodingassign_.testEncoding#Output.IgnoreErrorContext# #{ x<-42; Encoding(x)<-"UTF-8" } Error in `Encoding<-`(`*tmp*`, value = "UTF-8") : a character vector argument expected ##com.oracle.truffle.r.test.builtins.TestBuiltin_Encodingassign_.testEncodingassign_1# #argv <- structure(list(x = 'abc', value = 'UTF-8'), .Names = c('x', 'value'));do.call('Encoding<-', argv) [1] "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ISOdatetime.testISOdatetime1# #argv <- structure(list(year = 1970, month = 1, day = 1, hour = 0, min = 0, sec = 0, tz = 'GMT'), .Names = c('year', 'month', 'day', 'hour', 'min', 'sec', 'tz'));do.call('ISOdatetime', argv) [1] "1970-01-01 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ISOdatetime.testISOdatetime2# #argv <- structure(list(year = 2002, month = 6, day = 24, hour = 0, min = 0, sec = 10), .Names = c('year', 'month', 'day', 'hour', 'min', 'sec'));do.call('ISOdatetime', argv) [1] "2002-06-24 00:00:10 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #Im(NaN) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #Im(c(NaN, 1+1i)) [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #Im(complex(real=c(1,2,NA), imaginary=3:1)) [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #{ Im(1) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #{ Im(1+1i) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #{ Im(NA+2i) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm#Ignored.ReferenceError# #{ Im(as.double(NA)) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #{ Im(as.raw(12)) } Error in Im(as.raw(12)) : non-numeric argument to function ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #{ Im(c(1+1i,2-2i)) } [1] 1 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #{ Im(c(1,2)) } [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm#Ignored.ReferenceError# #{ Im(c(1,NA,2)) } [1] 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #{ x <- 1:2 ; attr(x,"my") <- 2 ; Im(x) } [1] 0 0 attr(,"my") [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm# #{ x <- c(1+2i,3-4i) ; attr(x,"my") <- 2 ; Im(x) } [1] 2 -4 attr(,"my") [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm1# #argv <- list(c(0.117646597100126-0.573973479297987i, -0.740437474899139-0.482946826369552i, -0.333166449062945-0.753763230370951i, -0.256092192198247+0.707588353835588i, 0.522033838837248+0.102958580568997i, -0.651949901695459+0.059749937384601i, 0.235386572284857-0.70459646368007i, 0.077960849563711-0.71721816157401i, -0.563222209454641-0.518013590538404i, -0.068796124369349+0.97981641556181i, 0.244428915757284-0.330850507052219i, 0.451504053079215-0.090319593965852i, 0.04123292199294+0.214538826629216i, -0.422496832339625-0.738527704739573i, -0.451685375030484+0.126357395265016i, 0.375304016677864+0.436900190874168i, -0.674059300339186+0.084416799015191i, 0.739947510877334+0.418982404924464i, 0.509114684244823-0.086484623694157i, -0.535642839219739+0.289927561259502i, 0.629727249341749+0.707648659913726i, -0.262197489402468-0.502198718342861i, -0.333800277698424-0.317646103980588i, -0.422186107911717+0.317002735170286i, -0.616692335171505+0.068946145379939i, -0.136100485502624-0.487679764177213i, -0.68086000613138+0.047032323152903i, 0.296209908189768+0.585533462557103i, 0.43280012844045+0.136998748692477i, -0.680205941942733-0.256569497284745i, 0.787738847475178-0.375602871669773i, 0.76904224100091-0.561876363549783i, 0.332202578950118-0.343917234128459i, -0.983769553611346-0.088288289740869i, -0.046488672133508-0.622109071207677i, -0.280395335170247-0.088565112138884i, 0.379095891586975-0.727769566649926i, -0.372438756103829+0.630754115650567i, 0.976973386685621-0.113639895506141i, -0.150428076228347+0.615598727377677i, 0.762964492726935+0.377685645913312i, -0.7825325866026+0.365371705974346i, -0.792443423040311-0.029652870362208i, 0.265771060547393-0.106618612674382i, -0.076741350022367-0.422144111460857i, 0.120061986786934-0.623033085890884i, 0.636569674033849-0.133150964328944i, -0.145741981978782+0.529165019069452i, 0.516862044313609-0.388779864071743i, 0.368964527385086+0.089207223073295i, -0.215380507641693+0.845013004067436i, 0.065293033525315+0.962527968484271i, -0.034067253738464+0.684309429416465i, 0.328611964770906+0.215416587846774i, -0.583053183540166-0.668235480667835i, -0.782507286391418+0.318827979750013i, 0.037788399171079+0.174802700161256i, 0.310480749443137+0.074551177173735i, 0.436523478910183+0.428166764970505i, -0.458365332711106+0.02467498282614i, -0.271871452223431+0.426340387811162i, 0.590808184713385-0.344468770084509i, -0.349650387953555+0.386026568349676i, -0.865512862653374-0.265651625278222i, -0.236279568941097+0.118144511046681i, -0.197175894348552+0.134038645368463i, 0.866602113481861-0.172567291859327i, 0.031389337713892-0.607820631329035i, 0.754053785184521-0.219050378933476i, -0.499292017172261+0.168065383884658i, 0.151969488085021-0.827990593142535i, -0.266853748421854-0.866413193943766i, 0.071623062591495-0.867246686843546i, -0.788765741891382+0.508717463380604i, -0.228835546857432-0.349587041980114i, 0.500139791176978-0.016703152458872i, 0.15619107374708-0.485402548890295i, -0.369039310626083+0.398423724273751i, -0.611165916680421+0.020983586354237i, -0.399467692630093-0.421179989556223i, 0.411274074028001+0.133781691724871i, 0.573364366690245+0.328833257005489i, -0.265145056696353-0.938538703606894i, 0.387209171815106+0.750271083217101i, -0.41433994791886-0.437159533180399i, -0.476246894615578+0.331179172958982i, -0.168543113030619+0.43048451175239i, -0.594617267459511+0.211980433372292i, 0.388005062566602-0.290649953587954i, -0.013004326537709-0.490434895455784i, 0.069845221019376-0.762134635168809i, 0.243687429599092+0.756774763795962i, 0.27384734040072+0.383667165938905i, -0.51606383094478-0.601506708006782i, -0.894951082455532+0.317442909372288i, 0.5073401683933-0.213001485168032i, -0.441163216905286-0.105671334003774i, -0.343169835663372+0.597359384628839i, -0.283179001991236-0.385834501657171i, -0.517794900198098-0.36732932802092i));Im(argv[[1]]); [1] -0.57397348 -0.48294683 -0.75376323 0.70758835 0.10295858 0.05974994 [7] -0.70459646 -0.71721816 -0.51801359 0.97981642 -0.33085051 -0.09031959 [13] 0.21453883 -0.73852770 0.12635740 0.43690019 0.08441680 0.41898240 [19] -0.08648462 0.28992756 0.70764866 -0.50219872 -0.31764610 0.31700274 [25] 0.06894615 -0.48767976 0.04703232 0.58553346 0.13699875 -0.25656950 [31] -0.37560287 -0.56187636 -0.34391723 -0.08828829 -0.62210907 -0.08856511 [37] -0.72776957 0.63075412 -0.11363990 0.61559873 0.37768565 0.36537171 [43] -0.02965287 -0.10661861 -0.42214411 -0.62303309 -0.13315096 0.52916502 [49] -0.38877986 0.08920722 0.84501300 0.96252797 0.68430943 0.21541659 [55] -0.66823548 0.31882798 0.17480270 0.07455118 0.42816676 0.02467498 [61] 0.42634039 -0.34446877 0.38602657 -0.26565163 0.11814451 0.13403865 [67] -0.17256729 -0.60782063 -0.21905038 0.16806538 -0.82799059 -0.86641319 [73] -0.86724669 0.50871746 -0.34958704 -0.01670315 -0.48540255 0.39842372 [79] 0.02098359 -0.42117999 0.13378169 0.32883326 -0.93853870 0.75027108 [85] -0.43715953 0.33117917 0.43048451 0.21198043 -0.29064995 -0.49043490 [91] -0.76213464 0.75677476 0.38366717 -0.60150671 0.31744291 -0.21300149 [97] -0.10567133 0.59735938 -0.38583450 -0.36732933 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm2# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));Im(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm3# #argv <- list(FALSE);Im(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm4# #argv <- list(c(0+0i, 0.01-0i, 0.02-0i, 0.03-0i, 0.04-0i, 0.05-0i, 0.06-0i, 0.07-0i, 0.08-0i, 0.09-0i, 0.1-0i, 0.11-0i, 0.12-0i, 0.13-0i, 0.14-0i, 0.15-0i, 0.16-0i, 0.17-0i, 0.18-0i, 0.19-0i, 0.2-0i, 0.21-0i, 0.22-0i, 0.23-0i, 0.24-0i, 0.25-0i, 0.26-0i, 0.27-0i, 0.28-0i, 0.29-0i, 0.3-0i, 0.31-0i, 0.32-0i, 0.33-0i, 0.34-0i, 0.35-0i, 0.36-0i, 0.37-0i, 0.38-0i, 0.39-0i, 0.4-0i, 0.41-0i, 0.42-0i, 0.43-0i, 0.44-0i, 0.45-0i, 0.46-0i, 0.47-0i, 0.48-0i, 0.49-0i, 0.5-0i, 0.51-0i, 0.52-0i, 0.53-0i, 0.54-0i, 0.55-0i, 0.56-0i, 0.57-0i, 0.58-0i, 0.59-0i, 0.6-0i, 0.61-0i, 0.62-0i, 0.63-0i, 0.64-0i, 0.65-0i, 0.66-0i, 0.67-0i, 0.68-0i, 0.69-0i, 0.7-0i, 0.71-0i, 0.72-0i, 0.73-0i, 0.74-0i, 0.75-0i, 0.76-0i, 0.77-0i, 0.78-0i, 0.79-0i, 0.8-0i, 0.81-0i, 0.82-0i, 0.83-0i, 0.84-0i, 0.85-0i, 0.86-0i, 0.87-0i, 0.88-0i, 0.89-0i, 0.9-0i, 0.91-0i, 0.92-0i, 0.93-0i, 0.94-0i, 0.95-0i, 0.96-0i, 0.97-0i, 0.98-0i, 0.99-0i, 1-0i));Im(argv[[1]]); [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [38] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [75] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm5# #argv <- list(structure(c(3+2i, 3+2i, NA, 3+2i, 3+2i, 3+2i, 3+2i, 3+2i, 4-5i, 3-5i, NA, NA, 2-5i, 3-5i, 4-5i, 5-5i), .Dim = c(8L, 2L), .Dimnames = list(NULL, c('x1', 'x2'))));Im(argv[[1]]); x1 x2 [1,] 2 -5 [2,] 2 -5 [3,] NA NA [4,] 2 NA [5,] 2 -5 [6,] 2 -5 [7,] 2 -5 [8,] 2 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Im.testIm6# #argv <- list(c(0.923879532511287+0.38268343236509i, 0.707106781186548+0.707106781186547i, 0.38268343236509+0.923879532511287i, 0+1i, -0.38268343236509+0.923879532511287i, -0.707106781186547+0.707106781186548i, -0.923879532511287+0.38268343236509i, -1+0i, -0.923879532511287-0.38268343236509i, -0.707106781186548-0.707106781186547i, -0.38268343236509-0.923879532511287i, 0-1i, 0.38268343236509-0.923879532511287i, 0.707106781186547-0.707106781186548i, 0.923879532511287-0.38268343236509i, 1-0i));Im(argv[[1]]); [1] 0.3826834 0.7071068 0.9238795 1.0000000 0.9238795 0.7071068 [7] 0.3826834 0.0000000 -0.3826834 -0.7071068 -0.9238795 -1.0000000 [13] -0.9238795 -0.7071068 -0.3826834 0.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testLa1#Ignored.ImplementationError# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 0, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0), .Dim = c(18L, 7L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18'), c('(Intercept)', 'Rail2', 'Rail5', 'Rail1', 'Rail6', 'Rail3', 'Rail4')))); .Internal(La_qr(argv[[1]])) $qr (Intercept) Rail2 Rail5 Rail6 Rail3 Rail4 1 -4.2426407 -0.70710678 -0.70710678 -0.70710678 -0.70710678 -0.70710678 2 0.1907436 1.58113883 -0.31622777 -0.31622777 -0.31622777 -0.31622777 3 0.1907436 0.07859843 1.54919334 -0.38729833 -0.38729833 -0.38729833 4 0.1907436 -0.50414710 0.02558296 1.50000000 -0.50000000 -0.50000000 5 0.1907436 -0.50414710 0.02558296 0.03197152 1.41421356 -0.70710678 6 0.1907436 -0.50414710 0.02558296 0.03197152 0.04325864 1.22474487 7 0.1907436 0.07859843 0.08781015 0.10973805 -0.52803871 -0.09125584 8 0.1907436 0.07859843 0.08781015 0.10973805 -0.52803871 -0.09125584 9 0.1907436 0.07859843 0.08781015 0.10973805 -0.52803871 -0.09125584 10 0.1907436 0.07859843 0.08781015 0.10973805 0.14847959 -0.52033563 11 0.1907436 0.07859843 0.08781015 0.10973805 0.14847959 -0.52033563 12 0.1907436 0.07859843 0.08781015 0.10973805 0.14847959 -0.52033563 13 0.1907436 0.07859843 -0.50100587 0.01923557 0.02602643 0.04193693 14 0.1907436 0.07859843 -0.50100587 0.01923557 0.02602643 0.04193693 15 0.1907436 0.07859843 -0.50100587 0.01923557 0.02602643 0.04193693 16 0.1907436 0.07859843 0.08781015 -0.53561427 -0.04818741 -0.07764538 17 0.1907436 0.07859843 0.08781015 -0.53561427 -0.04818741 -0.07764538 18 0.1907436 0.07859843 0.08781015 -0.53561427 -0.04818741 -0.07764538 Rail1 1 -7.071068e-01 2 -3.162278e-01 3 -3.872983e-01 4 -5.000000e-01 5 -7.071068e-01 6 -1.224745e+00 7 -1.007837e-15 8 8.791506e-02 9 8.791506e-02 10 -5.023718e-01 11 -5.023718e-01 12 -5.023718e-01 13 -1.255929e-01 14 -1.255929e-01 15 -1.255929e-01 16 -3.767788e-02 17 -3.767788e-02 18 -3.767788e-02 $rank [1] 7 $qraux [1] 1.235702 1.085303 1.096263 1.033027 1.045215 1.074926 1.096389 $pivot [1] 1 2 3 5 6 7 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testLa2# #argv <- list(structure(c(-4.47213595499958, 0, -6.70820393249937, 2.23606797749979), .Dim = c(2L, 2L), .Dimnames = list(NULL, c('Intercept', 'X'))), structure(c(1, 0, 0, 1), .Dim = c(2L, 2L)), 2.22044604925031e-16); .Internal(La_solve(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] Intercept -0.2236068 -0.6708204 X 0.0000000 0.4472136 ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testLa3a# #argv <- list(structure(c(-21.2222451396881, 306.936914624821, 0, 0, 0, -101.353437863947, -21.2222451396881, 0, 0, 0, 45.8768670002026, 63.2672432400162, -11.7486843755171, 0, 0, 65.1621918666428, 125.787781278037, -111.869521123473, 61.0965873274467, -54.389932439947, -26.0785375270079, -209.347244886481, 112.817924425406, 108.385517228532, 61.0965873274467), .Dim = c(5L, 5L), .Dimnames = list(NULL, NULL)), FALSE); .Internal(La_rg(argv[[1]], argv[[2]])) $values [1] -21.22225+176.37775i -21.22225-176.37775i -11.74868+ 0.00000i [4] 61.09659+ 76.77943i 61.09659- 76.77943i $vectors [,1] [,2] [,3] [1,] 0.0000000-0.4982355i 0.0000000+0.4982355i -0.1708186+0i [2,] -0.8670417+0.0000000i -0.8670417+0.0000000i 0.4195121+0i [3,] 0.0000000+0.0000000i 0.0000000+0.0000000i 0.8915327+0i [4,] 0.0000000+0.0000000i 0.0000000+0.0000000i 0.0000000+0i [5,] 0.0000000+0.0000000i 0.0000000+0.0000000i 0.0000000+0i [,4] [,5] [1,] 0.2397502+0.0216720i 0.2397502-0.0216720i [2,] -0.0286068-0.4866225i -0.0286068+0.4866225i [3,] 0.6105037+0.0000000i 0.6105037+0.0000000i [4,] -0.0650172-0.4654553i -0.0650172+0.4654553i [5,] 0.3297248-0.0460577i 0.3297248+0.0460577i ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testLa3b# #argv <- list(structure(c(-21.2222451396881, 306.936914624821, 0, 0, 0, -101.353437863947, -21.2222451396881, 0, 0, 0, 45.8768670002026, 63.2672432400162, -11.7486843755171, 0, 0, 65.1621918666428, 125.787781278037, -111.869521123473, 61.0965873274467, -54.389932439947, -26.0785375270079, -209.347244886481, 112.817924425406, 108.385517228532, 61.0965873274467), .Dim = c(5L, 5L), .Dimnames = list(NULL, NULL)), TRUE); .Internal(La_rg(argv[[1]], argv[[2]])) $values [1] -21.22225+176.37775i -21.22225-176.37775i -11.74868+ 0.00000i [4] 61.09659+ 76.77943i 61.09659- 76.77943i $vectors NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testLa4# #argv <- list('S', structure(c(1, 0, 0, 0, 0, 1.4142135623731, 0, 0, 0, 0, 1.73205080756888, 0, 0, 0, 0, 2), .Dim = c(4L, 4L), Dimnames = list(character(0), character(0))), c(2, 1.73205080756888, 1.4142135623731, 1), structure(c(0, 0, 0, 1, 0, 0, 1, 0, 0, 1, 0, 0, 1, 0, 0, 0), .Dim = c(4L, 4L)), structure(c(0, 0, 0, 1, 0, 0, 1, 0, 0, 1, 0, 0, 1, 0, 0, 0), .Dim = c(4L, 4L))); .Internal(La_svd(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) $d [1] 2.000000 1.732051 1.414214 1.000000 $u [,1] [,2] [,3] [,4] [1,] 0 0 0 1 [2,] 0 0 1 0 [3,] 0 1 0 0 [4,] 1 0 0 0 $vt [,1] [,2] [,3] [,4] [1,] 0 0 0 1 [2,] 0 0 1 0 [3,] 0 1 0 0 [4,] 1 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testLa5# #argv <- list(structure(c(0.842723988615538, 1, 0, 1, 0.636010690700881, 1, 0, 1, 0.842723988615537), .Dim = c(3L, 3L)), FALSE); .Internal(La_rs(argv[[1]], argv[[2]])) $values [1] -0.6786181 0.8427240 2.1573527 $vectors [,1] [,2] [,3] [1,] -0.4814328 -7.071068e-01 0.5179020 [2,] 0.7324240 -1.570092e-16 0.6808488 [3,] -0.4814328 7.071068e-01 0.5179020 ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testLa6#IgnoreOS.MacOS# #jobu <-'S'<<>>x <- structure(c(FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = c(5L, 5L), .Dimnames = list(c('x1', 'x2', 'x3', 'x4', 'x5'), c('y1', 'y2', 'y3', 'y4', 'y5')))<<>>s <- c(3.37916576339493, 1.53572230863579, 1.41421356237309, 0.472012430194285, 3.04287016253022e-18)<<>>u <- structure(c(-0.38209344041777, -0.441911867608196, -0.441911867608196, -0.563415484445979, -0.38209344041777, -0.594200765232569, 0.307687929858406, 0.307687929858405, 0.32327569786942, -0.594200765232566, 0.499999999999999, -0.5, 0.500000000000001, 7.42461647718073e-16, -0.500000000000001, 0.0304967766615352, 0.45830343560406, 0.458303435604061, -0.760299819185526, 0.0304967766615352, -0.5, -0.5, 0.5, -1.11022302462516e-16, 0.5), .Dim = c(5L, 5L),.Dimnames =list(c('ux1', 'ux2', 'ux3', 'ux4', 'ux5'), c('uy1', 'uy2', 'uy3', 'uy4', 'uy5')))<<>>vt <- structure(c(-0.41058086214689, 0.0239384830763564, -0.707106781186547, -0.575195883735897, 0, -0.428282990831553, 0.611211774620929, 9.15933995315754e-16, 0.331150287627506, 0.577350269189626, -0.41058086214689, 0.0239384830763538, 0.707106781186548, -0.575195883735897, 5.55111512312578e-17, -0.226146609649533, -0.773838814336698, -1.55431223447522e-15, 0.129220226886747, 0.577350269189625, -0.654429600481086, -0.162627039715767, -5.27355936696949e-16, 0.460370514514253, -0.577350269189626), .Dim = c(5L, 5L), .Dimnames =list(c('vtx1', 'vtx2', 'vtx3', 'vtx4', 'vtx5'), c('vty1', 'vty2', 'vty3', 'vty4', 'vty5')))<<>>.Internal(La_svd(jobu, x, s, u, vt)) $d [1] 3.379166e+00 1.535722e+00 1.414214e+00 4.720124e-01 3.042870e-18 $u uy1 uy2 uy3 uy4 uy5 ux1 -0.3820934 -0.5942008 5.000000e-01 0.03049678 -5.000000e-01 ux2 -0.4419119 0.3076879 -5.000000e-01 0.45830344 -5.000000e-01 ux3 -0.4419119 0.3076879 5.000000e-01 0.45830344 5.000000e-01 ux4 -0.5634155 0.3232757 7.424616e-16 -0.76029982 -1.110223e-16 ux5 -0.3820934 -0.5942008 -5.000000e-01 0.03049678 5.000000e-01 $vt vty1 vty2 vty3 vty4 vty5 vtx1 -0.41058086 -4.282830e-01 -4.105809e-01 -2.261466e-01 -6.544296e-01 vtx2 0.02393848 6.112118e-01 2.393848e-02 -7.738388e-01 -1.626270e-01 vtx3 -0.70710678 9.159340e-16 7.071068e-01 -1.554312e-15 -5.273559e-16 vtx4 -0.57519588 3.311503e-01 -5.751959e-01 1.292202e-01 4.603705e-01 vtx5 0.00000000 5.773503e-01 5.551115e-17 5.773503e-01 -5.773503e-01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testLa7#Ignored.Unimplemented# #argv <- list(structure(c(1, 1, 3, 3), .Dim = c(2L, 2L)), 'O'); .Internal(La_dgecon(argv[[1]], argv[[2]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testLa8# #argv <- list('N', structure(c(-4, 0, 0, 0, 0, 0, 0, -406.725, 41.7955066364795, 0, 0, 0, 0, 0, -1550.79375, 381.717151319926, 49.8228991342168, 0, 0, 0, 0, -1277.325, 224.617432123818, -31.1858918860748, -282.060212912726, 0, 0, 0, -1042.675, 125.261805546114, -29.9849484767744, 164.425554254677, -170.353263600129, 0, 0, -469.696, 26.3795103523805, 4.19691803785862, -3.18974110831568, 0.0462484557378925, 1.46320172717486, 0, -7818, 18.2758880432689, 1.77525956575195, -1.45298766739792, -0.449176219307484, -0.281900648530911, -0.669305080560524), .Dim = c(7L, 7L), .Dimnames = list(c('1947', '1948', '1949', '1950', '1951', '1952', '1953'), c('(Intercept)', 'GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year'))), c(8164.12940108939, 457.24498274114, 324.584423503013, 134.312174464868, 4.95553195929945, 1.41954832076337, 0.000342370904183799), structure(0, .Dim = c(1L, 1L)), structure(0, .Dim = c(1L, 1L))); .Internal(La_svd(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) $d [1] 8.164129e+03 4.572450e+02 3.245844e+02 1.343122e+02 4.955532e+00 [6] 1.419548e+00 3.423709e-04 $u [,1] [1,] 0 $vt [,1] [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testLa9# #argv <- list(structure(c(-9.64365076099295, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, 0.103695169473043, -29634.0055320061, -5658.08855789941, 0.0595010632288954, 0.0648032071760975, 0.106336668095848, -0.0279843118999398, 0.0762911857283688, 0.188519899277481, 0.0807096390177039, 0.102801905464379, 0.158474416910002, -0.0969121832135675, -0.0447744343994132, 0.0356414154664858, 0.0276881995456826, -5.08106330417909, 3.14280306547868, 3.64768208463163, 0.0962151262827947, -0.216651778533863, -0.0914289830351174, 0.0855052819309283, -0.0191216590449975, 0.0813861110263642, 0.0607902565035442, 0.00888870310603775, -0.027169916923919, -0.0757761335977742, 0.123401654252917, -0.143330536432624, -0.207390338946085, -0.18719988871654, -0.127596387499216, 1.38045811630541, 0.0118370110620473, 0.00504893180870276, 0.0281684584122627, 0.0338400772620966, 0.0283917504929648, 0.0295082108964754, 0.0323216911133222, 0.00156557534974961, 0.00420042190203468, 0.0261141712698031, 0.00786241202554953, -3.21455025366432, -2.66432733346907, -2.18217405946767, -1.0459324747522, 2.77707906967759, -0.000588115022584812, -0.0784367740030637, -0.0437014732535189, -0.0770692424774911, 0.28985899050302, 0.307089887725235, -0.0219216068215179, -0.00578473481976082, -0.0910180640383319, 0.0166427821996303, -0.725866186311298, -0.943724610301472, -0.197997366006898, -0.255325765345392, -1.99736582726463, 1.22009740929232, -0.000660179745382102, 0.118090770461339, 0.00401505451472504, -0.265276591063721, -0.206368639386371, -0.0413572976755921, 0.0138104665936721, -0.0436723349383677, 0.0904843084594291, -0.103695169473043, 0.0314422837299137, -0.171533212490836, -0.0271695331685966, -0.234884785308008, -0.455412006973628, -0.833981960018826, -0.0497205266764892, -0.00169048456815939, 0.0359873442560765, 0.0111849454624309, 0.0174129325629219, -0.00581471075176227, 0.0183876477886015, -0.0380971980704758, -1.14064686420347, -1.21031412747477, -0.546078284372325, -0.385964209884133, -0.535335872363138, 0.617909299639904, 0.034437791264286, -2.66782912116871, -0.0707120154460491, 0.170259689757997, -0.200116024334743, -0.0120487035676503, -0.00787104751465206, -0.0743232096613527, -0.00206481367828156, -2.28129372840694, -1.27183039972242, -0.162921372163874, 0.194143545128708, 0.405329624202872, -0.0239884453210967, 0.161826508366356, 1.47283157923894, -3.57122150532158, 0.0184573285734211, 0.0768346205272587, -0.00300367200170235, -0.047539037475449, -0.0955077077363865, 0.170580587807138, -2.17759855893389, 2.82091161681306, -0.529126651121425, 0.00648102843720064, -0.227590137804697, 0.429332016819553, 0.315382802791974, -0.0921680424483324, 0.358484158960907, 2.74734594573339, -0.00180797874108619, 0.211048746835586, 0.146553774483952, 0.0892496085418831, 0.02104367339158, -1.4517323726226, 0.428703993666521, -0.198393471445493, -0.178300389025286, -0.0518091667043893, 0.133208332446864, -1.01393441911662, 0.520772381447608, 0.936102434059857, -1.6420319436063, 2.59716822825227, 0.194828402482676, 0.15057424104202, -0.232155536267878, -0.0298159890277092, -0.933256525257383, -1.20515451427884, 0.0125087156504907, 0.421920000319943, 0.452875082015975, -0.655679104390575, 0.284781968418535, 0.643096539054797, 1.38165893036928, 0.447700892848835, -0.482856979100538, 1.73960015308741, 0.115853953901054, 0.107343556163412, -0.0385322695831968, -25.7267715462619, -8.40853040573162, -1.45105839286435, -1.58984152452525, -1.59606771970776, 2.79428919380473, 0.596892611732863, -1.03839368638655, -0.0376487500979583, -0.507302835476536, 0.184174590388395, -0.70905481454677, -3.32884312972433, 0.134236291836065, -0.0993249017707237, -6.94757635469386, 1.58613921242054, 0.195741168102286, 0.638223445194413, 1.07571321411184, 0.659104584950073, 0.199707908602043, -0.565980943574209, -0.967985377031296, -0.112927393875596, -0.934672543429794, 0.198159847509218, 0.275086401661377, 3.44668029704689, -0.05066048099299, -1.65912271156868, -1.17593571026872, -0.20132598039105, -0.42732880950559, -1.20727437557593, 0.102943259109259, -0.697974199306205, 0.103630431164098, -0.0620963660266192, -0.16978912837867, 0.739571733406047, -0.872308493604205, -0.757980967070979, -2.00985526447536, -1.92891236077264), .Dim = c(15L, 15L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15'), c('(Intercept)', 'Weight', 'Cylinders4', 'Cylinders5', 'Cylinders6', 'Cylinders8', 'Cylindersrotary', 'TypeLarge', 'TypeMidsize', 'TypeSmall', 'TypeSporty', 'TypeVan', 'EngineSize', 'DriveTrainFront', 'DriveTrainRear'))), 15L); .Internal(La_chol2inv(argv[[1]], argv[[2]])) [,1] [,2] [,3] [,4] [,5] [1,] 2.4965590071 -8.201566e-04 0.0523016012 0.4022192142 0.3409468314 [2,] -0.0008201566 3.845423e-07 -0.0001626045 -0.0003075047 -0.0002391037 [3,] 0.0523016012 -1.626045e-04 0.4889367223 0.5679372764 0.5590118724 [4,] 0.4022192142 -3.075047e-04 0.5679372764 1.3222931071 0.7562299794 [5,] 0.3409468314 -2.391037e-04 0.5590118724 0.7562299794 0.8295219480 [6,] 0.4924920691 -2.376391e-04 0.6007881402 0.7961502321 0.9375053701 [7,] 0.1683740213 -2.815720e-04 0.4987634307 0.6497498645 0.5543105715 [8,] 0.1385359075 -6.068014e-05 0.0456356819 0.0017634835 0.0006493653 [9,] 0.1028864995 -7.267474e-05 0.0332661779 -0.0104852814 -0.0144679089 [10,] -0.4873635167 1.385078e-04 -0.0236009043 -0.0743816965 -0.0886858872 [11,] -0.2455229287 6.822662e-05 -0.0421570129 -0.1002164847 -0.1041840702 [12,] 0.2895850489 -1.735066e-04 0.0599747104 -0.0241643155 0.0241024386 [13,] 0.0484238662 -8.589707e-05 -0.0026498833 0.0217104177 -0.0632498776 [14,] -0.2590382380 7.588637e-05 -0.0745844777 -0.1525922985 -0.0856609399 [15,] -0.1080077058 3.191839e-05 -0.0347232084 -0.0897499775 -0.0166433957 [,6] [,7] [,8] [,9] [,10] [1,] 0.4924920691 0.168374021 1.385359e-01 1.028865e-01 -0.4873635167 [2,] -0.0002376391 -0.000281572 -6.068014e-05 -7.267474e-05 0.0001385078 [3,] 0.6007881402 0.498763431 4.563568e-02 3.326618e-02 -0.0236009043 [4,] 0.7961502321 0.649749864 1.763483e-03 -1.048528e-02 -0.0743816965 [5,] 0.9375053701 0.554310571 6.493653e-04 -1.446791e-02 -0.0886858872 [6,] 1.3631816375 0.540746428 -9.805963e-03 -1.683662e-02 -0.1440059839 [7,] 0.5407464278 1.813025568 -2.248483e-02 2.817124e-02 -0.0228482155 [8,] -0.0098059632 -0.022484827 2.838347e-01 1.353014e-01 0.0157408144 [9,] -0.0168366214 0.028171242 1.353014e-01 1.618929e-01 0.0319747141 [10,] -0.1440059839 -0.022848215 1.574081e-02 3.197471e-02 0.1938938124 [11,] -0.1247047007 -0.126043834 7.512729e-02 6.889249e-02 0.0932384548 [12,] 0.0534567046 0.031247205 1.706786e-01 1.462318e-01 -0.0148323849 [13,] -0.1514198356 0.116620884 -2.337739e-02 1.476328e-02 0.0129838100 [14,] -0.0798788632 -0.119191054 -1.741454e-02 -2.082287e-02 0.0223894841 [15,] -0.0237227955 -0.191811892 1.488125e-02 -8.749131e-03 -0.0008856606 [,11] [,12] [,13] [,14] [,15] [1,] -2.455229e-01 0.2895850489 4.842387e-02 -2.590382e-01 -1.080077e-01 [2,] 6.822662e-05 -0.0001735066 -8.589707e-05 7.588637e-05 3.191839e-05 [3,] -4.215701e-02 0.0599747104 -2.649883e-03 -7.458448e-02 -3.472321e-02 [4,] -1.002165e-01 -0.0241643155 2.171042e-02 -1.525923e-01 -8.974998e-02 [5,] -1.041841e-01 0.0241024386 -6.324988e-02 -8.566094e-02 -1.664340e-02 [6,] -1.247047e-01 0.0534567046 -1.514198e-01 -7.987886e-02 -2.372280e-02 [7,] -1.260438e-01 0.0312472047 1.166209e-01 -1.191911e-01 -1.918119e-01 [8,] 7.512729e-02 0.1706785621 -2.337739e-02 -1.741454e-02 1.488125e-02 [9,] 6.889249e-02 0.1462318412 1.476328e-02 -2.082287e-02 -8.749131e-03 [10,] 9.323845e-02 -0.0148323849 1.298381e-02 2.238948e-02 -8.856606e-04 [11,] 1.693626e-01 0.0598202992 2.551919e-03 2.934442e-02 1.370608e-03 [12,] 5.982030e-02 0.3811715228 1.876651e-02 4.995728e-02 9.725269e-02 [13,] 2.551919e-03 0.0187665055 9.947878e-02 -2.117797e-02 -4.824705e-02 [14,] 2.934442e-02 0.0499572846 -2.117797e-02 1.755687e-01 1.567252e-01 [15,] 1.370608e-03 0.0972526870 -4.824705e-02 1.567252e-01 2.687664e-01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testMisc# #{ .Internal(La_solve(structure(c(2,1)), structure(c(1, 0, 0, 1), .Dim = c(2L, 2L)), 2.22044604925031e-16)) } Error: 'a' must be a numeric matrix ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testMisc# #{ .Internal(La_solve(structure(c(2,1), .Dim = c(2,1)), structure(c(1, 0, 0, 1), .Dim = c(2L, 2L)), 2.22044604925031e-16)) } Error: 'a' (2 x 1) must be square ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testMisc# #{ .Internal(La_solve(structure(numeric(0), .Dim = c(0,0)), structure(c(1, 0, 0, 1), .Dim = c(2L, 2L)), 2.22044604925031e-16)) } Error: 'a' is 0-diml ##com.oracle.truffle.r.test.builtins.TestBuiltin_La.testMisc# #{ x<-matrix(1:4, ncol=2); solve(x) } [,1] [,2] [1,] -2 1.5 [2,] 1 -0.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Mod.testMod# #{ Mod(as.raw(12)) } Error in Mod(as.raw(12)) : non-numeric argument to function ##com.oracle.truffle.r.test.builtins.TestBuiltin_Mod.testMod# #{ is.integer(Mod(FALSE)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_Mod.testMod# #{ round(Mod(1+1i)*10000) } [1] 14142 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Mod.testMod1# #argv <- list(c(0+0i, 0-1.70620776722167e-16i, 0+3.59617031290993e-17i, 3.33066907387547e-16-8.7147236198461e-17i, 3.33066907387547e-16-4.4517026198843e-17i, 5.55111512312578e-16-1.81766397811914e-16i, -2.22044604925031e-16+3.76574595498641e-16i, 3.33066907387547e-16+2.8373545612348e-17i, -6.66133814775094e-16-1.98666621484541e-16i, 1.11022302462516e-15+1.3900988495185e-16i, 0+0i, 1.11022302462516e-16+0i, 0-4.88556439671224e-17i, 1.4432899320127e-15+5.4401706444201e-16i, -6.66133814775094e-16+4.18075097302204e-16i, -1.11022302462516e-15-3.7758383211069e-16i, 1.11022302462516e-16+1.21021749072872e-16i, 5.55111512312578e-16-9.7601012134884e-17i, 0+3.64949907708171e-17i, 2.99760216648792e-15-3.2254749723992e-16i));Mod(argv[[1]]); [1] 0.000000e+00 1.706208e-16 3.596170e-17 3.442793e-16 3.360288e-16 [6] 5.841128e-16 4.371639e-16 3.342733e-16 6.951278e-16 1.118892e-15 [11] 0.000000e+00 1.110223e-16 4.885564e-17 1.542414e-15 7.864611e-16 [16] 1.172674e-15 1.642322e-16 5.636264e-16 3.649499e-17 3.014906e-15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Mod.testMod2# #argv <- list(c(1, 1, 2, 6, 24, 120, 720, 5040, 40320, 362880, 3628800, 39916800, 479001600, 6227020800, 87178291200, 1307674368000, 20922789888000, 355687428096000, 6402373705728000, 121645100408832000));Mod(argv[[1]]); [1] 1.000000e+00 1.000000e+00 2.000000e+00 6.000000e+00 2.400000e+01 [6] 1.200000e+02 7.200000e+02 5.040000e+03 4.032000e+04 3.628800e+05 [11] 3.628800e+06 3.991680e+07 4.790016e+08 6.227021e+09 8.717829e+10 [16] 1.307674e+12 2.092279e+13 3.556874e+14 6.402374e+15 1.216451e+17 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Mod.testMod3# #argv <- list(structure(c(-0.00275201701154004+0i, 0.73267342182576+1.53432836384434i, 1.19603180664097+2.58954103250214i, -1.78551995785074+3.6927974843213i, -0.21286727655171-2.24663622584203i, 1.71166744547715-2.14519629896288i, -1.56293209739181+1.57166915011841i, -1.58375104473686+3.6829699402818i, -2.00504145581753-1.3546174582843i, 0.683574008984187+0.815530349018154i, -1.53010401343571-2.36562392372444i, 0.99061039704013+3.53936165201907i, 1.67472443120722-1.95559489480179i, -0.68341618370449-2.47704044044817i, 1.48062655483323-1.57686725056915i, 2.87299425968444+2.35949377337065i, 1.8028932379829+0.54336001329155i, 0.8410445275115-2.79377726088858i, -0.85630340738898+1.95000905938152i, -0.070268282309003-0.407774647142381i, 0.87904100084727+1.42913449570069i, -0.5398835286832-1.49689799587001i, -4.20150499254585-1.17770608296304i, -4.20150499254585+1.17770608296304i, -0.5398835286832+1.49689799587001i, 0.87904100084727-1.42913449570068i, -0.070268282309002+0.407774647142381i, -0.85630340738898-1.95000905938152i, 0.8410445275115+2.79377726088858i, 1.8028932379829-0.54336001329155i, 2.87299425968444-2.35949377337065i, 1.48062655483323+1.57686725056915i, -0.68341618370449+2.47704044044817i, 1.67472443120722+1.95559489480179i, 0.99061039704013-3.53936165201907i, -1.53010401343571+2.36562392372443i, 0.683574008984187-0.815530349018153i, -2.00504145581753+1.3546174582843i, -1.58375104473686-3.6829699402818i, -1.56293209739181-1.57166915011841i, 1.71166744547714+2.14519629896288i, -0.21286727655171+2.24663622584203i, -1.78551995785073-3.6927974843213i, 1.19603180664097-2.58954103250214i, 0.73267342182576-1.53432836384434i), .Dim = c(45L, 1L), '`scaled:center`' = -0.00488570008479763));Mod(argv[[1]]); [,1] [1,] 0.002752017 [2,] 1.700286409 [3,] 2.852405098 [4,] 4.101808721 [5,] 2.256698209 [6,] 2.744389295 [7,] 2.216506408 [8,] 4.009056616 [9,] 2.419747858 [10,] 1.064125545 [11,] 2.817338255 [12,] 3.675376153 [13,] 2.574694800 [14,] 2.569588882 [15,] 2.163045381 [16,] 3.717701828 [17,] 1.882993397 [18,] 2.917626995 [19,] 2.129739622 [20,] 0.413784720 [21,] 1.677837444 [22,] 1.591281821 [23,] 4.363443115 [24,] 4.363443115 [25,] 1.591281821 [26,] 1.677837444 [27,] 0.413784720 [28,] 2.129739622 [29,] 2.917626995 [30,] 1.882993397 [31,] 3.717701828 [32,] 2.163045381 [33,] 2.569588882 [34,] 2.574694800 [35,] 3.675376153 [36,] 2.817338255 [37,] 1.064125545 [38,] 2.419747858 [39,] 4.009056616 [40,] 2.216506408 [41,] 2.744389295 [42,] 2.256698209 [43,] 4.101808721 [44,] 2.852405098 [45,] 1.700286409 attr(,"`scaled:center`") [1] -0.0048857 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Mod.testMod4# #argv <- list(logical(0));Mod(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Mod.testMod5# #argv <- list(c(1, 1, 2, 6, 24, 120, 720, 5040, 40320, 362880, 3628800, 39916800, 479001600, 6227020800, 87178291200, 1307674368000, 20922789888000, 355687428096000, 6402373705728000, 121645100408832000, 2432902008176640000, 51090942171709440000, 1.12400072777761e+21, 2.5852016738885e+22, 6.20448401733239e+23, 1.5511210043331e+25, 4.03291461126606e+26, 1.08888694504184e+28, 3.04888344611714e+29, 8.8417619937397e+30, 2.65252859812191e+32, 8.22283865417792e+33, 2.63130836933694e+35, 8.68331761881189e+36, 2.95232799039604e+38, 1.03331479663861e+40, 3.71993326789901e+41, 1.37637530912263e+43, 5.23022617466601e+44, 2.03978820811974e+46, 8.15915283247898e+47, 3.34525266131638e+49, 1.40500611775288e+51, 6.04152630633738e+52, 2.65827157478845e+54, 1.1962222086548e+56, 5.50262215981209e+57, 2.58623241511168e+59, 1.24139155925361e+61, 6.08281864034268e+62, 3.04140932017134e+64, 1.55111875328738e+66, 8.06581751709439e+67, 4.27488328406003e+69, 2.30843697339241e+71, 1.26964033536583e+73, 7.10998587804863e+74, 4.05269195048772e+76, 2.35056133128288e+78, 1.3868311854569e+80, 8.32098711274139e+81, 5.07580213877225e+83, 3.14699732603879e+85, 1.98260831540444e+87, 1.26886932185884e+89, 8.24765059208247e+90, 5.44344939077443e+92, 3.64711109181887e+94, 2.48003554243683e+96, 1.71122452428141e+98, 1.19785716699699e+100, 8.50478588567862e+101, 6.12344583768861e+103, 4.47011546151268e+105, 3.30788544151939e+107, 2.48091408113954e+109, 1.88549470166605e+111, 1.45183092028286e+113, 1.13242811782063e+115, 8.94618213078298e+116, 7.15694570462638e+118, 5.79712602074737e+120, 4.75364333701284e+122, 3.94552396972066e+124, 3.31424013456535e+126, 2.81710411438055e+128, 2.42270953836727e+130, 2.10775729837953e+132, 1.85482642257398e+134, 1.65079551609085e+136, 1.48571596448176e+138, 1.3520015276784e+140, 1.24384140546413e+142, 1.15677250708164e+144, 1.08736615665674e+146, 1.03299784882391e+148, 9.9167793487095e+149, 9.61927596824821e+151, 9.42689044888325e+153, 9.33262154439442e+155, 9.33262154439442e+157, 9.42594775983836e+159, 9.61446671503513e+161, 9.90290071648618e+163, 1.02990167451456e+166, 1.08139675824029e+168, 1.14628056373471e+170, 1.22652020319614e+172, 1.32464181945183e+174, 1.44385958320249e+176, 1.58824554152274e+178, 1.76295255109024e+180, 1.97450685722107e+182, 2.23119274865981e+184, 2.54355973347219e+186, 2.92509369349302e+188, 3.3931086844519e+190, 3.96993716080872e+192, 4.68452584975429e+194, 5.57458576120761e+196));Mod(argv[[1]]); [1] 1.000000e+00 1.000000e+00 2.000000e+00 6.000000e+00 2.400000e+01 [6] 1.200000e+02 7.200000e+02 5.040000e+03 4.032000e+04 3.628800e+05 [11] 3.628800e+06 3.991680e+07 4.790016e+08 6.227021e+09 8.717829e+10 [16] 1.307674e+12 2.092279e+13 3.556874e+14 6.402374e+15 1.216451e+17 [21] 2.432902e+18 5.109094e+19 1.124001e+21 2.585202e+22 6.204484e+23 [26] 1.551121e+25 4.032915e+26 1.088887e+28 3.048883e+29 8.841762e+30 [31] 2.652529e+32 8.222839e+33 2.631308e+35 8.683318e+36 2.952328e+38 [36] 1.033315e+40 3.719933e+41 1.376375e+43 5.230226e+44 2.039788e+46 [41] 8.159153e+47 3.345253e+49 1.405006e+51 6.041526e+52 2.658272e+54 [46] 1.196222e+56 5.502622e+57 2.586232e+59 1.241392e+61 6.082819e+62 [51] 3.041409e+64 1.551119e+66 8.065818e+67 4.274883e+69 2.308437e+71 [56] 1.269640e+73 7.109986e+74 4.052692e+76 2.350561e+78 1.386831e+80 [61] 8.320987e+81 5.075802e+83 3.146997e+85 1.982608e+87 1.268869e+89 [66] 8.247651e+90 5.443449e+92 3.647111e+94 2.480036e+96 1.711225e+98 [71] 1.197857e+100 8.504786e+101 6.123446e+103 4.470115e+105 3.307885e+107 [76] 2.480914e+109 1.885495e+111 1.451831e+113 1.132428e+115 8.946182e+116 [81] 7.156946e+118 5.797126e+120 4.753643e+122 3.945524e+124 3.314240e+126 [86] 2.817104e+128 2.422710e+130 2.107757e+132 1.854826e+134 1.650796e+136 [91] 1.485716e+138 1.352002e+140 1.243841e+142 1.156773e+144 1.087366e+146 [96] 1.032998e+148 9.916779e+149 9.619276e+151 9.426890e+153 9.332622e+155 [101] 9.332622e+157 9.425948e+159 9.614467e+161 9.902901e+163 1.029902e+166 [106] 1.081397e+168 1.146281e+170 1.226520e+172 1.324642e+174 1.443860e+176 [111] 1.588246e+178 1.762953e+180 1.974507e+182 2.231193e+184 2.543560e+186 [116] 2.925094e+188 3.393109e+190 3.969937e+192 4.684526e+194 5.574586e+196 ##com.oracle.truffle.r.test.builtins.TestBuiltin_POSIXlt2Date.testPOSIXlt2Date1# #argv <- list(structure(list(sec = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), min = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), hour = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), mday = c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), mon = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), year = c(37L, 16L, 13L, 27L, 47L, 13L, 17L, 23L, 21L, 26L, 20L, 15L, 14L, 14L, 14L, 19L, 48L, 11L, 9L, 13L, 25L, 26L, 10L, 17L, 36L, 38L, 60L, 15L, 19L, 24L, 14L, 5L, 21L, 29L, 26L, 21L, 8L, 28L, 19L, 21L, 25L, 34L, 27L, 28L, 34L, 22L, 23L, 15L, 34L, 25L, 22L, 30L, 24L, 23L, 19L, 32L, 30L, 23L, 30L, 22L, 19L, 32L, 39L, 23L, 20L, 19L, 52L, 27L, 24L, 19L, 25L, 45L, 16L, 43L, 20L, 20L, 31L, 24L, 19L, 26L, 20L, 42L, 19L, 30L, 25L, 24L, 26L, 18L, 22L, 21L, 25L, 28L, 25L, 29L, 33L, 47L, 50L, 45L, 24L, 39L, 24L, 33L, 28L), wday = c(5L, 6L, 3L, 6L, 3L, 3L, 1L, 1L, 6L, 5L, 4L, 5L, 4L, 4L, 4L, 3L, 4L, 0L, 5L, 3L, 4L, 5L, 6L, 1L, 3L, 6L, 5L, 5L, 3L, 2L, 4L, 0L, 6L, 2L, 5L, 6L, 3L, 0L, 3L, 6L, 4L, 1L, 6L, 0L, 1L, 0L, 1L, 5L, 1L, 4L, 0L, 3L, 2L, 1L, 3L, 5L, 3L, 1L, 3L, 0L, 3L, 5L, 0L, 1L, 4L, 3L, 2L, 6L, 2L, 3L, 4L, 1L, 6L, 5L, 4L, 4L, 4L, 2L, 3L, 5L, 4L, 4L, 3L, 3L, 4L, 2L, 5L, 2L, 0L, 6L, 4L, 0L, 4L, 2L, 0L, 3L, 0L, 1L, 2L, 0L, 2L, 0L, 0L), yday = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), isdst = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'))); .Internal(POSIXlt2Date(argv[[1]])) [1] "1937-01-01" "1916-01-01" "1913-01-01" "1927-01-01" "1947-01-01" [6] "1913-01-01" "1917-01-01" "1923-01-01" "1921-01-01" "1926-01-01" [11] "1920-01-01" "1915-01-01" "1914-01-01" "1914-01-01" "1914-01-01" [16] "1919-01-01" "1948-01-01" "1911-01-01" "1909-01-01" "1913-01-01" [21] "1925-01-01" "1926-01-01" "1910-01-01" "1917-01-01" "1936-01-01" [26] "1938-01-01" "1960-01-01" "1915-01-01" "1919-01-01" "1924-01-01" [31] "1914-01-01" "1905-01-01" "1921-01-01" "1929-01-01" "1926-01-01" [36] "1921-01-01" "1908-01-01" "1928-01-01" "1919-01-01" "1921-01-01" [41] "1925-01-01" "1934-01-01" "1927-01-01" "1928-01-01" "1934-01-01" [46] "1922-01-01" "1923-01-01" "1915-01-01" "1934-01-01" "1925-01-01" [51] "1922-01-01" "1930-01-01" "1924-01-01" "1923-01-01" "1919-01-01" [56] "1932-01-01" "1930-01-01" "1923-01-01" "1930-01-01" "1922-01-01" [61] "1919-01-01" "1932-01-01" "1939-01-01" "1923-01-01" "1920-01-01" [66] "1919-01-01" "1952-01-01" "1927-01-01" "1924-01-01" "1919-01-01" [71] "1925-01-01" "1945-01-01" "1916-01-01" "1943-01-01" "1920-01-01" [76] "1920-01-01" "1931-01-01" "1924-01-01" "1919-01-01" "1926-01-01" [81] "1920-01-01" "1942-01-01" "1919-01-01" "1930-01-01" "1925-01-01" [86] "1924-01-01" "1926-01-01" "1918-01-01" "1922-01-01" "1921-01-01" [91] "1925-01-01" "1928-01-01" "1925-01-01" "1929-01-01" "1933-01-01" [96] "1947-01-01" "1950-01-01" "1945-01-01" "1924-01-01" "1939-01-01" [101] "1924-01-01" "1933-01-01" "1928-01-01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_POSIXlt2Date.testPOSIXlt2Date10# #argv <- list(structure(list(sec = 33.1798663139343, min = 47L, hour = 14L, mday = 17L, mon = 2L, year = 114L, wday = 1L, yday = 75L, isdst = 1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT'))); .Internal(POSIXlt2Date(argv[[1]])) [1] "2014-03-17" ##com.oracle.truffle.r.test.builtins.TestBuiltin_POSIXlt2Date.testPOSIXlt2Date2# #argv <- list(structure(list(sec = c(0, NA), min = c(0L, NA), hour = c(0L, NA), mday = c(6L, NA), mon = c(10L, NA), year = c(107L, NA), wday = c(2L, NA), yday = c(309L, NA), isdst = c(0L, -1L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'))); .Internal(POSIXlt2Date(argv[[1]])) [1] "2007-11-06" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_POSIXlt2Date.testPOSIXlt2Date3# #argv <- list(structure(list(sec = numeric(0), min = integer(0), hour = integer(0), mday = integer(0), mon = integer(0), year = integer(0), wday = integer(0), yday = integer(0), isdst = integer(0)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'))); .Internal(POSIXlt2Date(argv[[1]])) Date of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_POSIXlt2Date.testPOSIXlt2Date4# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1L, mon = 0L, year = 79L, wday = 1L, yday = 0L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'))); .Internal(POSIXlt2Date(argv[[1]])) [1] "1979-01-01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_POSIXlt2Date.testPOSIXlt2Date5# #argv <- list(structure(list(sec = c(0, NA, NA, 0), min = c(0L, NA, NA, 0L), hour = c(0L, NA, NA, 0L), mday = c(1L, NA, NA, 26L), mon = c(0L, NA, NA, 9L), year = c(101L, NA, NA, 104L), wday = c(1L, NA, NA, 2L), yday = c(0L, NA, NA, 299L), isdst = c(0L, -1L, -1L, 0L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT')); .Internal(POSIXlt2Date(argv[[1]])) [1] "2001-01-01" NA NA "2004-10-26" ##com.oracle.truffle.r.test.builtins.TestBuiltin_POSIXlt2Date.testPOSIXlt2Date6# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1L, mon = c(0, 3, 6, 9, 12, 15, 18, 21, 24, 27, 30, 33, 36), year = 100L, wday = 6L, yday = 0L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'UTC')); .Internal(POSIXlt2Date(argv[[1]])) [1] "2000-01-01" "2000-04-01" "2000-07-01" "2000-10-01" "2001-01-01" [6] "2001-04-01" "2001-07-01" "2001-10-01" "2002-01-01" "2002-04-01" [11] "2002-07-01" "2002-10-01" "2003-01-01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_POSIXlt2Date.testPOSIXlt2Date7# #argv <- list(structure(list(sec = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), min = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), hour = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), mday = 1, mon = c(0, 0.5, 1, 1.5, 2, 2.5, 3), year = c(101, 101, 101, 101, 101, 101, 101, 102, 102, 102, 102, 102, 102, 102), wday = c(3L, 0L, 6L, 4L, 2L, 0L, 5L, 3L, 1L, 6L, 4L), yday = c(9L, 111L, 12L, 24L, 36L, 48L, 60L, 72L, 84L, 96L, 108L), isdst = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'UTC')); .Internal(POSIXlt2Date(argv[[1]])) [1] "2001-01-01" "2001-01-01" "2001-02-01" "2001-02-01" "2001-03-01" [6] "2001-03-01" "2001-04-01" "2002-01-01" "2002-01-01" "2002-02-01" [11] "2002-02-01" "2002-03-01" "2002-03-01" "2002-04-01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_POSIXlt2Date.testPOSIXlt2Date8# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1L, mon = 0L, year = 109L, wday = 4L, yday = 0L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'))); .Internal(POSIXlt2Date(argv[[1]])) [1] "2009-01-01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_POSIXlt2Date.testPOSIXlt2Date9# #argv <- list(structure(list(sec = c(0, 0, 0, 0, 0), min = c(0L, 0L, 0L, 0L, 0L), hour = c(0L, 0L, 0L, 0L, 0L), mday = 22:26, mon = c(3L, 3L, 3L, 3L, 3L), year = c(108L, 108L, 108L, 108L, 108L), wday = 2:6, yday = 112:116, isdst = c(-1L, -1L, -1L, -1L, -1L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT')); .Internal(POSIXlt2Date(argv[[1]])) [1] "2008-04-22" "2008-04-23" "2008-04-24" "2008-04-25" "2008-04-26" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Primitive.testPrimitive1# #.Primitive('any') function (..., na.rm = FALSE) .Primitive("any") ##com.oracle.truffle.r.test.builtins.TestBuiltin_Primitive.testPrimitive1# #.Primitive('complex') Error in .Primitive("complex") : no such primitive function ##com.oracle.truffle.r.test.builtins.TestBuiltin_Primitive.testPrimitive1# #.Primitive('foo') Error in .Primitive("foo") : no such primitive function ##com.oracle.truffle.r.test.builtins.TestBuiltin_Primitive.testPrimitive1# #.Primitive(1) Error in .Primitive(1) : string argument required ##com.oracle.truffle.r.test.builtins.TestBuiltin_Primitive.testPrimitive1# #.Primitive(c('c', 'b')) Error in .Primitive(c("c", "b")) : string argument required ##com.oracle.truffle.r.test.builtins.TestBuiltin_Primitive.testPrimitive1#Ignored.ImplementationError# #argv <- list('c');.Primitive(argv[[1]]); function (...) .Primitive("c") ##com.oracle.truffle.r.test.builtins.TestBuiltin_RNGkind.testArgsCast#Output.IgnoreErrorMessage# #.Internal(RNGkind('abc', NULL, NULL)) Error: RNGkind: unimplemented RNG kind -2147483648 In addition: Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_RNGkind.testArgsCast# #.Internal(RNGkind(1L, 1L, NULL)) [1] 3 4 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_RNGkind.testArgsCast#Output.IgnoreErrorMessage# #.Internal(RNGkind(NULL, 'abc', NULL)) Error: invalid Normal type in 'RNGkind' In addition: Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_RNGkind.testArgsCast# #.Internal(RNGkind(NULL, NULL, NULL)) [1] 3 4 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #Re(NaN) [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #Re(c(NaN, 1+1i)) [1] NaN 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #{ Re(1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #{ Re(1+1i) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #{ Re(NA+2i) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #{ Re(as.double(NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #{ Re(as.raw(12)) } Error in Re(as.raw(12)) : non-numeric argument to function ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #{ Re(c(1+1i,2-2i)) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #{ Re(c(1,2)) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #{ Re(c(1,NA,2)) } [1] 1 NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #{ x <- 1:2 ; attr(x,"my") <- 2 ; Re(x) } [1] 1 2 attr(,"my") [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe# #{ x <- c(1+2i,3-4i) ; attr(x,"my") <- 2 ; Re(x) } [1] 1 3 attr(,"my") [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe1# #argv <- list(c(0.997564050259824+0.069756473744125i, 0.987588409757226+0.069058909006684i, 0.977612769254628+0.068361344269243i, 0.96763712875203+0.067663779531802i, 0.957661488249431+0.06696621479436i, 0.947685847746833+0.066268650056919i, 0.937710207244235+0.065571085319478i, 0.927734566741637+0.064873520582037i, 0.917758926239038+0.064175955844595i, 0.90778328573644+0.063478391107154i, 0.897807645233842+0.062780826369713i, 0.887832004731244+0.062083261632272i, 0.877856364228645+0.06138569689483i, 0.867880723726047+0.060688132157389i, 0.857905083223449+0.059990567419948i, 0.847929442720851+0.059293002682507i, 0.837953802218252+0.058595437945065i, 0.827978161715654+0.057897873207624i, 0.818002521213056+0.057200308470183i, 0.808026880710458+0.056502743732742i, 0.79805124020786+0.0558051789953i, 0.788075599705261+0.055107614257859i, 0.778099959202663+0.054410049520418i, 0.768124318700065+0.053712484782976i, 0.758148678197466+0.053014920045535i, 0.748173037694868+0.052317355308094i, 0.73819739719227+0.051619790570653i, 0.728221756689672+0.050922225833211i, 0.718246116187073+0.05022466109577i, 0.708270475684475+0.049527096358329i, 0.698294835181877+0.048829531620888i, 0.688319194679279+0.048131966883446i, 0.67834355417668+0.047434402146005i, 0.668367913674082+0.046736837408564i, 0.658392273171484+0.046039272671123i, 0.648416632668886+0.045341707933681i, 0.638440992166287+0.04464414319624i, 0.628465351663689+0.043946578458799i, 0.618489711161091+0.043249013721358i, 0.608514070658493+0.042551448983916i, 0.598538430155894+0.041853884246475i, 0.588562789653296+0.041156319509034i, 0.578587149150698+0.040458754771593i, 0.5686115086481+0.039761190034151i, 0.558635868145502+0.03906362529671i, 0.548660227642903+0.038366060559269i, 0.538684587140305+0.037668495821828i, 0.528708946637707+0.036970931084386i, 0.518733306135109+0.036273366346945i, 0.50875766563251+0.035575801609504i, 0.498782025129912+0.034878236872063i, 0.488806384627314+0.034180672134621i, 0.478830744124716+0.03348310739718i, 0.468855103622117+0.032785542659739i, 0.458879463119519+0.032087977922298i, 0.448903822616921+0.031390413184856i, 0.438928182114323+0.030692848447415i, 0.428952541611724+0.029995283709974i, 0.418976901109126+0.029297718972533i, 0.409001260606528+0.028600154235091i, 0.39902562010393+0.02790258949765i, 0.389049979601331+0.027205024760209i, 0.379074339098733+0.026507460022768i, 0.369098698596135+0.025809895285326i, 0.359123058093537+0.025112330547885i, 0.349147417590938+0.024414765810444i, 0.33917177708834+0.023717201073003i, 0.329196136585742+0.023019636335561i, 0.319220496083144+0.02232207159812i, 0.309244855580545+0.021624506860679i, 0.299269215077947+0.020926942123238i, 0.289293574575349+0.020229377385796i, 0.279317934072751+0.019531812648355i, 0.269342293570153+0.018834247910914i, 0.259366653067554+0.018136683173473i, 0.249391012564956+0.017439118436031i, 0.239415372062358+0.01674155369859i, 0.22943973155976+0.016043988961149i, 0.219464091057161+0.015346424223708i, 0.209488450554563+0.014648859486266i, 0.199512810051965+0.013951294748825i, 0.189537169549367+0.013253730011384i, 0.179561529046768+0.012556165273943i, 0.16958588854417+0.011858600536501i, 0.159610248041572+0.01116103579906i, 0.149634607538974+0.010463471061619i, 0.139658967036375+0.009765906324178i, 0.129683326533777+0.009068341586736i, 0.119707686031179+0.008370776849295i, 0.109732045528581+0.007673212111854i, 0.0997564050259824+0.0069756473744125i, 0.0897807645233842+0.0062780826369713i, 0.0798051240207859+0.00558051789953i, 0.0698294835181877+0.0048829531620888i, 0.0598538430155895+0.0041853884246475i, 0.0498782025129912+0.0034878236872063i, 0.039902562010393+0.002790258949765i, 0.0299269215077947+0.0020926942123238i, 0.0199512810051965+0.0013951294748825i, 0.00997564050259824+0.00069756473744125i, 0+0i));Re(argv[[1]]); [1] 0.997564050 0.987588410 0.977612769 0.967637129 0.957661488 0.947685848 [7] 0.937710207 0.927734567 0.917758926 0.907783286 0.897807645 0.887832005 [13] 0.877856364 0.867880724 0.857905083 0.847929443 0.837953802 0.827978162 [19] 0.818002521 0.808026881 0.798051240 0.788075600 0.778099959 0.768124319 [25] 0.758148678 0.748173038 0.738197397 0.728221757 0.718246116 0.708270476 [31] 0.698294835 0.688319195 0.678343554 0.668367914 0.658392273 0.648416633 [37] 0.638440992 0.628465352 0.618489711 0.608514071 0.598538430 0.588562790 [43] 0.578587149 0.568611509 0.558635868 0.548660228 0.538684587 0.528708947 [49] 0.518733306 0.508757666 0.498782025 0.488806385 0.478830744 0.468855104 [55] 0.458879463 0.448903823 0.438928182 0.428952542 0.418976901 0.409001261 [61] 0.399025620 0.389049980 0.379074339 0.369098699 0.359123058 0.349147418 [67] 0.339171777 0.329196137 0.319220496 0.309244856 0.299269215 0.289293575 [73] 0.279317934 0.269342294 0.259366653 0.249391013 0.239415372 0.229439732 [79] 0.219464091 0.209488451 0.199512810 0.189537170 0.179561529 0.169585889 [85] 0.159610248 0.149634608 0.139658967 0.129683327 0.119707686 0.109732046 [91] 0.099756405 0.089780765 0.079805124 0.069829484 0.059853843 0.049878203 [97] 0.039902562 0.029926922 0.019951281 0.009975641 0.000000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe2# #argv <- list(structure(c(3+2i, 3+2i, NA, 3+2i, 3+2i, 3+2i, 3+2i, 3+2i, 4-5i, 3-5i, NA, NA, 2-5i, 3-5i, 4-5i, 5-5i), .Dim = c(8L, 2L), .Dimnames = list(NULL, c('x1', 'x2'))));Re(argv[[1]]); x1 x2 [1,] 3 4 [2,] 3 3 [3,] NA NA [4,] 3 NA [5,] 3 2 [6,] 3 3 [7,] 3 4 [8,] 3 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe3# #argv <- list(c(-0.1-0.9i, -0.2-0.8i, -0.3-0.7i, -0.4-0.6i, -0.1-0.5i, -0.2-0.4i, -0.3-0.3i, -0.4-0.2i, -0.1-0.1i));Re(argv[[1]]); [1] -0.1 -0.2 -0.3 -0.4 -0.1 -0.2 -0.3 -0.4 -0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe4# #argv <- list(c(0.923879532511287+0.38268343236509i, 0.707106781186548+0.707106781186547i, 0.38268343236509+0.923879532511287i, 0+1i, -0.38268343236509+0.923879532511287i, -0.707106781186547+0.707106781186548i, -0.923879532511287+0.38268343236509i, -1+0i, -0.923879532511287-0.38268343236509i, -0.707106781186548-0.707106781186547i, -0.38268343236509-0.923879532511287i, 0-1i, 0.38268343236509-0.923879532511287i, 0.707106781186547-0.707106781186548i, 0.923879532511287-0.38268343236509i, 1-0i));Re(argv[[1]]); [1] 0.9238795 0.7071068 0.3826834 0.0000000 -0.3826834 -0.7071068 [7] -0.9238795 -1.0000000 -0.9238795 -0.7071068 -0.3826834 0.0000000 [13] 0.3826834 0.7071068 0.9238795 1.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe5# #argv <- list(logical(0));Re(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe6# #argv <- list(FALSE);Re(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Re.testRe7# #argv <- list(c(0.00086580086580088+0i, 0.00259740259740261+0i, 0.00519480519480521+0i, 0.00865800865800867+0i, 0.012987012987013+0i, 0.0181818181818182+0i, 0.0242424242424242+0i, 0.0303030303030303+0i, 0.0363636363636363+0i, 0.0424242424242424+0i, 0.0484848484848484+0i, 0.0536796536796536+0i, 0.058008658008658+0i, 0.0614718614718614+0i, 0.064069264069264+0i, 0.0649350649350649+0i, 0.064069264069264+0i, 0.0614718614718614+0i, 0.058008658008658+0i, 0.0536796536796536+0i, 0.0484848484848485+0i, 0.0424242424242424+0i, 0.0363636363636363+0i, 0.0303030303030303+0i, 0.0242424242424242+0i, 0.0181818181818182+0i, 0.012987012987013+0i, 0.00865800865800867+0i, 0.00519480519480521+0i, 0.00259740259740261+0i, 0.000865800865800882+0i));Re(argv[[1]]); [1] 0.0008658009 0.0025974026 0.0051948052 0.0086580087 0.0129870130 [6] 0.0181818182 0.0242424242 0.0303030303 0.0363636364 0.0424242424 [11] 0.0484848485 0.0536796537 0.0580086580 0.0614718615 0.0640692641 [16] 0.0649350649 0.0640692641 0.0614718615 0.0580086580 0.0536796537 [21] 0.0484848485 0.0424242424 0.0363636364 0.0303030303 0.0242424242 [26] 0.0181818182 0.0129870130 0.0086580087 0.0051948052 0.0025974026 [31] 0.0008658009 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Recall.testRecall# #{ Recall(10) } Error in Recall(10) : 'Recall' called from outside a closure ##com.oracle.truffle.r.test.builtins.TestBuiltin_Recall.testRecall# #{ f <- function(tarDepth,curDepth) { if (tarDepth == curDepth) {curDepth} else {Recall(tarDepth,curDepth+1)}}; f(3,0) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Recall.testRecall# #{ f<-function(i) { if (i==1) { 1 } else if (i==2) { 1 } else { Recall(i-1) + Recall(i-2) } } ; f(10) } [1] 55 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Recall.testRecall# #{ f<-function(i) { if(i<=1) 1 else i*Recall(i-1) } ; f(10) } [1] 3628800 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Recall.testRecall# #{ f<-function(i) { if(i<=1) 1 else i*Recall(i-1) } ; g <- f ; f <- sum ; g(10) } [1] 3628800 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Reduce.testReduce1# #argv <- structure(list(f = '+', x = 1:7, accumulate = TRUE), .Names = c('f', 'x', 'accumulate'));do.call('Reduce', argv) [1] 1 3 6 10 15 21 28 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Reduce.testReduce2# #argv <- structure(list(f = function(f, ...) f(...), x = list(.Primitive('log'), .Primitive('exp'), .Primitive('acos'), .Primitive('cos')), init = 0, right = TRUE), .Names = c('f', 'x', 'init', 'right'));do.call('Reduce', argv) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_SplineCoef.testNull# #.Call(stats:::C_SplineCoef, 0, 0, NULL) Error: inputs of different lengths ##com.oracle.truffle.r.test.builtins.TestBuiltin_SplineCoef.testSimple# #.Call(stats:::C_SplineCoef, 0, 0, 0) $method [1] 0 $n [1] 1 $x [1] 0 $y [1] 0 $b [1] 0 $c [1] 0 $d [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syschmod.testSyschmod1#Ignored.SideEffects# #argv <- list(character(0), structure(integer(0), class = 'octmode'), TRUE); .Internal(Sys.chmod(argv[[1]], argv[[2]], argv[[3]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysgetenv.testEnvVars# #{ Sys.getenv("FASTR_SHOULD_NOT_BE_DEFINED") } [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysgetenv.testEnvVars# #{ Sys.getenv("FASTR_SHOULD_NOT_BE_DEFINED", unset="UNSET") } [1] "UNSET" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysgetenv.testEnvVars# #{ Sys.setenv("a") } Error in Sys.setenv("a") : all arguments must be named ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysgetenv.testEnvVars# #{ Sys.setenv(FASTR_A="a"); Sys.getenv("FASTR_A"); } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysgetenv.testEnvVars# #{ Sys.setenv(FASTR_A="a", FASTR_B="b"); Sys.getenv(c("FASTR_A", "FASTR_B")); } FASTR_A FASTR_B "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysgetenv.testSysgetenv1# #argv <- list('R_PAPERSIZE', ''); .Internal(Sys.getenv(argv[[1]], argv[[2]])) %in% c('a4', 'letter') [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysgetenv.testSysgetenv2# #argv <- list('SWEAVE_OPTIONS', NA_character_); .Internal(Sys.getenv(argv[[1]], argv[[2]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysglob.testSysglob1# #argv <- list('/home/lzhao/hg/r-instrumented/src/library/utils/man/unix/*.rd', FALSE); .Internal(Sys.glob(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysreadlink.testSysreadlink1# #argv <- list(character(0)); .Internal(Sys.readlink(argv[[1]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetenv.testSyssetenv1#Ignored.SideEffects# #argv <- list('_R_NS_LOAD_', 'Matrix'); .Internal(Sys.setenv(argv[[1]], argv[[2]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetenv.testSyssetenv2#Ignored.SideEffects# #argv <- list('_R_NS_LOAD_', 'methods'); .Internal(Sys.setenv(argv[[1]], argv[[2]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetenv.testSyssetenv3#Ignored.SideEffects# #argv <- list(c('BIBINPUTS', 'add'), c('.:.:/home/lzhao/hg/r-instrumented/share/texmf/bibtex/bib::/home/lzhao/hg/r-instrumented/share/texmf/bibtex/bib:', 'TRUE')); .Internal(Sys.setenv(argv[[1]], argv[[2]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetenv.testSyssetenv5#Ignored.SideEffects# #argv <- structure(list(TZ = 'EST5EDT'), .Names = 'TZ');do.call('Sys.setenv', argv) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetlocale.testSyslocaleconv# #names(Sys.localeconv()) [1] "decimal_point" "thousands_sep" "grouping" [4] "int_curr_symbol" "currency_symbol" "mon_decimal_point" [7] "mon_thousands_sep" "mon_grouping" "positive_sign" [10] "negative_sign" "int_frac_digits" "frac_digits" [13] "p_cs_precedes" "p_sep_by_space" "n_cs_precedes" [16] "n_sep_by_space" "p_sign_posn" "n_sign_posn" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetlocale.testSyssetlocale1# #argv <- list(3L, 'C'); Sys.setlocale(argv[[1]], argv[[2]]) Error in Sys.setlocale(argv[[1]], argv[[2]]) : invalid 'category' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetlocale.testSyssetlocale3# #argv <- structure(list(category = 'LC_TIME', locale = 'C'), .Names = c('category', 'locale'));do.call('Sys.setlocale', argv) [1] "C" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetlocale.testSyssetlocale3#Ignored.Unstable# #{ Sys.setenv(LC_CTYPE="en_US.UTF-8"); Sys.getlocale("LC_CTYPE"); } [1] "en_US.utf8" ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetlocale.testSyssetlocaleInvalidArgs# #Sys.setlocale('3L', 'C') Error in Sys.setlocale("3L", "C") : invalid 'category' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetlocale.testSyssetlocaleInvalidArgs# #Sys.setlocale(4, 42) Error in Sys.setlocale(4, 42) : invalid 'category' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssetlocale.testSyssetlocaleInvalidArgs# #Sys.setlocale(4, c('more', 'elements')) Error in Sys.setlocale(4, c("more", "elements")) : invalid 'category' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssleep.testSyssleep1# #argv <- list(0.5); .Internal(Sys.sleep(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Syssleep.testSyssleep2# #argv <- list(FALSE); .Internal(Sys.sleep(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysunsetenv.testSysunsetenv1#Ignored.SideEffects# #argv <- list('_R_NS_LOAD_'); .Internal(Sys.unsetenv(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_Sysunsetenv.testSysunsetenv3#Ignored.SideEffects# #argv <- list(character(0)); .Internal(Sys.unsetenv(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate1# #argv <- list('text', 6, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "text" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate10# #argv <- list('filled.contour', 6, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "flld.c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate11# #argv <- list(c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), 5, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "Svnst" "N.462" "Mnchr" "N.475" "Velvt" "Ptlnd" "Glbrn" "N.457" "WN.38" [10] "Trebi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate12# #argv <- list('dtrMatrix-class', 6, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "dtrMt-" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate2# #argv <- list(c('Alabama', 'Alaska', 'Arizona', 'Arkansas', 'California', 'Colorado', 'Connecticut', 'Delaware', 'Florida', 'Georgia', 'Hawaii', 'Idaho', 'Illinois', 'Indiana', 'Iowa', 'Kansas', 'Kentucky', 'Louisiana', 'Maine', 'Maryland', 'Massachusetts', 'Michigan', 'Minnesota', 'Mississippi', 'Missouri', 'Montana', 'Nebraska', 'Nevada', 'New Hampshire', 'New Jersey', 'New Mexico', 'New York', 'North Carolina', 'North Dakota', 'Ohio', 'Oklahoma', 'Oregon', 'Pennsylvania', 'Rhode Island', 'South Carolina', 'South Dakota', 'Tennessee', 'Texas', 'Utah', 'Vermont', 'Virginia', 'Washington', 'West Virginia', 'Wisconsin', 'Wyoming'), 3, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "Alb" "Als" "Arz" "Ark" "Clf" "Clr" "Cnn" "Dlw" "Flr" "Grg" "Haw" "Idh" [13] "Ill" "Ind" "Iow" "Kns" "Knt" "Lsn" "Man" "Mry" "Mss" "Mch" "Mnn" "Mss" [25] "Mss" "Mnt" "Nbr" "Nvd" "NwH" "NwJ" "NwM" "NwY" "NrC" "NrD" "Ohi" "Okl" [37] "Org" "Pnn" "RhI" "StC" "StD" "Tnn" "Txs" "Uth" "Vrm" "Vrg" "Wsh" "WsV" [49] "Wsc" "Wym" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate3# #argv <- list('glm', 6, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "glm" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate4# #argv <- list(c('(Intercept)', 'sin(2 * pi * Time)', 'cos(2 * pi * Time)'), 6, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "(Intr)" "s(*p*T" "c(*p*T" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate5# #argv <- list(c('Alabama', 'Alaska', 'Arizona', 'Arkansas', 'California', 'Colorado', 'Connecticut', 'Delaware', 'Florida', 'Georgia', 'Hawaii', 'Idaho', 'Illinois', 'Indiana', 'Iowa', 'Kansas', 'Kentucky', 'Louisiana', 'Maine', 'Maryland', 'Massachusetts', 'Michigan', 'Minnesota', 'Mississippi', 'Missouri', 'Montana', 'Nebraska', 'Nevada', 'New Hampshire', 'New Jersey', 'New Mexico', 'New York', 'North Carolina', 'North Dakota', 'Ohio', 'Oklahoma', 'Oregon', 'Pennsylvania', 'Rhode Island', 'South Carolina', 'South Dakota', 'Tennessee', 'Texas', 'Utah', 'Vermont', 'Virginia', 'Washington', 'West Virginia', 'Wisconsin', 'Wyoming'), 4L, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "Albm" "Alsk" "Arzn" "Arkn" "Clfr" "Clrd" "Cnnc" "Dlwr" "Flrd" "Gerg" [11] "Hawa" "Idah" "Illn" "Indn" "Iowa" "Knss" "Kntc" "Losn" "Main" "Mryl" [21] "Mssc" "Mchg" "Mnns" "Msss" "Mssr" "Mntn" "Nbrs" "Nevd" "NwHm" "NwJr" [31] "NwMx" "NwYr" "NrtC" "NrtD" "Ohio" "Oklh" "Orgn" "Pnns" "RhdI" "SthC" [41] "SthD" "Tnns" "Texs" "Utah" "Vrmn" "Vrgn" "Wshn" "WstV" "Wscn" "Wymn" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate6# #argv <- list(c('Alabama', 'Alaska', 'Arizona', 'Arkansas', 'California', 'Colorado', 'Connecticut', 'Delaware', 'Florida', 'Georgia', 'Hawaii', 'Idaho', 'Illinois', 'Indiana', 'Iowa', 'Kansas', 'Kentucky', 'Louisiana', 'Maine', 'Maryland', 'Massachusetts', 'Michigan', 'Minnesota', 'Mississippi', 'Missouri', 'Montana', 'Nebraska', 'Nevada', 'New Hampshire', 'New Jersey', 'New Mexico', 'New York', 'North Carolina', 'North Dakota', 'Ohio', 'Oklahoma', 'Oregon', 'Pennsylvania', 'Rhode Island', 'South Carolina', 'South Dakota', 'Tennessee', 'Texas', 'Utah', 'Vermont', 'Virginia', 'Washington', 'West Virginia', 'Wisconsin', 'Wyoming'), 3L, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "Alb" "Als" "Arz" "Ark" "Clf" "Clr" "Cnn" "Dlw" "Flr" "Grg" "Haw" "Idh" [13] "Ill" "Ind" "Iow" "Kns" "Knt" "Lsn" "Man" "Mry" "Mss" "Mch" "Mnn" "Mss" [25] "Mss" "Mnt" "Nbr" "Nvd" "NwH" "NwJ" "NwM" "NwY" "NrC" "NrD" "Ohi" "Okl" [37] "Org" "Pnn" "RhI" "StC" "StD" "Tnn" "Txs" "Uth" "Vrm" "Vrg" "Wsh" "WsV" [49] "Wsc" "Wym" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate7# #argv <- list(c('1_', 'Weight', 'Cylinders4', 'Cylinders5', 'Cylinders6', 'Cylinders8', 'Cylindersrotary', 'TypeLarge', 'TypeMidsize', 'TypeSmall', 'TypeSporty', 'TypeVan', 'EngineSize', 'DriveTrainFront', 'DriveTrainRear'), 4L, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "1_" "Wght" "Cyl4" "Cyl5" "Cyl6" "Cyl8" "Cyln" "TypL" "TypM" "TypS" [11] "TypS" "TypV" "EngS" "DrTF" "DrTR" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate8# #argv <- list(c('Alabama', 'Alaska', 'Arizona', 'Arkansas', 'California', 'Colorado', 'Connecticut', 'Delaware', 'Florida', 'Georgia', 'Hawaii', 'Idaho', 'Illinois', 'Indiana', 'Iowa', 'Kansas', 'Kentucky', 'Louisiana', 'Maine', 'Maryland', 'Massachusetts', 'Michigan', 'Minnesota', 'Mississippi', 'Missouri', 'Montana', 'Nebraska', 'Nevada', 'New Hampshire', 'New Jersey', 'New Mexico', 'New York', 'North Carolina', 'North Dakota', 'Ohio', 'Oklahoma', 'Oregon', 'Pennsylvania', 'Rhode Island', 'South Carolina', 'South Dakota', 'Tennessee', 'Texas', 'Utah', 'Vermont', 'Virginia', 'Washington', 'West Virginia', 'Wisconsin', 'Wyoming'), 1L, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) [1] "A" "A" "A" "A" "C" "C" "C" "D" "F" "G" "H" "I" "I" "I" "I" [16] "K" "K" "L" "M" "M" "M" "M" "M" "M" "M" "M" "N" "N" "NH" "NJ" [31] "NM" "NY" "NC" "ND" "O" "O" "O" "P" "RI" "SC" "SD" "T" "T" "U" "V" [46] "V" "W" "WV" "W" "W" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abbreviate.testabbreviate9# #argv <- list(character(0), 4L, TRUE); .Internal(abbreviate(argv[[1]], argv[[2]], argv[[3]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs#IncludeList.arithmetic# #{ abs((-0-1i)/(0+0i)) } [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs#IncludeList.arithmetic# #{ abs((-1-0i)/(0+0i)) } [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs((0+0i)/0) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs((1/0)*(1-0i)) } [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs((1:2)[3]) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(-1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(-100) } [1] 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(-1:-3) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(-1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(0) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(0/0) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(100) } [1] 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(1:3) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(NA+0.1) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(NULL) } Error in abs(NULL) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(c(0/0,1i)) } [1] NaN 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(c(1, -2, 3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(c(1, -2, NA)) } [1] 1 2 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(c(1, 2, 3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(c(1L, -2L, 3L)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(c(1L, -2L, NA)) } [1] 1 2 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ abs(c(1L, 2L, 3L)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testAbs# #{ is.integer(abs(FALSE)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs1# #argv <- list(c(0.9, 0.1, 0.3, 0.5, 0.7, 0.9, 0.1, 0.3, 0.5));abs(argv[[1]]); [1] 0.9 0.1 0.3 0.5 0.7 0.9 0.1 0.3 0.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs10# #argv <- list(structure(c(-7.38958333333333, NA, 1.69041666666667, -16.5495833333333, 8.82041666666667, 8.84041666666667, -2.24958333333333, 9.15041666666667, 0.950416666666669, -12.5095833333333, NA, 8.86041666666667, 1.05041666666667, 3.80041666666667, 5.92041666666667, 16.1404166666667, 3.45041666666667, -32.1695833333333, 12.7504166666667, 1.18041666666667, -6.72958333333333, 14.4804166666667, 1.89041666666667, -37.9795833333333, -0.299583333333331, 2.49041666666667, 7.31041666666667, 0.66041666666667, 2.78041666666667, 3.89041666666667, 3.13041666666667, -6.08958333333333, -1.00958333333333, -1.07958333333333, 9.01041666666667, 7.84041666666667, 8.30041666666668, 9.36041666666667, -6.32958333333333, -47.3395833333333, 4.30041666666667, -2.11958333333333, -4.10958333333333, -2.29958333333333, 11.0004166666667, -1.96958333333333, 11.1804166666667, 2.55041666666667, -2.35958333333333, 7.80041666666667), .Names = c('Alabama', 'Alaska', 'Arizona', 'Arkansas', 'California', 'Colorado', 'Connecticut', 'Delaware', 'Florida', 'Georgia', 'Hawaii', 'Idaho', 'Illinois', 'Indiana', 'Iowa', 'Kansas', 'Kentucky', 'Louisiana', 'Maine', 'Maryland', 'Massachusetts', 'Michigan', 'Minnesota', 'Mississippi', 'Missouri', 'Montana', 'Nebraska', 'Nevada', 'New Hampshire', 'New Jersey', 'New Mexico', 'New York', 'North Carolina', 'North Dakota', 'Ohio', 'Oklahoma', 'Oregon', 'Pennsylvania', 'Rhode Island', 'South Carolina', 'South Dakota', 'Tennessee', 'Texas', 'Utah', 'Vermont', 'Virginia', 'Washington', 'West Virginia', 'Wisconsin', 'Wyoming')));abs(argv[[1]]); Alabama Alaska Arizona Arkansas California 7.3895833 NA 1.6904167 16.5495833 8.8204167 Colorado Connecticut Delaware Florida Georgia 8.8404167 2.2495833 9.1504167 0.9504167 12.5095833 Hawaii Idaho Illinois Indiana Iowa NA 8.8604167 1.0504167 3.8004167 5.9204167 Kansas Kentucky Louisiana Maine Maryland 16.1404167 3.4504167 32.1695833 12.7504167 1.1804167 Massachusetts Michigan Minnesota Mississippi Missouri 6.7295833 14.4804167 1.8904167 37.9795833 0.2995833 Montana Nebraska Nevada New Hampshire New Jersey 2.4904167 7.3104167 0.6604167 2.7804167 3.8904167 New Mexico New York North Carolina North Dakota Ohio 3.1304167 6.0895833 1.0095833 1.0795833 9.0104167 Oklahoma Oregon Pennsylvania Rhode Island South Carolina 7.8404167 8.3004167 9.3604167 6.3295833 47.3395833 South Dakota Tennessee Texas Utah Vermont 4.3004167 2.1195833 4.1095833 2.2995833 11.0004167 Virginia Washington West Virginia Wisconsin Wyoming 1.9695833 11.1804167 2.5504167 2.3595833 7.8004167 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs11# #argv <- list(c(NA, 1L));abs(argv[[1]]); [1] NA 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs12# #argv <- list(structure(c(1.47191076131574, 0.586694550701453, NA, 0.258706725324317, 0.948371836939988, 0.396080061109718, NA, 0.350912037541581), .Dim = c(4L, 2L), .Dimnames = list(c('(Intercept)', 'x1', 'x2', 'x3'), c('Estimate', 'Std. Error'))));abs(argv[[1]]); Estimate Std. Error (Intercept) 1.4719108 0.9483718 x1 0.5866946 0.3960801 x2 NA NA x3 0.2587067 0.3509120 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs13# #argv <- list(structure(c(0.839669286317987, -1.37400428670216, 0.22900071445036, 0.305334285933814, 0.34350107167554, -0.0763335714834533, -0.877836072059713, 0.610668571867626, 0.763335714834533, -0.763335714834533, -0.763335714834533, 0.763335714834533, -0.45800142890072, 0.80150250057626, -0.22900071445036, -0.11450035722518, -0.34350107167554, 1.03050321502662, -1.03050321502662, 0.34350107167554, 0.11450035722518, -0.152667142966907, -0.0381667857417267, 0.0763335714834533, 0.496168214642447, -0.725168929092807, -0.0381667857417268, 0.267167500192087, 0.954169643543167, -1.52667142966907, 0.190833928708633, 0.381667857417267, 0.610668571867627, -2.78617535914605, 3.74034500268921, -1.56483821541079, 0.190833928708633, -0.572501786125899, 0.5725017861259, -0.190833928708634, 0.267167500192087, -0.229000714450361, -0.34350107167554, 0.305334285933814, 0.190833928708632, 0.190833928708634, -0.954169643543166, 0.572501786125899, -1.06867000076835, 1.67933857263597, -0.152667142966906, -0.45800142890072, -0.610668571867627, 0.877836072059714, 0.0763335714834535, -0.34350107167554, 0.381667857417267, -0.190833928708634, -0.763335714834533, 0.5725017861259, 0.496168214642447, -0.725168929092807, -0.0381667857417268, 0.267167500192087, 0.5725017861259, -0.763335714834533, -0.190833928708633, 0.381667857417267, 0.305334285933813, -0.534335000384173, 0.152667142966907, 0.076333571483453, -0.534335000384172, 0.839669286317985, -0.0763335714834534, -0.22900071445036, 0.0381667857417273, 0.0763335714834524, -0.267167500192087, 0.152667142966907, -0.22900071445036, 0.496168214642446, -0.305334285933813, 0.0381667857417267, 0, 0.190833928708633, -0.381667857417267, 0.190833928708633, 0.11450035722518, 0.0381667857417268, -0.419834643158993, 0.267167500192087, 0.11450035722518, -0.152667142966907, -0.0381667857417267, 0.0763335714834533, -0.22900071445036, 0.11450035722518, 0.45800142890072, -0.34350107167554, -0.496168214642447, 0.725168929092807, 0.0381667857417269, -0.267167500192087, 0.11450035722518, -0.534335000384173, 0.725168929092806, -0.305334285933813), .Names = c('M01', 'M01', 'M01', 'M01', 'M02', 'M02', 'M02', 'M02', 'M03', 'M03', 'M03', 'M03', 'M04', 'M04', 'M04', 'M04', 'M05', 'M05', 'M05', 'M05', 'M06', 'M06', 'M06', 'M06', 'M07', 'M07', 'M07', 'M07', 'M08', 'M08', 'M08', 'M08', 'M09', 'M09', 'M09', 'M09', 'M10', 'M10', 'M10', 'M10', 'M11', 'M11', 'M11', 'M11', 'M12', 'M12', 'M12', 'M12', 'M13', 'M13', 'M13', 'M13', 'M14', 'M14', 'M14', 'M14', 'M15', 'M15', 'M15', 'M15', 'M16', 'M16', 'M16', 'M16', 'F01', 'F01', 'F01', 'F01', 'F02', 'F02', 'F02', 'F02', 'F03', 'F03', 'F03', 'F03', 'F04', 'F04', 'F04', 'F04', 'F05', 'F05', 'F05', 'F05', 'F06', 'F06', 'F06', 'F06', 'F07', 'F07', 'F07', 'F07', 'F08', 'F08', 'F08', 'F08', 'F09', 'F09', 'F09', 'F09', 'F10', 'F10', 'F10', 'F10', 'F11', 'F11', 'F11', 'F11'), label = 'Standardized residuals'));abs(argv[[1]]); M01 M01 M01 M01 M02 M02 M02 0.83966929 1.37400429 0.22900071 0.30533429 0.34350107 0.07633357 0.87783607 M02 M03 M03 M03 M03 M04 M04 0.61066857 0.76333571 0.76333571 0.76333571 0.76333571 0.45800143 0.80150250 M04 M04 M05 M05 M05 M05 M06 0.22900071 0.11450036 0.34350107 1.03050322 1.03050322 0.34350107 0.11450036 M06 M06 M06 M07 M07 M07 M07 0.15266714 0.03816679 0.07633357 0.49616821 0.72516893 0.03816679 0.26716750 M08 M08 M08 M08 M09 M09 M09 0.95416964 1.52667143 0.19083393 0.38166786 0.61066857 2.78617536 3.74034500 M09 M10 M10 M10 M10 M11 M11 1.56483822 0.19083393 0.57250179 0.57250179 0.19083393 0.26716750 0.22900071 M11 M11 M12 M12 M12 M12 M13 0.34350107 0.30533429 0.19083393 0.19083393 0.95416964 0.57250179 1.06867000 M13 M13 M13 M14 M14 M14 M14 1.67933857 0.15266714 0.45800143 0.61066857 0.87783607 0.07633357 0.34350107 M15 M15 M15 M15 M16 M16 M16 0.38166786 0.19083393 0.76333571 0.57250179 0.49616821 0.72516893 0.03816679 M16 F01 F01 F01 F01 F02 F02 0.26716750 0.57250179 0.76333571 0.19083393 0.38166786 0.30533429 0.53433500 F02 F02 F03 F03 F03 F03 F04 0.15266714 0.07633357 0.53433500 0.83966929 0.07633357 0.22900071 0.03816679 F04 F04 F04 F05 F05 F05 F05 0.07633357 0.26716750 0.15266714 0.22900071 0.49616821 0.30533429 0.03816679 F06 F06 F06 F06 F07 F07 F07 0.00000000 0.19083393 0.38166786 0.19083393 0.11450036 0.03816679 0.41983464 F07 F08 F08 F08 F08 F09 F09 0.26716750 0.11450036 0.15266714 0.03816679 0.07633357 0.22900071 0.11450036 F09 F09 F10 F10 F10 F10 F11 0.45800143 0.34350107 0.49616821 0.72516893 0.03816679 0.26716750 0.11450036 F11 F11 F11 0.53433500 0.72516893 0.30533429 attr(,"label") [1] "Standardized residuals" ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs14# #argv <- list(numeric(0));abs(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs15# #argv <- list(structure(c(NA, NA), .Dim = 1:2, .Dimnames = list('x', c('Estimate', 'Std. Error'))));abs(argv[[1]]); Estimate Std. Error x NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs16# #argv <- list(-3.31827701955945e-05);abs(argv[[1]]); [1] 3.318277e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs17# #argv <- list(structure(c(-1.36919169254062, -0.210726311672344, 0.00840470379579385, 0.0843659249699204, 0.552921941721332), .Names = c('0%', '25%', '50%', '75%', '100%')));abs(argv[[1]]); 0% 25% 50% 75% 100% 1.369191693 0.210726312 0.008404704 0.084365925 0.552921942 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs18# #argv <- list(structure(c(8, 7, 6, 5, 4, 3, 2, 1, 0, -1), .Tsp = c(2, 11, 1), class = 'ts'));abs(argv[[1]]); Time Series: Start = 2 End = 11 Frequency = 1 [1] 8 7 6 5 4 3 2 1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs19# #argv <- list(-32L);abs(argv[[1]]); [1] 32 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs2# #argv <- list(c(TRUE, TRUE, TRUE, TRUE));abs(argv[[1]]); [1] 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs20# #argv <- list(structure(c(-0.233156370250776, -0.239412071306507, -0.467754722340573, -0.313136244157115, 0.165043251865522, -0.32096970624939, -0.383377620527381, -0.709110442848008, -0.235393959061767, 0.141653176746209, -0.522836600482894, -0.313130619764979, -0.127866584288678, -0.443661331439424, -0.272181655694344, -0.267312459146771, -0.421687966603442, -0.489456667260012, -1.09136324227316, -0.365563936224476, -0.19497185571599, -0.355887223690607, -0.284861760091765, 0.10349461735987, -0.29203835454261, -0.437137381511441, -0.283258760238879, -0.864706923796918, -0.28069027865338, -0.328236303967812, -0.413280526174513, 0.353631921283964, -0.170574581087077, -0.350164611041975, -0.35509309393052, 0.371846787851152, 0.0662214922636754, -0.38267166577059, -0.76433272993872, 0.337925286731474, -0.316383144846009, 0.872120012008955, -0.1910867580222, -0.27268759462975, 0.561668608501795, -0.414426404256215, 0.306241460697781, -0.475011430441313, -0.18104902231566, -0.313137168940244, -0.162511371099967, -0.332715804582844, -0.264583655672922, -0.27403739912759, 0.292926038918646, -0.0266469304789678, NaN, 0.246014195648949, -0.384306495215891, -0.0754669363487819, -0.19187230661589, -0.28069027865338, -0.310267174936681, -0.218229559122572, -0.132431123435626, -0.632568727580371, -0.025524040198577, -0.208280705060531, -0.339307274267833, -0.267312459146771, -0.38337762052738, -0.527937499202165, -0.0708139839175417, -0.249126729136488, -0.443661331439424, -0.282353670058315, -0.383117955201771, 0.465652476582142, -0.257667111448151, -0.923882106624253, -0.527902200672803, -0.106397317438703, -0.882784314083567, -0.171789859931029, -0.134719406450945, -0.334299917870866, -0.59592895672967, 0.0477670768238039, -1.67777307729147, 0.0145330024207598, 0.465392111094536, -0.188401359782389, -1.67777307729147), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93')));abs(argv[[1]]); 1 2 3 4 5 6 7 0.23315637 0.23941207 0.46775472 0.31313624 0.16504325 0.32096971 0.38337762 8 9 10 11 12 13 14 0.70911044 0.23539396 0.14165318 0.52283660 0.31313062 0.12786658 0.44366133 15 16 17 18 19 20 21 0.27218166 0.26731246 0.42168797 0.48945667 1.09136324 0.36556394 0.19497186 22 23 24 25 26 27 28 0.35588722 0.28486176 0.10349462 0.29203835 0.43713738 0.28325876 0.86470692 29 30 31 32 33 34 35 0.28069028 0.32823630 0.41328053 0.35363192 0.17057458 0.35016461 0.35509309 36 37 38 39 40 41 42 0.37184679 0.06622149 0.38267167 0.76433273 0.33792529 0.31638314 0.87212001 43 44 45 46 47 48 49 0.19108676 0.27268759 0.56166861 0.41442640 0.30624146 0.47501143 0.18104902 50 51 52 53 54 55 56 0.31313717 0.16251137 0.33271580 0.26458366 0.27403740 0.29292604 0.02664693 57 58 59 60 61 62 63 NaN 0.24601420 0.38430650 0.07546694 0.19187231 0.28069028 0.31026717 64 65 66 67 68 69 70 0.21822956 0.13243112 0.63256873 0.02552404 0.20828071 0.33930727 0.26731246 71 72 73 74 75 76 77 0.38337762 0.52793750 0.07081398 0.24912673 0.44366133 0.28235367 0.38311796 78 79 80 81 82 83 84 0.46565248 0.25766711 0.92388211 0.52790220 0.10639732 0.88278431 0.17178986 85 86 87 88 89 90 91 0.13471941 0.33429992 0.59592896 0.04776708 1.67777308 0.01453300 0.46539211 92 93 0.18840136 1.67777308 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs21# #argv <- list(structure(c(2671, 6.026e+77, 3.161e+152, 3.501e+299, 2.409e+227, 1.529e+302), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.')));abs(argv[[1]]); Min. 1st Qu. Median Mean 3rd Qu. Max. 2.671e+03 6.026e+77 3.161e+152 3.501e+299 2.409e+227 1.529e+302 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs3# #argv <- list(c(-0.510763209393394, Inf, 1, 1, Inf, 1, 0, -1.95785440613009, -48.49854545454, -Inf, 1, 1, 0.342969776609699, 0.00707175387211123));abs(argv[[1]]); [1] 0.510763209 Inf 1.000000000 1.000000000 Inf [6] 1.000000000 0.000000000 1.957854406 48.498545455 Inf [11] 1.000000000 1.000000000 0.342969777 0.007071754 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs4# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));abs(argv[[1]]); [1] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [6] 1.753688e-134 0.000000e+00 0.000000e+00 0.000000e+00 2.604776e-251 [11] 1.164850e-260 0.000000e+00 1.531604e-322 3.333314e-01 0.000000e+00 [16] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [21] 0.000000e+00 0.000000e+00 0.000000e+00 3.441613e-123 0.000000e+00 [26] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [31] 0.000000e+00 0.000000e+00 0.000000e+00 1.968812e-173 0.000000e+00 [36] 8.235997e-150 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [41] 6.517332e-10 0.000000e+00 2.368402e-67 0.000000e+00 9.434841e-307 [46] 0.000000e+00 1.599599e-89 0.000000e+00 8.738369e-286 7.097162e-54 [51] 0.000000e+00 0.000000e+00 0.000000e+00 1.530425e-274 8.575901e-14 [56] 3.333331e-01 0.000000e+00 0.000000e+00 1.368952e-199 2.022610e-177 [61] 5.504454e-42 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [66] 1.078464e-44 1.886055e-186 1.091561e-26 0.000000e+00 3.070288e-124 [71] 3.333332e-01 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [76] 0.000000e+00 0.000000e+00 3.098161e-94 0.000000e+00 0.000000e+00 [81] 4.752273e-272 0.000000e+00 0.000000e+00 2.300933e-06 0.000000e+00 [86] 0.000000e+00 1.270828e-274 0.000000e+00 0.000000e+00 0.000000e+00 [91] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 4.566203e-65 [96] 0.000000e+00 2.779959e-149 0.000000e+00 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs5# #argv <- list(structure(c(-7.0990260398094, -6.52913885777653, -3.11767063409183, -18.6913646342089), .Dim = c(4L, 1L)));abs(argv[[1]]); [,1] [1,] 7.099026 [2,] 6.529139 [3,] 3.117671 [4,] 18.691365 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs6# #argv <- list(structure(c(0, -1, -2, -3, -4, -5, -6, -7, -8, -9, -10, -11, -12, -13, -14, -15, -16, -17, -18, -19, -20, -21, -22, -23, -24, -25, -26, -27, -28, -29, -30, -31, -32, -33, -34, -35, -36, -37, -38, -39, -40, -41, -42, -43, -44, -45, -46, -47, -48, -49, -50, -51, -52, -53, -54, -55, -56, -57, -58, -59, -60, -61, -62, -63, -64, -65, -66, -67, -68, -69, -70, -71, -72, -73, -74, -75, -76, -77, -78, -79, -80, -81, -82, -83, -84, -85, -86, -87, -88, -89, -90, -91, -92, -93, -94, -95, -96, -97, -98, -99, -100, -101, -102, -103, -104, -105, -106, -107, -108, -109, -110, -111, -112, -113, -114, -115, -116, -117, -118, -119, -120, -121, -122, -123, -124, -125, -126, -127, -128, -129, -130, -131, -132, -133, -134, -135, -136, -137, -138, -139, -140, -141, -142, -143, -144, -145, -146, -147, -148, -149), .Tsp = c(4, 153, 1), class = 'ts'));abs(argv[[1]]); Time Series: Start = 4 End = 153 Frequency = 1 [1] 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 [19] 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 [37] 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 [55] 54 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 [73] 72 73 74 75 76 77 78 79 80 81 82 83 84 85 86 87 88 89 [91] 90 91 92 93 94 95 96 97 98 99 100 101 102 103 104 105 106 107 [109] 108 109 110 111 112 113 114 115 116 117 118 119 120 121 122 123 124 125 [127] 126 127 128 129 130 131 132 133 134 135 136 137 138 139 140 141 142 143 [145] 144 145 146 147 148 149 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs7# #argv <- list(structure(c(3.5527136788005e-15+2.4168586625265e-16i, 2.4980018054066e-16-2.28189378671807e-16i, 0-6.89814774385614e-17i, 0-1.77454768520688e-17i), .Dim = c(2L, 2L)));abs(argv[[1]]); [,1] [,2] [1,] 3.560925e-15 6.898148e-17 [2,] 3.383349e-16 1.774548e-17 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs8# #argv <- list(1e+07);abs(argv[[1]]); [1] 1e+07 ##com.oracle.truffle.r.test.builtins.TestBuiltin_abs.testabs9# #argv <- list(structure(c(56.8666666666667, 52.8833333333333), .Dim = 2L, .Dimnames = structure(list(K = c('0', '1')), .Names = 'K')));abs(argv[[1]]); K 0 1 56.86667 52.88333 ##com.oracle.truffle.r.test.builtins.TestBuiltin_acos.testTrigExp# #{ acos() } Error in acos() : 0 arguments passed to 'acos' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_acos.testTrigExp# #{ acos(0.4) } [1] 1.159279 ##com.oracle.truffle.r.test.builtins.TestBuiltin_acos.testTrigExp# #{ acos(c(0.3,0.6,0.9)) } [1] 1.2661037 0.9272952 0.4510268 ##com.oracle.truffle.r.test.builtins.TestBuiltin_acos.testacos1# #argv <- list(c(0.999950000416665, 0.999800006666578, 0.999550033748988, 0.999200106660978, 0.998750260394966, 0.998200539935204, 0.99755100025328, 0.996801706302619, 0.995952733011994, 0.995004165278026, 0.993956097956697, 0.992808635853866, 0.991561893714788, 0.990215996212637, 0.988771077936042, 0.987227283375627, 0.985584766909561, 0.983843692788121, 0.98200423511727, 0.980066577841242, 0.978030914724148, 0.975897449330606, 0.973666395005375, 0.97133797485203, 0.968912421710645, 0.966389978134513, 0.963770896365891, 0.961055438310771, 0.958243875512697, 0.955336489125606, 0.952333569885713, 0.949235418082441, 0.946042343528387, 0.942754665528346, 0.939372712847379, 0.935896823677935, 0.932327345606034, 0.92866463557651, 0.924909059857313, 0.921060994002885, 0.917120822816605, 0.913088940312308, 0.908965749674885, 0.904751663219963, 0.900447102352677, 0.896052497525525, 0.891568288195329, 0.886994922779284, 0.882332858610121, 0.877582561890373, 0.872744507645751, 0.86781917967765, 0.862807070514761, 0.857708681363824, 0.852524522059506, 0.847255111013416, 0.841900975162269, 0.836462649915187, 0.830940679100164, 0.825335614909678, 0.819648017845479, 0.813878456662534, 0.808027508312152, 0.802095757884293, 0.796083798549056, 0.789992231497365, 0.783821665880849, 0.777572718750928, 0.771246014997107, 0.764842187284488, 0.758361875990508, 0.751805729140895, 0.74517440234487, 0.738468558729588, 0.731688868873821, 0.724836010740905, 0.717910669610943, 0.710913538012277, 0.703845315652236, 0.696706709347165, 0.689498432951747, 0.682221207287614, 0.674875760071267, 0.667462825841308, 0.659983145884982, 0.652437468164052, 0.644826547240001, 0.63715114419858, 0.629412026573697, 0.621609968270664, 0.613745749488812, 0.605820156643463, 0.597833982287298, 0.589788025031098, 0.581683089463884, 0.573519986072457, 0.565299531160354, 0.557022546766217, 0.548689860581588));acos(argv[[1]]); [1] 0.01 0.02 0.03 0.04 0.05 0.06 0.07 0.08 0.09 0.10 0.11 0.12 0.13 0.14 0.15 [16] 0.16 0.17 0.18 0.19 0.20 0.21 0.22 0.23 0.24 0.25 0.26 0.27 0.28 0.29 0.30 [31] 0.31 0.32 0.33 0.34 0.35 0.36 0.37 0.38 0.39 0.40 0.41 0.42 0.43 0.44 0.45 [46] 0.46 0.47 0.48 0.49 0.50 0.51 0.52 0.53 0.54 0.55 0.56 0.57 0.58 0.59 0.60 [61] 0.61 0.62 0.63 0.64 0.65 0.66 0.67 0.68 0.69 0.70 0.71 0.72 0.73 0.74 0.75 [76] 0.76 0.77 0.78 0.79 0.80 0.81 0.82 0.83 0.84 0.85 0.86 0.87 0.88 0.89 0.90 [91] 0.91 0.92 0.93 0.94 0.95 0.96 0.97 0.98 0.99 ##com.oracle.truffle.r.test.builtins.TestBuiltin_acos.testacos2# #argv <- list(1.54308063481524+0i);acos(argv[[1]]); [1] 0+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_acos.testacos3# #argv <- list(c(-0.7104065636993+1i, 0.25688370915653+1i, -0.24669187846237+1i, -0.34754259939773+1i, -0.95161856726502+1i, -0.04502772480892+1i, -0.78490446945708+1i, -1.66794193658814+1i, -0.38022652028776+1i, 0.91899660906077+1i, -0.57534696260839+1i, 0.60796432222503+1i, -1.61788270828916+1i, -0.05556196552454+1i, 0.51940720394346+1i, 0.30115336216671+1i, 0.10567619414894+1i, -0.64070600830538+1i, -0.84970434603358+1i, -1.02412879060491+1i, 0.11764659710013+1i, -0.9474746141848+1i, -0.49055744370067+1i, -0.25609219219825+1i, 1.84386200523221+1i, -0.65194990169546+1i, 0.23538657228486+1i, 0.07796084956371+1i, -0.96185663413013+1i, -0.0713080861236+1i, 1.44455085842335+1i, 0.45150405307921+1i, 0.04123292199294+1i, -0.42249683233962+1i, -2.05324722154052+1i, 1.13133721341418+1i, -1.46064007092482+1i, 0.73994751087733+1i, 1.90910356921748+1i, -1.4438931609718+1i, 0.70178433537471+1i, -0.26219748940247+1i, -1.57214415914549+1i, -1.51466765378175+1i, -1.60153617357459+1i, -0.5309065221703+1i, -1.4617555849959+1i, 0.68791677297583+1i, 2.10010894052567+1i, -1.28703047603518+1i, 0.78773884747518+1i, 0.76904224100091+1i, 0.33220257895012+1i, -1.00837660827701+1i, -0.11945260663066+1i, -0.28039533517025+1i, 0.56298953322048+1i, -0.37243875610383+1i, 0.97697338668562+1i, -0.37458085776701+1i, 1.05271146557933+1i, -1.04917700666607+1i, -1.26015524475811+1i, 3.2410399349424+1i, -0.41685758816043+1i, 0.29822759154072+1i, 0.63656967403385+1i, -0.48378062570874+1i, 0.51686204431361+1i, 0.36896452738509+1i, -0.21538050764169+1i, 0.06529303352532+1i, -0.03406725373846+1i, 2.12845189901618+1i, -0.74133609627283+1i, -1.09599626707466+1i, 0.03778839917108+1i, 0.31048074944314+1i, 0.43652347891018+1i, -0.45836533271111+1i, -1.06332613397119+1i, 1.26318517608949+1i, -0.34965038795355+1i, -0.86551286265337+1i, -0.2362795689411+1i, -0.19717589434855+1i, 1.10992028971364+1i, 0.0847372921972+1i, 0.75405378518452+1i, -0.49929201717226+1i, 0.2144453095816+1i, -0.32468591149083+1i, 0.09458352817357+1i, -0.89536335797754+1i, -1.31080153332797+1i, 1.99721338474797+1i, 0.60070882367242+1i, -1.25127136162494+1i, -0.61116591668042+1i, -1.18548008459731+1i));acos(argv[[1]]); [1] 2.060199-0.972363i 1.389667-0.893085i 1.744778-0.892171i [4] 1.815238-0.902873i 2.209139-1.044591i 1.602633-0.881732i [7] 2.107768-0.992584i 2.538030-1.331771i 1.837926-0.907137i [10] 0.951672-1.033723i 1.971160-0.940809i 1.148641-0.947816i [13] 2.520843-1.310545i 1.610080-0.881919i 1.208169-0.929712i [16] 1.358689-0.897491i 1.496107-0.883349i 2.014651-0.955244i [19] 2.148070-1.011730i 2.250667-1.069836i 1.487656-0.883822i [22] 2.206716-1.043193i 1.913802-0.924442i 1.751370-0.893012i [25] 0.549010-1.405558i 2.022061-0.957886i 1.404747-0.891201i [28] 1.515684-0.882448i 2.215104-1.048066i 1.621208-0.882273i [31] 0.686594-1.237008i 1.254508-0.917802i 1.541642-0.881674i [34] 1.867136-0.913236i 2.647168-1.490646i 0.832752-1.109609i [37] 2.461543-1.243805i 1.062384-0.980147i 0.530893-1.432444i [40] 2.454729-1.236730i 1.086977-0.970150i 1.755649-0.893576i [43] 2.504444-1.291115i 2.482859-1.266699i 2.515059-1.303603i [46] 1.941216-0.931898i 2.461994-1.244277i 1.095988-0.966647i [49] 0.483533-1.509175i 2.385993-1.171413i 1.032040-0.993391i [52] 1.043848-0.988115i 1.337031-0.901006i 2.241789-1.064230i [55] 1.655212-0.883898i 1.768392-0.895337i 1.178731-0.938258i [58] 1.832527-0.906086i 0.917741-1.053252i 1.834013-0.906373i [61] 0.875030-1.080173i 2.264612-1.078883i 2.373311-1.160474i [64] 0.312214-1.896307i 1.863249-0.912384i 1.360733-0.897178i [67] 1.129673-0.954284i 1.909178-0.923250i 1.209896-0.929234i [70] 1.311475-0.905624i 1.722792-0.889597i 1.524635-0.882127i [73] 1.594884-0.881579i 0.477157-1.520283i 2.080098-0.980520i [76] 2.290105-1.096205i 1.544077-0.881626i 1.352176-0.898510i [79] 1.264800-0.915405i 1.891791-0.918928i 2.272396-1.084063i [82] 0.766839-1.161703i 1.816703-0.903136i 2.157736-1.016613i [85] 1.737472-0.891276i 1.709991-0.888263i 0.844053-1.101454i [88] 1.510896-0.882643i 1.053373-0.983973i 1.919753-0.926005i [91] 1.419458-0.889526i 1.799324-0.900123i 1.503941-0.882956i [94] 2.175800-1.026052i 2.396988-1.181163i 0.508050-1.468230i [97] 1.153474-0.946223i 2.369060-1.156880i 1.995081-0.948525i [100] 2.336676-1.130636i ##com.oracle.truffle.r.test.builtins.TestBuiltin_acos.testacos4# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));acos(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_acos.testacos5# #argv <- list(c(0.3+3i,-3+2i));acos(argv[[1]]); [1] 1.476169-1.822701i 2.535455-1.968638i ##com.oracle.truffle.r.test.builtins.TestBuiltin_acosh.testacosh1#Output.MissingWarning# #argv <- list(FALSE);acosh(argv[[1]]); [1] NaN Warning message: In acosh(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_acosh.testacosh2# #argv <- list(logical(0));acosh(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_acosh.testacosh3# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));acosh(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_acosh.testacosh4# #argv <- list(c(0+2i, 0.0001+2i, 0-2i, 0-2.0001i));acosh(argv[[1]]); [1] 1.443635+1.570796i 1.443635+1.570752i -1.443635+1.570796i [4] -1.443680+1.570796i ##com.oracle.truffle.r.test.builtins.TestBuiltin_acosh.testacosh5# #argv <- list(c(10.0676619957778, 9.77014619112734, 9.48151278613522, 9.20149937354487, 8.92985138285227, 8.66632184886646, 8.41067118718443, 8.16266697637608, 7.92208374668136, 7.68870277502741, 7.46231188617936, 7.242705259844, 7.02968324355098, 6.82305217114139, 6.62262418669875, 6.42821707376226, 6.23965408966708, 6.05676380486112, 5.87937994705209, 5.70734125004322, 5.54049130712027, 5.37867842885638, 5.22175550520566, 5.06957987175999, 4.92201318004762, 4.77892127175541, 4.64017405676061, 4.50564539486112, 4.3752129810968, 4.24875823455752, 4.12616619057689, 4.00732539621364, 3.89212780892567, 3.78046869834458, 3.67224655106143, 3.56736297833717, 3.46572262665382, 3.36723309102506, 3.27180483098748, 3.17935108919603, 3.0897878125497, 3.00303357577581, 2.91900950740325, 2.83763921805753, 2.75884873101238, 2.68256641493482, 2.60872291876243, 2.53725110865378, 2.46808600695458, 2.40116473312406, 2.33642644656803, 2.27381229132637, 2.21326534256499, 2.1547305548233, 2.09815471197041, 2.04348637882435, 1.99067585439045, 1.93967512667636, 1.89043782904258, 1.84291919804882, 1.7970760327579, 1.75286665546022, 1.71025087378301, 1.66918994414995, 1.62964653655797, 1.59158470063915, 1.55496983297695, 1.51976864564695, 1.48594913595357, 1.45348055733525, 1.42233339141161, 1.39247932114721, 1.36389120510748, 1.33654305278346, 1.31041000096287, 1.28546829112601, 1.26169524784609, 1.23906925817407, 1.21756975198963, 1.19717718330002, 1.17787301247016, 1.15963968936754, 1.14246063740672, 1.12632023847902, 1.11120381875343, 1.09709763533618, 1.0839888637765, 1.07186558640748, 1.06071678151125, 1.05053231329877, 1.04130292269496, 1.033020218921, 1.02567667186589, 1.01926560524059, 1.01378119050839, 1.00921844158588, 1.00557321031002, 1.00284218266684, 1.00102287577853, 1.00011363564622, 1.00011363564622, 1.00102287577853, 1.00284218266684, 1.00557321031002, 1.00921844158588, 1.01378119050839, 1.01926560524059, 1.02567667186589, 1.033020218921, 1.04130292269496, 1.05053231329877, 1.06071678151125, 1.07186558640748, 1.0839888637765, 1.09709763533618, 1.11120381875343, 1.12632023847902, 1.14246063740672, 1.15963968936754, 1.17787301247016, 1.19717718330002, 1.21756975198963, 1.23906925817407, 1.26169524784609, 1.28546829112601, 1.31041000096287, 1.33654305278346, 1.36389120510748, 1.39247932114721, 1.42233339141161, 1.45348055733525, 1.48594913595357, 1.51976864564695, 1.55496983297695, 1.59158470063915, 1.62964653655796, 1.66918994414995, 1.71025087378301, 1.75286665546022, 1.7970760327579, 1.84291919804882, 1.89043782904258, 1.93967512667636, 1.99067585439045, 2.04348637882435, 2.09815471197041, 2.1547305548233, 2.21326534256499, 2.27381229132637, 2.33642644656803, 2.40116473312406, 2.46808600695458, 2.53725110865378, 2.60872291876243, 2.68256641493482, 2.75884873101238, 2.83763921805753, 2.91900950740325, 3.00303357577581, 3.0897878125497, 3.17935108919602, 3.27180483098748, 3.36723309102506, 3.46572262665381, 3.56736297833717, 3.67224655106143, 3.78046869834458, 3.89212780892567, 4.00732539621364, 4.12616619057689, 4.24875823455752, 4.3752129810968, 4.50564539486111, 4.64017405676061, 4.77892127175541, 4.92201318004762, 5.06957987175999, 5.22175550520565, 5.37867842885638, 5.54049130712027, 5.70734125004322, 5.87937994705209, 6.05676380486112, 6.23965408966708, 6.42821707376226, 6.62262418669875, 6.82305217114139, 7.02968324355097, 7.242705259844, 7.46231188617936, 7.68870277502741, 7.92208374668136, 8.16266697637608, 8.41067118718443, 8.66632184886646, 8.92985138285226, 9.20149937354487, 9.48151278613522, 9.77014619112734, 10.0676619957778));acosh(argv[[1]]); [1] 3.00000000 2.96984925 2.93969849 2.90954774 2.87939698 2.84924623 [7] 2.81909548 2.78894472 2.75879397 2.72864322 2.69849246 2.66834171 [13] 2.63819095 2.60804020 2.57788945 2.54773869 2.51758794 2.48743719 [19] 2.45728643 2.42713568 2.39698492 2.36683417 2.33668342 2.30653266 [25] 2.27638191 2.24623116 2.21608040 2.18592965 2.15577889 2.12562814 [31] 2.09547739 2.06532663 2.03517588 2.00502513 1.97487437 1.94472362 [37] 1.91457286 1.88442211 1.85427136 1.82412060 1.79396985 1.76381910 [43] 1.73366834 1.70351759 1.67336683 1.64321608 1.61306533 1.58291457 [49] 1.55276382 1.52261307 1.49246231 1.46231156 1.43216080 1.40201005 [55] 1.37185930 1.34170854 1.31155779 1.28140704 1.25125628 1.22110553 [61] 1.19095477 1.16080402 1.13065327 1.10050251 1.07035176 1.04020101 [67] 1.01005025 0.97989950 0.94974874 0.91959799 0.88944724 0.85929648 [73] 0.82914573 0.79899497 0.76884422 0.73869347 0.70854271 0.67839196 [79] 0.64824121 0.61809045 0.58793970 0.55778894 0.52763819 0.49748744 [85] 0.46733668 0.43718593 0.40703518 0.37688442 0.34673367 0.31658291 [91] 0.28643216 0.25628141 0.22613065 0.19597990 0.16582915 0.13567839 [97] 0.10552764 0.07537688 0.04522613 0.01507538 0.01507538 0.04522613 [103] 0.07537688 0.10552764 0.13567839 0.16582915 0.19597990 0.22613065 [109] 0.25628141 0.28643216 0.31658291 0.34673367 0.37688442 0.40703518 [115] 0.43718593 0.46733668 0.49748744 0.52763819 0.55778894 0.58793970 [121] 0.61809045 0.64824121 0.67839196 0.70854271 0.73869347 0.76884422 [127] 0.79899497 0.82914573 0.85929648 0.88944724 0.91959799 0.94974874 [133] 0.97989950 1.01005025 1.04020101 1.07035176 1.10050251 1.13065327 [139] 1.16080402 1.19095477 1.22110553 1.25125628 1.28140704 1.31155779 [145] 1.34170854 1.37185930 1.40201005 1.43216080 1.46231156 1.49246231 [151] 1.52261307 1.55276382 1.58291457 1.61306533 1.64321608 1.67336683 [157] 1.70351759 1.73366834 1.76381910 1.79396985 1.82412060 1.85427136 [163] 1.88442211 1.91457286 1.94472362 1.97487437 2.00502513 2.03517588 [169] 2.06532663 2.09547739 2.12562814 2.15577889 2.18592965 2.21608040 [175] 2.24623116 2.27638191 2.30653266 2.33668342 2.36683417 2.39698492 [181] 2.42713568 2.45728643 2.48743719 2.51758794 2.54773869 2.57788945 [187] 2.60804020 2.63819095 2.66834171 2.69849246 2.72864322 2.75879397 [193] 2.78894472 2.81909548 2.84924623 2.87939698 2.90954774 2.93969849 [199] 2.96984925 3.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_acosh.testacosh6# #argv <- list(c(0.34345+233i,-0.34345+0.3334i));acosh(argv[[1]]); [1] 6.144191+1.569322i 0.345486+1.900672i ##com.oracle.truffle.r.test.builtins.TestBuiltin_adist.testadist1#Ignored.MissingBuiltin# #argv <- list(list(c(107L, 105L, 116L, 116L, 101L, 110L)), list(c(115L, 105L, 116L, 116L, 105L, 110L, 103L)), structure(c(1, 1, 1), .Names = c('insertions', 'deletions', 'substitutions')), FALSE, TRUE, FALSE, FALSE, FALSE); .Internal(adist(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [,1] [1,] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_adist.testadist2#Ignored.MissingBuiltin# #argv <- list(list(c(107L, 105L, 116L, 116L, 101L, 110L), c(115L, 105L, 116L, 116L, 105L, 110L, 103L)), list(c(107L, 105L, 116L, 116L, 101L, 110L), c(115L, 105L, 116L, 116L, 105L, 110L, 103L)), structure(c(1, 1, 1), .Names = c('insertions', 'deletions', 'substitutions')), TRUE, TRUE, FALSE, FALSE, FALSE); .Internal(adist(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [,1] [,2] [1,] 0 3 [2,] 3 0 attr(,"counts") , , ins [,1] [,2] [1,] 0 1 [2,] 0 0 , , del [,1] [,2] [1,] 0 0 [2,] 1 0 , , sub [,1] [,2] [1,] 0 2 [2,] 2 0 attr(,"trafos") [,1] [,2] [1,] "MMMMMM" "SMMMSMI" [2,] "SMMMSMD" "MMMMMMM" ##com.oracle.truffle.r.test.builtins.TestBuiltin_adist.testadist3#Ignored.MissingBuiltin# #argv <- list('lasy', '1 lazy 2', c(1L, 1L, 1L), FALSE, TRUE, TRUE, FALSE, FALSE); .Internal(adist(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [,1] [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_adist.testadist4#Ignored.MissingBuiltin# #argv <- list(list(), list(), structure(c(1, 1, 1), .Names = c('insertions', 'deletions', 'substitutions')), FALSE, TRUE, FALSE, FALSE, FALSE); .Internal(adist(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ .Internal(agrep("7", 42, F, F, NULL, NULL, F, F)) } Error: invalid 'x' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ .Internal(agrep(7, "42", F, F, NULL, NULL, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ .Internal(agrep(character(), "42", F, F, NULL, NULL, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ .Internal(agrepl("7", 42, F, F, NULL, NULL, F, F)) } Error: invalid 'x' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ .Internal(agrepl(7, "42", F, F, NULL, NULL, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ .Internal(agrepl(character(), "42", F, F, NULL, NULL, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ agrep('A', c('a'), ignore.case=T) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ agrep('A', c('b', 'a', 'z'), max.distance=0, ignore.case=T) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ agrep('A', c('b', 'a', 'z'), max.distance=1, ignore.case=T) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ agrep('a', c('A'), ignore.case=T) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ agrep('a', c('a'), ignore.case=T) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep#Ignored.ImplementationError# #{ agrep('a', c('a', 'b'), ignore.case=T) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep#Ignored.ImplementationError# #{ agrep('a', c('b', 'a'), ignore.case=F) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep#Ignored.ImplementationError# #{ agrep('a', c('b', 'a'), ignore.case=T) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ agrep('a', c('b', 'a', 'z'), max.distance=0, ignore.case=T) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testAgrep# #{ agrep('a', c('b', 'a', 'z'), max.distance=1, ignore.case=T) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testagrep1# #argv <- list('x86_64-linux-gnu', 'x86_64-linux-gnu', FALSE, FALSE, c(1L, 1L, 1L), c(0.1, NA, NA, NA, NA), FALSE, TRUE); .Internal(agrep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testagrep3#Ignored.ImplementationError# #argv <- list('lasy', c(' 1 lazy 2', '1 lasy 2'), FALSE, FALSE, c(1L, 1L, 1L), structure(c(NA, 0.1, 0.1, 0, 0.1), .Names = c('cost', 'insertions', 'deletions', 'substitutions', 'all')), FALSE, TRUE); .Internal(agrep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testagrep4#Ignored.Unimplemented# #argv <- list('laysy', c('1 lazy', '1', '1 LAZY'), FALSE, TRUE, c(1L, 1L, 1L), c(2, NA, NA, NA, NA), FALSE, TRUE); .Internal(agrep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] "1 lazy" ##com.oracle.truffle.r.test.builtins.TestBuiltin_agrep.testagrep5#Ignored.Unimplemented# #argv <- list('laysy', c('1 lazy', '1', '1 LAZY'), TRUE, FALSE, c(1L, 1L, 1L), c(2, NA, NA, NA, NA), FALSE, TRUE); .Internal(agrep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all() } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(0) } [1] FALSE Warning message: In all(0) : coercing argument of type 'double' to logical ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(1) } [1] TRUE Warning message: In all(1) : coercing argument of type 'double' to logical ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(FALSE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(NULL) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(NULL, NULL) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(NULL, c(FALSE)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(NULL, c(TRUE)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(TRUE, FALSE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(TRUE, FALSE, NA, na.rm=FALSE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(TRUE, FALSE, NA, na.rm=TRUE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(TRUE, TRUE, NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(TRUE, TRUE, NA, na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(TRUE, TRUE, NA, na.rm=TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(TRUE, TRUE, TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(TRUE,c(TRUE,TRUE),1) } [1] TRUE Warning message: In all(TRUE, c(TRUE, TRUE), 1) : coercing argument of type 'double' to logical ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(TRUE,c(TRUE,TRUE),1,0) } [1] FALSE Warning messages: 1: In all(TRUE, c(TRUE, TRUE), 1, 0) : coercing argument of type 'double' to logical 2: In all(TRUE, c(TRUE, TRUE), 1, 0) : coercing argument of type 'double' to logical ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ all(logical(0)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testAll# #{ v <- c("abc", "def") ; w <- c("abc", "def") ; all(v == w) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall1# #argv <- list(c(TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE));all(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall10# #argv <- list(structure(1L, .Names = 'show'));all(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall11# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = 2:3, .Dimnames = list(NULL, c('a', 'b', 'c'))));all(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall12# #argv <- list(structure(c(TRUE, TRUE, FALSE, TRUE, TRUE), .Tsp = c(1, 5, 1), class = 'ts'));all(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall14# #argv <- list(NA);all(argv[[1]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall15# #argv <- list(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE));all(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall16# #argv <- list(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE));do.call('all', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall17# #argv <- structure(list(c(NA, TRUE), na.rm = FALSE), .Names = c('', 'na.rm'));do.call('all', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall2# #argv <- list(structure(c(FALSE, FALSE), .Names = c('x', 'value')));all(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall3# #argv <- list(c(1, 1, 3, 1, 1, 3, 3, 3, 3), FALSE, NULL);all(argv[[1]],argv[[2]],argv[[3]]); [1] FALSE Warning message: In all(argv[[1]], argv[[2]], argv[[3]]) : coercing argument of type 'double' to logical ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall4# #argv <- list(structure(c(0, 0, 3, 0, 0, 0, 1, 0, 0, 2, 2, 3.2, -1, 1, 3.2, 4, 3, 0, 0, 0, 0, 3.2, 0, 0, 3.2, 0, 202, 0, 0, 0, 241, 0, 243, 0, 0), .Dim = c(5L, 7L), .Dimnames = list(c('r1', 'r2', 'r3', 'r4', 'r5'), c('c1', 'c2', 'c3', 'c4', 'c5', 'c6', 'c7'))));all(argv[[1]]); [1] FALSE Warning message: In all(argv[[1]]) : coercing argument of type 'double' to logical ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall5# #argv <- list(logical(0));all(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall6# #all( ); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall7# #argv <- list(structure(FALSE, .Tsp = c(1, 1, 1), class = 'ts'));all(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall8# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE, FALSE), .Tsp = c(-1, 3, 1), class = 'ts'));all(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_all.testall9# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE), .Names = c('+ Temp', '', '+ Soft', '- M.user')));all(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequal.testAllEqual# #{ all.equal(data.frame(list(1,2,3)), data.frame(list(1,2,3))) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequal.testallequal1# #argv <- structure(list(target = 0.261799387799149, current = 6.54498469497874), .Names = c('target', 'current'));do.call('all.equal', argv) [1] "Mean relative difference: 24" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequalPOSIXt.testallequalPOSIXt1# #argv <- structure(list(target = structure(1412833061.16639, class = c('POSIXct', 'POSIXt')), current = structure(1412833061.16839, class = c('POSIXct', 'POSIXt'))), .Names = c('target', 'current'));do.call('all.equal.POSIXt', argv) [1] "Mean absolute difference: 0.002000093" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequalPOSIXt.testallequalPOSIXt2# #argv <- structure(list(target = structure(1412833061.16639, class = c('POSIXct', 'POSIXt')), current = structure(list(sec = 41.1663863658905, min = 37L, hour = 1L, mday = 9L, mon = 9L, year = 114L, wday = 4L, yday = 281L, isdst = 1L, zone = 'EDT', gmtoff = -14400L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst', 'zone', 'gmtoff'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT'))), .Names = c('target', 'current'));do.call('all.equal.POSIXt', argv) [1] "Mean absolute difference: 14400" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequalcharacter.testallequalcharacter1# #argv <- structure(list(target = structure(c('A', 'E', 'I', 'M', 'Q', 'U', 'B', 'F', 'J', 'N', 'R', 'V', 'C', 'G', 'K', 'O', 'S', 'W', 'D', 'H', 'L', 'P', 'T', 'X'), .Dim = c(6L, 4L)), current = structure(c('A', 'E', 'I', 'M', 'Q', 'U', 'B', 'F', 'J', 'N', 'R', 'V', 'C', 'G', 'K', 'O', 'S', 'W', 'D', 'H', 'L', 'P', 'T', 'X'), .Dim = c(6L, 4L))), .Names = c('target', 'current'));do.call('all.equal.character', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequalfactor.testallequalfactor1# #argv <- structure(list(target = structure(c(4L, 5L, 1L, 5L, 3L, 4L, 5L, 3L, 2L, 4L), .Label = c('a', 'c', 'i', 's', 't'), class = 'factor', contrasts = structure(c(1, 0, 0, 0, -1, 0, 1, 0, 0, -1, -0.247125681008604, -0.247125681008604, -0.149872105789645, 0.891249148815458, -0.247125681008604, 0.268816352031209, 0.268816352031209, -0.881781351530059, 0.0753322954364324, 0.268816352031209), .Dim = c(5L, 4L), .Dimnames = list(c('a', 'c', 'i', 's', 't'), NULL))), current = structure(c(4L, 5L, 1L, 5L, 3L, 4L, 5L, 3L, 2L, 4L), .Label = c('a', 'c', 'i', 's', 't'), class = 'factor', contrasts = structure(c(1, 0, 0, 0, -1, 0, 1, 0, 0, -1, -0.247125681008604, -0.247125681008604, -0.149872105789645, 0.891249148815458, -0.247125681008604, 0.268816352031209, 0.268816352031209, -0.881781351530059, 0.0753322954364324, 0.268816352031209), .Dim = c(5L, 4L), .Dimnames = list(c('a', 'c', 'i', 's', 't'), NULL)))), .Names = c('target', 'current'));do.call('all.equal.factor', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequalnumeric.testallequalnumeric1# #argv <- structure(list(target = -13.053274367453, current = -13.053274367453, tolerance = 8e-16), .Names = c('target', 'current', 'tolerance'));do.call('all.equal.numeric', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequalnumeric.testallequalnumeric2# #argv <- structure(list(target = c(0, 8, 8, 9, 10, 10, 10, 10, 10, 10, 12, 12, 12, 13, 13, 13, 13, 13, 13, 13, 13, 13, 13, 14, 14, 14, 14, 15, 15, 15, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 16, 17, 17, 17, 18, 18, 19, 19, 20, 20, 20, 20, 21, 21, 21, 21, 22, 24, 24, 24, 24, 25, 27, 28, 28, 29, 29, 29, 29, 30, 31, 32, 32, 33, 33, 36, 36, 36, 37, 37, 39, 39, 40, 40, 41, 41, 42, 42, 42, 42, 44, 44, 46, 46, 47, 48, 48, 48, 49, 49, 51, 51, 52, 52, 52, 52, 53, 55, 57, 57, 57, 57, 57, 60, 60, 60, 60, 60, 61, 61, 61, 61, 62, 63, 66, 68, 69, 69, 69, 71, 71, 71, 72, 73, 73, 74, 74, 75, 75, 75, 76, 76, 77, 77, 77, 77, 77, 79, 79, 79, 79, 80, 80, 80, 80, 81, 82, 82, 83, 84, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 85, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 86, 87, 87, 88, 88, 88, 88, 88, 100, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 24, 24, 25, 27, 27, 28, 29, 30, 31, 32, 33, 34, 36, 36, 37, 39, 39, 40, 41, 42, 43, 44, 46, 46, 47, 48, 49, 51, 51, 52, 53, 54, 55, 57, 57, 59, 59, 60, 61, 62, 63, 64, 66, 66, 68, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 79, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96, 97, 98, 99, 100), current = c(0L, 8L, 8L, 9L, 10L, 10L, 10L, 10L, 10L, 10L, 12L, 12L, 12L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 14L, 14L, 14L, 14L, 15L, 15L, 15L, 16L, 16L, 16L, 16L, 16L, 16L, 16L, 16L, 16L, 16L, 16L, 16L, 17L, 17L, 17L, 18L, 18L, 19L, 19L, 20L, 20L, 20L, 20L, 21L, 21L, 21L, 21L, 22L, 24L, 24L, 24L, 24L, 25L, 27L, 28L, 28L, 29L, 29L, 29L, 29L, 30L, 31L, 32L, 32L, 33L, 33L, 36L, 36L, 36L, 37L, 37L, 39L, 39L, 40L, 40L, 41L, 41L, 42L, 42L, 42L, 42L, 44L, 44L, 46L, 46L, 47L, 48L, 48L, 48L, 49L, 49L, 51L, 51L, 52L, 52L, 52L, 52L, 53L, 55L, 57L, 57L, 57L, 57L, 57L, 60L, 60L, 60L, 60L, 60L, 61L, 61L, 61L, 61L, 62L, 63L, 66L, 68L, 69L, 69L, 69L, 71L, 71L, 71L, 72L, 73L, 73L, 74L, 74L, 75L, 75L, 75L, 76L, 76L, 77L, 77L, 77L, 77L, 77L, 79L, 79L, 79L, 79L, 80L, 80L, 80L, 80L, 81L, 82L, 82L, 83L, 84L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 85L, 86L, 86L, 86L, 86L, 86L, 86L, 86L, 86L, 86L, 86L, 86L, 86L, 87L, 87L, 88L, 88L, 88L, 88L, 88L, 100L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 24L, 24L, 25L, 27L, 27L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 36L, 36L, 37L, 39L, 39L, 40L, 41L, 42L, 43L, 44L, 46L, 46L, 47L, 48L, 49L, 51L, 51L, 52L, 53L, 54L, 55L, 57L, 57L, 59L, 59L, 60L, 61L, 62L, 63L, 64L, 66L, 66L, 68L, 68L, 69L, 70L, 71L, 72L, 73L, 74L, 75L, 76L, 77L, 79L, 79L, 80L, 81L, 82L, 83L, 84L, 85L, 86L, 87L, 88L, 89L, 90L, 91L, 92L, 93L, 94L, 95L, 96L, 97L, 98L, 99L, 100L), tolerance = 2.22044604925031e-14), .Names = c('target', 'current', 'tolerance'));do.call('all.equal.numeric', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequalnumeric.testallequalnumeric3# #argv <- structure(list(target = structure(c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L), .Dim = c(9L, 4L), .Dimnames = list(c('c.1', 'c.2', 'c.3', 'c.4', 'c.5', 'c.6', 'c.7', 'c.8', 'c.9'), c('A', 'B', 'C', 'D'))), current = structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 2.00000000000001, 3, 4, 5, 6, 7, 8, 9, 10, 3.00000000000001, 4, 5, 6, 7, 8, 9, 10, 11, 4.00000000000001, 5, 6, 7, 8, 9, 10, 11, 12), .Dim = c(9L, 4L), .Dimnames = list(c('c.1', 'c.2', 'c.3', 'c.4', 'c.5', 'c.6', 'c.7', 'c.8', 'c.9'), c('A', 'B', 'C', 'D'))), tolerance = 1e-12), .Names = c('target', 'current', 'tolerance'));do.call('all.equal.numeric', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequalnumeric.testallequalnumeric4# #argv <- structure(list(target = 3.18309886183776e-301, current = 3.18309886183791e-301, tolerance = 1e-15), .Names = c('target', 'current', 'tolerance'));do.call('all.equal.numeric', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_allequalraw.testallequalraw1# #argv <- structure(list(target = as.raw(c(1, 2, 3)), current = as.raw(c(1, 2, 3))), .Names = c('target', 'current'));do.call('all.equal.raw', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #all.names(quote(a+y+z+y*y*foo(bar/2)), functions=FALSE, max.names=10, unique=TRUE) [1] "a" "y" "z" "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #all.names(quote(a+y+z+y*y*foo(bar/2)), functions=TRUE, max.names=10, unique=FALSE) [1] "+" "+" "+" "a" "y" "z" "*" "*" "y" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #all.names(quote(a+y+z+y*y*foo(bar/2)), functions=TRUE, max.names=10, unique=TRUE) [1] "+" "a" "y" "z" "*" "foo" "/" "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #all.names(quote(a+y+z+y*y*foo(bar/2)), functions=TRUE, max.names=2, unique=TRUE) [1] "+" "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #all.names(quote(a+y+z+y*y*function(x=bar/2) baz(1)), functions=FALSE, max.names=10, unique=TRUE) [1] "a" "y" "z" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #all.names(quote(a+y+z+y*y*function(x=bar/2) baz(1)), functions=TRUE, max.names=10, unique=FALSE) [1] "+" "+" "+" "a" "y" "z" "*" "*" "y" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #all.names(quote(a+y+z+y*y*function(x=bar/2) baz(1)), functions=TRUE, max.names=10, unique=TRUE) [1] "+" "a" "y" "z" "*" "function" "baz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #all.names(quote(a+y+z+y*y*function(x=bar/2) baz(1)), functions=TRUE, max.names=2, unique=TRUE) [1] "+" "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #all.names(quote(y ~ ((g1) * exp((log(g2/g1)) * (1 - exp(-k * (x - Ta)))/(1 - exp(-k * (Tb - Ta)))))), FALSE, -1L, TRUE) [1] "y" "g1" "g2" "k" "x" "Ta" "Tb" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(as.symbol('a'), max.names=-1)} [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(as.symbol('a'), max.names=-2)} character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(as.symbol('a'), max.names=0)} character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(as.symbol('a'), max.names=1)} [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(expression(sin(x+y+x)), functions=F) } [1] "x" "y" "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(expression(sin(x+y+x)), functions=NA) } [1] "x" "y" "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(expression(sin(x+y+x)), functions=NULL) } [1] "x" "y" "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(expression(sin(x+y+x)), functions=T) } [1] "sin" "+" "+" "x" "y" "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(expression(sin(x+y+x)), max.names=NA) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(expression(sin(x+y+x)), max.names=NULL) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(expression(sin(x+y+x)), unique=F) } [1] "sin" "+" "+" "x" "y" "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(expression(sin(x+y+x)), unique=NA) } [1] "sin" "+" "x" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(expression(sin(x+y+x)), unique=NULL) } [1] "sin" "+" "x" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(expression(sin(x+y+x)), unique=T) } [1] "sin" "+" "x" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testAllNames# #{ all.names(quote(switch(x, 'median' =, 'hello' = print('hello case')))) } [1] "switch" "x" "print" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testallnames1# #argv <- list(quote(y ~ ((g1) * exp((log(g2/g1)) * (1 - exp(-k * (x - Ta)))/(1 - exp(-k * (Tb - Ta)))))), FALSE, -1L, TRUE); .Internal(all.names(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] "y" "g1" "g2" "k" "x" "Ta" "Tb" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testallnames2# #argv <- list(logical(0), logical(0), -1L, TRUE); .Internal(all.names(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testallnames3# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)), TRUE, -1L, FALSE); .Internal(all.names(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testallnames4# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), -1L, FALSE); .Internal(all.names(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_allnames.testallnames5# #argv <- list(0.1, FALSE, -1L, TRUE); .Internal(all.names(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_allvars.testallvars1# #argv <- structure(list(expr = expression(quote(temp[1, ] ~ 3))), .Names = 'expr');do.call('all.vars', argv) [1] "temp" ##com.oracle.truffle.r.test.builtins.TestBuiltin_allvars.testallvars2# #{ fml <- as.formula('v ~ a + b'); fml[[2]] <- NULL; all.vars(fml) } [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_and_octmode.testand_octmode1# #argv <- structure(list(a = structure(integer(0), class = 'octmode'), b = '400'), .Names = c('a', 'b'));do.call('&.octmode', argv) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any() } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(0) } [1] FALSE Warning message: In any(0) : coercing argument of type 'double' to logical ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(1) } [1] TRUE Warning message: In any(1) : coercing argument of type 'double' to logical ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(FALSE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(FALSE, NA, na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(FALSE, NA, na.rm=TRUE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(NA, NA, NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(NULL); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(TRUE, FALSE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(TRUE, FALSE, NA, na.rm=TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(TRUE, TRUE, NA) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(TRUE, TRUE, NA, na.rm=TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(TRUE, TRUE, TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ any(logical(0)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testAny# #{ d<-data.frame(c(1L,2L), c(10L, 20L)); any(d) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany1# #argv <- list(structure(c(TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Tsp = c(1, 101, 1), class = 'ts'));any(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany10# #argv <- list(structure(c(FALSE, FALSE, FALSE), .Dim = 3L, .Dimnames = structure(list(c('1', '2', NA)), .Names = '')));any(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany11# #argv <- list(logical(0));any(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany12# #argv <- list(structure(FALSE, .Dim = c(1L, 1L)));any(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany13# #argv <- list(structure(logical(0), .Dim = c(0L, 0L)));any(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany14# #argv <- list(c(FALSE, TRUE, FALSE));any(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany15# #argv <- list(structure(c(NA, NA, NA, NA, NA, NA, NA, NA), .Names = c('base', 'utils', 'methods', 'grDevices', 'graphics', 'stats', 'lapack', 'R_X11')));any(argv[[1]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany17#Output.IgnoreWarningContext# #argv <- list('NA');do.call('any', argv) [1] NA Warning message: In any("NA") : coercing argument of type 'character' to logical ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany2# #argv <- list(structure(c(FALSE, FALSE, FALSE), .Dim = 3L, .Dimnames = list(c('A', 'B', 'C'))));any(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany3# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Tsp = c(1949, 1960.91666666667, 12), class = 'ts'));any(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany4# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE, TRUE), .Names = c('1', '2', '3', '4', '5'), .Dim = 5L, .Dimnames = list(c('1', '2', '3', '4', '5'))));any(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany5# #argv <- list(structure(c(14, 2, 0, 2, -7, 0), .Dim = c(3L, 2L)));any(argv[[1]]); [1] TRUE Warning message: In any(argv[[1]]) : coercing argument of type 'double' to logical ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany6# #any( ); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany7# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = 3:4, .Dimnames = structure(list(x1 = c('a', 'b', 'c'), x2 = c('a', 'b', 'c', NA)), .Names = c('x1', 'x2'))));any(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany8# #argv <- list(structure(c(TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(4L, 3L), .Dimnames = list(c('', 'Hair:Eye', 'Hair:Sex', 'Eye:Sex'), c('Df', 'Deviance', 'AIC'))));any(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_any.testany9# #argv <- list(c(1L, 1L, 1L, 1L, 1L));any(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c("TRUE", "TRUE", "FALSE", "FALSE"), 1) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c("TRUE", "TRUE", "FALSE", "FALSE"), FALSE) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c("TRUE", "TRUE", "FALSE", "FALSE"), TRUE) } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c("abc", "good", "hello", "hello", "abc")) } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1)) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1+0i, 6+7i, 1+0i), TRUE)} [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1+1i, 4-6i, 4-6i, 6+7i)) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1, 1, 4, 5, 4), TRUE, TRUE) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1, 4+6i, 7+7i, 1), incomparables = c(1, 2)) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1,2,1)) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1,2,3,2), incomparables = c(2+6i)) } [1] 0 Warning message: In anyDuplicated.default(c(1, 2, 3, 2), incomparables = c(2 + (0+6i))) : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1,2,3,4)) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1L, 2L, 1L, 1L, 3L, 2L), incomparables = "cat") } [1] 3 Warning message: In anyDuplicated.default(c(1L, 2L, 1L, 1L, 3L, 2L), incomparables = "cat") : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1L, 2L, 3L, 4L, 2L, 3L)) } [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1L, 2L, 3L, 4L, 2L, 3L), fromLast = TRUE) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(1L, 2L, 3L, 4L, 2L, 3L), incomparables = TRUE )} [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(27.2, 68.4, 94.3, 22.2)) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(TRUE, FALSE, TRUE), TRUE) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(c(TRUE, FALSE, TRUE), TRUE, fromLast = 1) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{ anyDuplicated(list(76.5, 5L, 5L, 76.5, 5, 5), incomparables = c(5L, 76.5)) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{anyDuplicated(c("abc"))} [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{anyDuplicated(c("abc", "def", "abc"))} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{anyDuplicated(c("abc", "def", "ghi", "jkl"))} [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{anyDuplicated(c(2+2i)) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{anyDuplicated(c(2+2i, 3+3i, 2+2i)) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{anyDuplicated(c(2+2i, 3+3i, 4+4i, 5+5i)) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{anyDuplicated(c(FALSE))} [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{anyDuplicated(c(FALSE, TRUE))} [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testAnyDuplicated# #{anyDuplicated(c(FALSE, TRUE, FALSE))} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated1# #argv <- list(c('U', 'V'), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated10# #argv <- list(c(12784, 12874, 12965, 13057, 13149, 13239, 13330, 13422, 13514, 13604, 13695, 13787, 13879, 13970, 14061, 14153, 14245, 14335), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated11# #argv <- list(structure(c('A', NA), .Names = c('1', '3')), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated12# #argv <- list(c('A', NA), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated13# #argv <- list(c(12784, 13149, 13514, 13879, 14245, 14610), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated14# #argv <- list(character(0), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated15# #argv <- list(c(1L, 1L, 1L, 1L, 1L), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated16# #argv <- list(c('1', '4', '6', '9', '11', NA, '15', '16', '17', '20', '21', '23', '29', '41', '45', '48', '55', '62', '63', '65', '70', '74', '82', '83', '85', '86', '92', '93', '97', '98', '99', '103', '104', '106', '108', '109', '112', '113', '120', '126', '127', '128', '132', '139', '142', '145', '148', '151', '159', '164', '165', '169', '171', '173', '175', '189', '191', '193', '194', '195', '198', '200', '202', '209', '212', '213', '215', '216', '221', '223', '224', '227'), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated18# #argv <- structure(list(x = structure(c(3, 2, 7, 2, 6, 2, 7, 2), .Dim = c(4L, 2L), .Dimnames = list(c('A', 'B', 'C', 'D'), c('M', 'F'))), MARGIN = 0), .Names = c('x', 'MARGIN'));do.call('anyDuplicated', argv) [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated19# #argv <- structure(list(x = c(1, NA, 3, NA, 3), incomparables = c(3, NA)), .Names = c('x', 'incomparables'));do.call('anyDuplicated', argv) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated2# #argv <- list(c('refClassA', 'envRefClass', '.environment', 'refClass', 'environment', 'refObject'), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated3# #argv <- list(c(0, 0.00165722279589047, 0.00331444559178095, 0.00497166838767142, 0.00662889118356189, 0.00828611397945236, 0.00994333677534284, 0.0116005595712333, 0.0132577823671238, 0.0149150051630143, 0.0165722279589047, 0.0182294507547952, 0.0198866735506857, 0.0215438963465761, 0.0232011191424666, 0.0248583419383571, 0.0265155647342476, 0.028172787530138, 0.0298300103260285, 0.031487233121919, 0.0331444559178094, 0.0348016787136999, 0.0364589015095904, 0.0381161243054809, 0.0397733471013713, 0.0414305698972618, 0.0430877926931523, 0.0447450154890428, 0.0464022382849332, 0.0480594610808237, 0.0497166838767142, 0.0513739066726046, 0.0530311294684951, 0.0546883522643856, 0.0563455750602761, 0.0580027978561665, 0.059660020652057, 0.0613172434479475, 0.062974466243838, 0.0646316890397284, 0.0662889118356189, 0.0679461346315094, 0.0696033574273998, 0.0712605802232903, 0.0729178030191808, 0.0745750258150713, 0.0762322486109617, 0.0778894714068522, 0.0795466942027427, 0.0812039169986331, 0.0828611397945236, 0.0845183625904141, 0.0861755853863046, 0.087832808182195, 0.0894900309780855, 0.091147253773976, 0.0928044765698665, 0.0944616993657569, 0.0961189221616474, 0.0977761449575379, 0.0994333677534284, 0.101090590549319, 0.102747813345209, 0.1044050361411, 0.10606225893699, 0.107719481732881, 0.109376704528771, 0.111033927324662, 0.112691150120552, 0.114348372916443, 0.116005595712333, 0.117662818508224, 0.119320041304114, 0.120977264100004, 0.122634486895895, 0.124291709691785, 0.125948932487676, 0.127606155283566, 0.129263378079457, 0.130920600875347, 0.132577823671238, 0.134235046467128, 0.135892269263019, 0.137549492058909, 0.1392067148548, 0.14086393765069, 0.142521160446581, 0.144178383242471, 0.145835606038362, 0.147492828834252, 0.149150051630143, 0.150807274426033, 0.152464497221923, 0.154121720017814, 0.155778942813704, 0.157436165609595, 0.159093388405485, 0.160750611201376, 0.162407833997266, 0.164065056793157, 0.165722279589047, 0.167379502384938, 0.169036725180828, 0.170693947976719, 0.172351170772609, 0.1740083935685, 0.17566561636439, 0.177322839160281, 0.178980061956171, 0.180637284752062, 0.182294507547952, 0.183951730343842, 0.185608953139733, 0.187266175935623, 0.188923398731514, 0.190580621527404, 0.192237844323295, 0.193895067119185, 0.195552289915076, 0.197209512710966, 0.198866735506857, 0.200523958302747, 0.202181181098638, 0.203838403894528, 0.205495626690419, 0.207152849486309, 0.2088100722822, 0.21046729507809, 0.21212451787398, 0.213781740669871, 0.215438963465761, 0.217096186261652, 0.218753409057542, 0.220410631853433, 0.222067854649323, 0.223725077445214, 0.225382300241104, 0.227039523036995, 0.228696745832885, 0.230353968628776, 0.232011191424666, 0.233668414220557, 0.235325637016447, 0.236982859812338, 0.238640082608228, 0.240297305404119, 0.241954528200009, 0.243611750995899, 0.24526897379179, 0.24692619658768, 0.248583419383571, 0.250240642179461, 0.251897864975352, 0.253555087771242, 0.255212310567133, 0.256869533363023, 0.258526756158914, 0.260183978954804, 0.261841201750695, 0.263498424546585, 0.265155647342476, 0.266812870138366, 0.268470092934257, 0.270127315730147, 0.271784538526038, 0.273441761321928, 0.275098984117818, 0.276756206913709, 0.278413429709599, 0.28007065250549, 0.28172787530138, 0.283385098097271, 0.285042320893161, 0.286699543689052, 0.288356766484942, 0.290013989280833, 0.291671212076723, 0.293328434872614, 0.294985657668504, 0.296642880464395, 0.298300103260285, 0.299957326056176, 0.301614548852066, 0.303271771647956, 0.304928994443847, 0.306586217239737, 0.308243440035628, 0.309900662831518, 0.311557885627409, 0.313215108423299, 0.31487233121919, 0.31652955401508, 0.318186776810971, 0.319843999606861, 0.321501222402752, 0.323158445198642, 0.324815667994533, 0.326472890790423, 0.328130113586314, 0.329787336382204, 0.331444559178095, 0.333101781973985, 0.334759004769875, 0.336416227565766, 0.338073450361656, 0.339730673157547, 0.341387895953437, 0.343045118749328, 0.344702341545218, 0.346359564341109, 0.348016787136999, 0.34967400993289, 0.35133123272878, 0.352988455524671, 0.354645678320561, 0.356302901116452, 0.357960123912342, 0.359617346708233, 0.361274569504123, 0.362931792300013, 0.364589015095904, 0.366246237891794, 0.367903460687685, 0.369560683483575, 0.371217906279466, 0.372875129075356, 0.374532351871247, 0.376189574667137, 0.377846797463028, 0.379504020258918, 0.381161243054809, 0.382818465850699, 0.38447568864659, 0.38613291144248, 0.387790134238371, 0.389447357034261, 0.391104579830152, 0.392761802626042, 0.394419025421932, 0.396076248217823, 0.397733471013713, 0.399390693809604, 0.401047916605494, 0.402705139401385, 0.404362362197275, 0.406019584993166, 0.407676807789056, 0.409334030584947, 0.410991253380837, 0.412648476176728, 0.414305698972618, 0.415962921768509, 0.417620144564399, 0.41927736736029, 0.42093459015618, 0.42259181295207, 0.424249035747961), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated4# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated5# #argv <- list(c(NA, 9L, 13L), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated6# #argv <- list(structure(c('5.1\r3.5\r1.4\r0.2', '4.9\r3\r1.4\r0.2', '4.7\r3.2\r1.3\r0.2', '4.6\r3.1\r1.5\r0.2', '5\r3.6\r1.4\r0.2', '5.4\r3.9\r1.7\r0.4', '4.6\r3.4\r1.4\r0.3', '5\r3.4\r1.5\r0.2', '4.4\r2.9\r1.4\r0.2', '4.9\r3.1\r1.5\r0.1', '5.4\r3.7\r1.5\r0.2', '4.8\r3.4\r1.6\r0.2', '4.8\r3\r1.4\r0.1', '4.3\r3\r1.1\r0.1', '5.8\r4\r1.2\r0.2', '5.7\r4.4\r1.5\r0.4', '5.4\r3.9\r1.3\r0.4', '5.1\r3.5\r1.4\r0.3', '5.7\r3.8\r1.7\r0.3', '5.1\r3.8\r1.5\r0.3', '5.4\r3.4\r1.7\r0.2', '5.1\r3.7\r1.5\r0.4', '4.6\r3.6\r1\r0.2', '5.1\r3.3\r1.7\r0.5', '4.8\r3.4\r1.9\r0.2', '5\r3\r1.6\r0.2', '5\r3.4\r1.6\r0.4', '5.2\r3.5\r1.5\r0.2', '5.2\r3.4\r1.4\r0.2', '4.7\r3.2\r1.6\r0.2', '4.8\r3.1\r1.6\r0.2', '5.4\r3.4\r1.5\r0.4', '5.2\r4.1\r1.5\r0.1', '5.5\r4.2\r1.4\r0.2', '4.9\r3.1\r1.5\r0.2', '5\r3.2\r1.2\r0.2', '5.5\r3.5\r1.3\r0.2', '4.9\r3.6\r1.4\r0.1', '4.4\r3\r1.3\r0.2', '5.1\r3.4\r1.5\r0.2', '5\r3.5\r1.3\r0.3', '4.5\r2.3\r1.3\r0.3', '4.4\r3.2\r1.3\r0.2', '5\r3.5\r1.6\r0.6', '5.1\r3.8\r1.9\r0.4', '4.8\r3\r1.4\r0.3', '5.1\r3.8\r1.6\r0.2', '4.6\r3.2\r1.4\r0.2', '5.3\r3.7\r1.5\r0.2', '5\r3.3\r1.4\r0.2', '7\r3.2\r4.7\r1.4', '6.4\r3.2\r4.5\r1.5', '6.9\r3.1\r4.9\r1.5', '5.5\r2.3\r4\r1.3', '6.5\r2.8\r4.6\r1.5', '5.7\r2.8\r4.5\r1.3', '6.3\r3.3\r4.7\r1.6', '4.9\r2.4\r3.3\r1', '6.6\r2.9\r4.6\r1.3', '5.2\r2.7\r3.9\r1.4', '5\r2\r3.5\r1', '5.9\r3\r4.2\r1.5', '6\r2.2\r4\r1', '6.1\r2.9\r4.7\r1.4', '5.6\r2.9\r3.6\r1.3', '6.7\r3.1\r4.4\r1.4', '5.6\r3\r4.5\r1.5', '5.8\r2.7\r4.1\r1', '6.2\r2.2\r4.5\r1.5', '5.6\r2.5\r3.9\r1.1', '5.9\r3.2\r4.8\r1.8', '6.1\r2.8\r4\r1.3', '6.3\r2.5\r4.9\r1.5', '6.1\r2.8\r4.7\r1.2', '6.4\r2.9\r4.3\r1.3', '6.6\r3\r4.4\r1.4', '6.8\r2.8\r4.8\r1.4', '6.7\r3\r5\r1.7', '6\r2.9\r4.5\r1.5', '5.7\r2.6\r3.5\r1', '5.5\r2.4\r3.8\r1.1', '5.5\r2.4\r3.7\r1', '5.8\r2.7\r3.9\r1.2', '6\r2.7\r5.1\r1.6', '5.4\r3\r4.5\r1.5', '6\r3.4\r4.5\r1.6', '6.7\r3.1\r4.7\r1.5', '6.3\r2.3\r4.4\r1.3', '5.6\r3\r4.1\r1.3', '5.5\r2.5\r4\r1.3', '5.5\r2.6\r4.4\r1.2', '6.1\r3\r4.6\r1.4', '5.8\r2.6\r4\r1.2', '5\r2.3\r3.3\r1', '5.6\r2.7\r4.2\r1.3', '5.7\r3\r4.2\r1.2', '5.7\r2.9\r4.2\r1.3', '6.2\r2.9\r4.3\r1.3', '5.1\r2.5\r3\r1.1', '5.7\r2.8\r4.1\r1.3', '6.3\r3.3\r6\r2.5', '5.8\r2.7\r5.1\r1.9', '7.1\r3\r5.9\r2.1', '6.3\r2.9\r5.6\r1.8', '6.5\r3\r5.8\r2.2', '7.6\r3\r6.6\r2.1', '4.9\r2.5\r4.5\r1.7', '7.3\r2.9\r6.3\r1.8', '6.7\r2.5\r5.8\r1.8', '7.2\r3.6\r6.1\r2.5', '6.5\r3.2\r5.1\r2', '6.4\r2.7\r5.3\r1.9', '6.8\r3\r5.5\r2.1', '5.7\r2.5\r5\r2', '5.8\r2.8\r5.1\r2.4', '6.4\r3.2\r5.3\r2.3', '6.5\r3\r5.5\r1.8', '7.7\r3.8\r6.7\r2.2', '7.7\r2.6\r6.9\r2.3', '6\r2.2\r5\r1.5', '6.9\r3.2\r5.7\r2.3', '5.6\r2.8\r4.9\r2', '7.7\r2.8\r6.7\r2', '6.3\r2.7\r4.9\r1.8', '6.7\r3.3\r5.7\r2.1', '7.2\r3.2\r6\r1.8', '6.2\r2.8\r4.8\r1.8', '6.1\r3\r4.9\r1.8', '6.4\r2.8\r5.6\r2.1', '7.2\r3\r5.8\r1.6', '7.4\r2.8\r6.1\r1.9', '7.9\r3.8\r6.4\r2', '6.4\r2.8\r5.6\r2.2', '6.3\r2.8\r5.1\r1.5', '6.1\r2.6\r5.6\r1.4', '7.7\r3\r6.1\r2.3', '6.3\r3.4\r5.6\r2.4', '6.4\r3.1\r5.5\r1.8', '6\r3\r4.8\r1.8', '6.9\r3.1\r5.4\r2.1', '6.7\r3.1\r5.6\r2.4', '6.9\r3.1\r5.1\r2.3', '5.8\r2.7\r5.1\r1.9', '6.8\r3.2\r5.9\r2.3', '6.7\r3.3\r5.7\r2.5', '6.7\r3\r5.2\r2.3', '6.3\r2.5\r5\r1.9', '6.5\r3\r5.2\r2', '6.2\r3.4\r5.4\r2.3', '5.9\r3\r5.1\r1.8'), .Dim = c(50L, 3L), .Dimnames = list(NULL, c('Setosa', 'Versicolor', 'Virginica'))), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 143 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated7# #argv <- list(c(-6, -3, 0, 3, 6, 9, 12, 15), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated8# #argv <- list(c(9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 1L, 2L, 3L, 4L, 5L, 3L, 4L, 5L, 6L, 7L, 0L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L), FALSE, TRUE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 22 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicated.testanyDuplicated9# #argv <- list(c(-1.001, -1, -0.999), FALSE, FALSE); .Internal(anyDuplicated(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicateddefault.testanyDuplicateddefault1# #argv <- structure(list(x = c(1, NA, 3, NA, 3), incomparables = c(3, NA)), .Names = c('x', 'incomparables'));do.call('anyDuplicated.default', argv) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyDuplicatedmatrix.testanyDuplicatedmatrix1# #argv <- structure(list(x = structure(c(3, 2, 7, 2, 6, 2, 7, 2), .Dim = c(4L, 2L), .Dimnames = list(c('A', 'B', 'C', 'D'), c('M', 'F'))), MARGIN = 0), .Names = c('x', 'MARGIN'));do.call('anyDuplicated.matrix', argv) [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testSideEffect# #{ a <- c(1, 2, 4); foo <- function() { a[[1]] <<- NA; FALSE; }; anyNA(a, foo()) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA1# #argv <- list(c(1.81566026854212e-304, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0));do.call('anyNA', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA2# #anyNA(list(list(4,5,NA), 3), recursive=TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA2# #anyNA(list(list(c(NA)),c(1)), recursive=FALSE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA2# #anyNA(list(list(c(NA)),c(1)), recursive=TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA2# #anyNA(list(list(c(NA)),c(1)), recursive=c(FALSE,TRUE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(c(1, 2, 3)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(c(1, NA, 3)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(c(1, NA, 3), recursive = TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(1, NA)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(1, NA), recursive = TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = NA)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = NA), recursive = TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = NA, b = 'a')) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = NA, b = 'a'), recursive = TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = c('asdf', NA), b = 'a')) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = c('asdf', NA), b = 'a'), recursive = TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = c(1, 2, 3), b = 'a')) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = c(1, 2, 3), b = 'a'), recursive = TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = c(1, 2, 3), b = list(NA, 'a')), recursive = TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = c(1, NA, 3), b = 'a')) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = c(1, NA, 3), b = 'a'), recursive = TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = c(NA, 3), b = 'a')) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_anyNA.testanyNA3# #anyNA(list(a = c(NA, 3), b = 'a'), recursive = TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ a = array(1:24,c(2,3,4)); b = aperm(a); c(dim(b)[1],dim(b)[2],dim(b)[3]) } [1] 4 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ a = array(1:24,c(2,3,4)); b = aperm(a, c(2,3,1)); a[1,2,3] == b[2,3,1] } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ a = array(1:24,c(2,3,4)); b = aperm(a, c(2,3,1), resize = FALSE); a[1,2,3] == b[2,1,2] } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ a = array(1:24,c(2,3,4)); b = aperm(a, c(3,2,1), resize=FALSE); c(dim(b)[1],dim(b)[2],dim(b)[3]) } [1] 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ a = array(1:24,c(2,3,4)); b = aperm(a,, resize=FALSE); c(dim(b)[1],dim(b)[2],dim(b)[3]) } [1] 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ a = array(1:24,c(3,3,3)); b = aperm(a, c(2,3,1)); c(a[1,2,3] == b[2,3,1], a[2,3,1] == b[3,1,2], a[3,1,2] == b[1,2,3]) } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ a = array(1:24,c(3,3,3)); b = aperm(a, c(2,3,1), resize = FALSE); c(a[1,2,3] == b[2,3,1], a[2,3,1] == b[3,1,2], a[3,1,2] == b[1,2,3]) } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ a = array(1:4,c(2,2)); b = aperm(a); c(a[1,1] == b[1,1], a[1,2] == b[2,1], a[2,1] == b[1,2], a[2,2] == b[2,2]) } [1] TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ aperm(array(1,c( 3,3,3)), c(1,2,1)); } Error in aperm.default(array(1, c(3, 3, 3)), c(1, 2, 1)) : invalid 'perm' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ aperm(array(1,c(3,3,3)), c(1,2)); } Error in aperm.default(array(1, c(3, 3, 3)), c(1, 2)) : 'perm' is of wrong length 2 (!= 3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ aperm(array(1,c(3,3,3)), c(1,2,0)); } Error in aperm.default(array(1, c(3, 3, 3)), c(1, 2, 0)) : value out of range in 'perm' ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ aperm(array(1:27,c(3,3,3)), c(1+1i,3+3i,2+2i))[1,2,3] == array(1:27,c(3,3,3))[1,3,2]; } [1] TRUE Warning message: In aperm.default(array(1:27, c(3, 3, 3)), c(1 + (0+1i), 3 + (0+3i), : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ aperm(array(c('FASTR', 'IS', 'SO', 'FAST'), c(3,1,2))) } , , 1 [,1] [1,] "FASTR" [2,] "FAST" , , 2 [,1] [1,] "IS" [2,] "FASTR" , , 3 [,1] [1,] "SO" [2,] "IS" ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ aperm(array(c(3+2i, 5+0i, 1+3i, 5-3i), c(2,2,2))) } , , 1 [,1] [,2] [1,] 3+2i 1+3i [2,] 3+2i 1+3i , , 2 [,1] [,2] [1,] 5+0i 5-3i [2,] 5+0i 5-3i ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ aperm(array(c(TRUE, FALSE, TRUE, TRUE, FALSE), c(2, 5, 2))) } , , 1 [,1] [,2] [,3] [,4] [,5] [1,] TRUE TRUE FALSE FALSE TRUE [2,] TRUE TRUE FALSE FALSE TRUE , , 2 [,1] [,2] [,3] [,4] [,5] [1,] FALSE TRUE TRUE TRUE FALSE [2,] FALSE TRUE TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ aperm(c(1,2,3)); } Error in aperm.default(c(1, 2, 3)) : invalid first argument, must be an array ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testAperm# #{ aperm(c(c(2,3), c(4,5), c(6,7)), c(3,4)) } Error in aperm.default(c(c(2, 3), c(4, 5), c(6, 7)), c(3, 4)) : invalid first argument, must be an array ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testApermAttrs# #{ a<-array(1:24, c(2,3,4), dimnames=list(x=c('x1','x2'),y=c('y1','y2','y3'),z=c('z1','z2','z3','z4'))); b<-aperm(a,c(3,1,2)); a; b; dimnames(b)$x[1]<-'c'; dimnames(a)$x; } [1] "x1" "x2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm1#Output.IgnoreWhitespace# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(5L, 14L), .Dimnames = list(c('#ifdef', '\\Sexpr', 'build', 'install', 'render'), NULL)), c(2L, 1L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) #ifdef \\Sexpr build install render [1,] FALSE FALSE FALSE FALSE FALSE [2,] FALSE FALSE FALSE FALSE FALSE [3,] FALSE FALSE FALSE FALSE FALSE [4,] FALSE FALSE FALSE FALSE FALSE [5,] FALSE FALSE FALSE FALSE FALSE [6,] FALSE FALSE FALSE FALSE FALSE [7,] FALSE FALSE FALSE FALSE FALSE [8,] FALSE FALSE FALSE FALSE FALSE [9,] FALSE FALSE FALSE FALSE FALSE [10,] FALSE FALSE FALSE FALSE FALSE [11,] FALSE FALSE FALSE FALSE FALSE [12,] FALSE FALSE FALSE FALSE FALSE [13,] FALSE FALSE FALSE FALSE FALSE [14,] FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm10# #argv <- list(structure(c(32, 53, 10, 3, 11, 50, 10, 30, 10, 25, 7, 5, 3, 15, 7, 8, 36, 66, 16, 4, 9, 34, 7, 64, 5, 29, 7, 5, 2, 14, 7, 8), .Dim = c(4L, 4L, 2L), .Dimnames = structure(list(Hair = c('Black', 'Brown', 'Red', 'Blond'), Eye = c('Brown', 'Blue', 'Hazel', 'Green'), Sex = c('Male', 'Female')), .Names = c('Hair', 'Eye', 'Sex')), class = 'table'), c(3L, 1L, 2L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) , , Eye = Brown Hair Sex Black Brown Red Blond Male 32 53 10 3 Female 36 66 16 4 , , Eye = Blue Hair Sex Black Brown Red Blond Male 11 50 10 30 Female 9 34 7 64 , , Eye = Hazel Hair Sex Black Brown Red Blond Male 10 25 7 5 Female 5 29 7 5 , , Eye = Green Hair Sex Black Brown Red Blond Male 3 15 7 8 Female 2 14 7 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm11# #argv <- list(structure(list(3, 3, 3, 3, 3, 'fred'), .Dim = 2:3), NULL, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [1,] 3 3 [2,] 3 3 [3,] 3 "fred" ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm12# #argv <- list(structure(c(1, 0, -1, 0.5, -0.5, NA, NA, NA, 0), .Dim = c(3L, 3L)), 1:2, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [1,] 1 0.5 NA [2,] 0 -0.5 NA [3,] -1 NA 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm13# #argv <- list(structure(c(' Null deviance:', 'Residual deviance:', '3.118557', '0.012672', ' on', ' on', '8', '7', ' degrees of freedom\n', ' degrees of freedom\n'), .Dim = c(2L, 5L), .Dimnames = list(c('null.deviance', 'deviance'), NULL)), c(2L, 1L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) null.deviance deviance [1,] " Null deviance:" "Residual deviance:" [2,] "3.118557" "0.012672" [3,] " on" " on" [4,] "8" "7" [5,] " degrees of freedom\n" " degrees of freedom\n" ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm14# #argv <- list(structure(character(0), .Dim = c(3L, 0L, 2L)), 1:3, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) , , 1 [1,] [2,] [3,] , , 2 [1,] [2,] [3,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm15#Output.IgnoreWhitespace# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(5L, 20L), .Dimnames = list(c('#ifdef', '\\Sexpr', 'build', 'install', 'render'), NULL)), c(2L, 1L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) #ifdef \\Sexpr build install render [1,] FALSE FALSE FALSE FALSE FALSE [2,] FALSE FALSE FALSE FALSE FALSE [3,] FALSE FALSE FALSE FALSE FALSE [4,] FALSE FALSE FALSE FALSE FALSE [5,] FALSE FALSE FALSE FALSE FALSE [6,] FALSE FALSE FALSE FALSE FALSE [7,] FALSE FALSE FALSE FALSE FALSE [8,] FALSE FALSE FALSE FALSE FALSE [9,] FALSE FALSE FALSE FALSE FALSE [10,] FALSE FALSE FALSE FALSE FALSE [11,] FALSE FALSE FALSE FALSE FALSE [12,] FALSE FALSE FALSE FALSE FALSE [13,] FALSE FALSE FALSE FALSE FALSE [14,] FALSE FALSE FALSE FALSE FALSE [15,] FALSE FALSE FALSE FALSE FALSE [16,] FALSE FALSE FALSE FALSE FALSE [17,] FALSE FALSE FALSE FALSE FALSE [18,] FALSE FALSE FALSE FALSE FALSE [19,] FALSE FALSE FALSE FALSE FALSE [20,] FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm16# #argv <- list(structure(c(0.537261763078809+0i, 0.305061935059249+0.040985454461732i, 0.320062315956695-0.375563080684187i, 0.339383913939873+0.23302799386284i, -0.286918674221019+0.348301421162371i, 0.333809303929022+0i, -0.026432475532662-0.117484096686937i, 0.337897321317337+0.476009430788475i, -0.104431629205049-0.683873316213355i, -0.076600108155357+0.221030150757328i, 0.0283375771475593+0i, -0.439625821284244+0.725562264268455i, -0.093252555843956-0.328135936730845i, 0.099659684890077-0.362886081139892i, -0.146024566266657+0.013219412797458i, 0.437826208287688+0i, -0.047393587739568+0.297523229473226i, 0.053640336864496+0.244704251340016i, 0.189395328272566+0.197948900656662i, 0.744900728861518-0.157648587806964i, -0.63829956885596+0i, 0.190923866036828+0.209348060979014i, 0.478761262752136+0.086103851005322i, 0.365383456834977-0.041833555661111i, 0.222902888615007+0.301211043305794i), .Dim = c(5L, 5L)), 1:2, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [1,] 0.5372618+0.0000000i 0.3338093+0.0000000i 0.02833758+0.0000000i [2,] 0.3050619+0.0409855i -0.0264325-0.1174841i -0.43962582+0.7255623i [3,] 0.3200623-0.3755631i 0.3378973+0.4760094i -0.09325256-0.3281359i [4,] 0.3393839+0.2330280i -0.1044316-0.6838733i 0.09965968-0.3628861i [5,] -0.2869187+0.3483014i -0.0766001+0.2210302i -0.14602457+0.0132194i [,4] [,5] [1,] 0.4378262+0.0000000i -0.6382996+0.0000000i [2,] -0.0473936+0.2975232i 0.1909239+0.2093481i [3,] 0.0536403+0.2447043i 0.4787613+0.0861039i [4,] 0.1893953+0.1979489i 0.3653835-0.0418336i [5,] 0.7449007-0.1576486i 0.2229029+0.3012110i ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm17# #argv <- list(structure(c('add1', 'anova', 'coef', 'confint', 'drop1', 'extractAIC', 'logLik', 'model.frame', 'predict', 'print', 'print', 'summary', 'vcov', 'coef', 'predict', 'print', 'print', 'summary', 'nnet', 'nnet', 'multinom', 'multinom', 'multinom', 'multinom', 'multinom', 'multinom', 'multinom', 'multinom', 'multinom', 'multinom', 'summary.multinom', 'multinom', 'multinom', 'nnet', 'nnet', 'nnet', 'summary.nnet', 'nnet', 'default', 'formula', NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), .Dim = c(20L, 3L)), c(2L, 1L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [1,] "add1" "anova" "coef" "confint" "drop1" "extractAIC" [2,] "multinom" "multinom" "multinom" "multinom" "multinom" "multinom" [3,] NA NA NA NA NA NA [,7] [,8] [,9] [,10] [,11] [1,] "logLik" "model.frame" "predict" "print" "print" [2,] "multinom" "multinom" "multinom" "multinom" "summary.multinom" [3,] NA NA NA NA NA [,12] [,13] [,14] [,15] [,16] [,17] [,18] [1,] "summary" "vcov" "coef" "predict" "print" "print" "summary" [2,] "multinom" "multinom" "nnet" "nnet" "nnet" "summary.nnet" "nnet" [3,] NA NA NA NA NA NA NA [,19] [,20] [1,] "nnet" "nnet" [2,] "default" "formula" [3,] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm18# #argv <- list(structure(c(NA, NA, NA), .Dim = 3L), 1L, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) [1] NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm19# #argv <- list(structure(c(4, 8, 12, 16, 20, 24, 28, 32, 36, 40, 44, 48, 4000, 8000, 12000, 16000, 20000, 24000, 28000, 32000, 36000, 40000, 44000, 48000, 8, 16, 24, 32, 40, 48, 56, 64, 72, 80, 88, 96, 8000, 16000, 24000, 32000, 40000, 48000, 56000, 64000, 72000, 80000, 88000, 96000, 12, 24, 36, 48, 60, 72, 84, 96, 108, 120, 132, 144, 12000, 24000, 36000, 48000, 60000, 72000, 84000, 96000, 108000, 120000, 132000, 144000, 16, 32, 48, 64, 80, 96, 112, 128, 144, 160, 176, 192, 16000, 32000, 48000, 64000, 80000, 96000, 112000, 128000, 144000, 160000, 176000, 192000, 20, 40, 60, 80, 100, 120, 140, 160, 180, 200, 220, 240, 20000, 40000, 60000, 80000, 1e+05, 120000, 140000, 160000, 180000, 2e+05, 220000, 240000, 24, 48, 72, 96, 120, 144, 168, 192, 216, 240, 264, 288, 24000, 48000, 72000, 96000, 120000, 144000, 168000, 192000, 216000, 240000, 264000, 288000, 28, 56, 84, 112, 140, 168, 196, 224, 252, 280, 308, 336, 28000, 56000, 84000, 112000, 140000, 168000, 196000, 224000, 252000, 280000, 308000, 336000, 32, 64, 96, 128, 160, 192, 224, 256, 288, 320, 352, 384, 32000, 64000, 96000, 128000, 160000, 192000, 224000, 256000, 288000, 320000, 352000, 384000, 36, 72, 108, 144, 180, 216, 252, 288, 324, 360, 396, 432, 36000, 72000, 108000, 144000, 180000, 216000, 252000, 288000, 324000, 360000, 396000, 432000, 40, 80, 120, 160, 200, 240, 280, 320, 360, 400, 440, 480, 40000, 80000, 120000, 160000, 2e+05, 240000, 280000, 320000, 360000, 4e+05, 440000, 480000, 44, 88, 132, 176, 220, 264, 308, 352, 396, 440, 484, 528, 44000, 88000, 132000, 176000, 220000, 264000, 308000, 352000, 396000, 440000, 484000, 528000, 48, 96, 144, 192, 240, 288, 336, 384, 432, 480, 528, 576, 48000, 96000, 144000, 192000, 240000, 288000, 336000, 384000, 432000, 480000, 528000, 576000, 52, 104, 156, 208, 260, 312, 364, 416, 468, 520, 572, 624, 52000, 104000, 156000, 208000, 260000, 312000, 364000, 416000, 468000, 520000, 572000, 624000, 56, 112, 168, 224, 280, 336, 392, 448, 504, 560, 616, 672, 56000, 112000, 168000, 224000, 280000, 336000, 392000, 448000, 504000, 560000, 616000, 672000, 60, 120, 180, 240, 300, 360, 420, 480, 540, 600, 660, 720, 60000, 120000, 180000, 240000, 3e+05, 360000, 420000, 480000, 540000, 6e+05, 660000, 720000, 64, 128, 192, 256, 320, 384, 448, 512, 576, 640, 704, 768, 64000, 128000, 192000, 256000, 320000, 384000, 448000, 512000, 576000, 640000, 704000, 768000, 68, 136, 204, 272, 340, 408, 476, 544, 612, 680, 748, 816, 68000, 136000, 204000, 272000, 340000, 408000, 476000, 544000, 612000, 680000, 748000, 816000, 72, 144, 216, 288, 360, 432, 504, 576, 648, 720, 792, 864, 72000, 144000, 216000, 288000, 360000, 432000, 504000, 576000, 648000, 720000, 792000, 864000, 76, 152, 228, 304, 380, 456, 532, 608, 684, 760, 836, 912, 76000, 152000, 228000, 304000, 380000, 456000, 532000, 608000, 684000, 760000, 836000, 912000, 80, 160, 240, 320, 400, 480, 560, 640, 720, 800, 880, 960, 80000, 160000, 240000, 320000, 4e+05, 480000, 560000, 640000, 720000, 8e+05, 880000, 960000, 84, 168, 252, 336, 420, 504, 588, 672, 756, 840, 924, 1008, 84000, 168000, 252000, 336000, 420000, 504000, 588000, 672000, 756000, 840000, 924000, 1008000, 88, 176, 264, 352, 440, 528, 616, 704, 792, 880, 968, 1056, 88000, 176000, 264000, 352000, 440000, 528000, 616000, 704000, 792000, 880000, 968000, 1056000, 92, 184, 276, 368, 460, 552, 644, 736, 828, 920, 1012, 1104, 92000, 184000, 276000, 368000, 460000, 552000, 644000, 736000, 828000, 920000, 1012000, 1104000, 96, 192, 288, 384, 480, 576, 672, 768, 864, 960, 1056, 1152, 96000, 192000, 288000, 384000, 480000, 576000, 672000, 768000, 864000, 960000, 1056000, 1152000), .Dim = c(3L, 4L, 2L, 3L, 4L, 2L), .Dimnames = list(c('A', 'B', 'C'), c('D', 'E', 'F', 'G'), c('frequentist', 'bayesian'), NULL, NULL, c('happy', 'sad'))), c(4L, 1L, 5L, 2L, 6L, 3L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) , , 1, D, happy, frequentist A B C [1,] 4 8 12 [2,] 8 16 24 [3,] 12 24 36 , , 2, D, happy, frequentist A B C [1,] 16 32 48 [2,] 20 40 60 [3,] 24 48 72 , , 3, D, happy, frequentist A B C [1,] 28 56 84 [2,] 32 64 96 [3,] 36 72 108 , , 4, D, happy, frequentist A B C [1,] 40 80 120 [2,] 44 88 132 [3,] 48 96 144 , , 1, E, happy, frequentist A B C [1,] 16 20 24 [2,] 32 40 48 [3,] 48 60 72 , , 2, E, happy, frequentist A B C [1,] 64 80 96 [2,] 80 100 120 [3,] 96 120 144 , , 3, E, happy, frequentist A B C [1,] 112 140 168 [2,] 128 160 192 [3,] 144 180 216 , , 4, E, happy, frequentist A B C [1,] 160 200 240 [2,] 176 220 264 [3,] 192 240 288 , , 1, F, happy, frequentist A B C [1,] 28 32 36 [2,] 56 64 72 [3,] 84 96 108 , , 2, F, happy, frequentist A B C [1,] 112 128 144 [2,] 140 160 180 [3,] 168 192 216 , , 3, F, happy, frequentist A B C [1,] 196 224 252 [2,] 224 256 288 [3,] 252 288 324 , , 4, F, happy, frequentist A B C [1,] 280 320 360 [2,] 308 352 396 [3,] 336 384 432 , , 1, G, happy, frequentist A B C [1,] 40 44 48 [2,] 80 88 96 [3,] 120 132 144 , , 2, G, happy, frequentist A B C [1,] 160 176 192 [2,] 200 220 240 [3,] 240 264 288 , , 3, G, happy, frequentist A B C [1,] 280 308 336 [2,] 320 352 384 [3,] 360 396 432 , , 4, G, happy, frequentist A B C [1,] 400 440 480 [2,] 440 484 528 [3,] 480 528 576 , , 1, D, sad, frequentist A B C [1,] 52 104 156 [2,] 56 112 168 [3,] 60 120 180 , , 2, D, sad, frequentist A B C [1,] 64 128 192 [2,] 68 136 204 [3,] 72 144 216 , , 3, D, sad, frequentist A B C [1,] 76 152 228 [2,] 80 160 240 [3,] 84 168 252 , , 4, D, sad, frequentist A B C [1,] 88 176 264 [2,] 92 184 276 [3,] 96 192 288 , , 1, E, sad, frequentist A B C [1,] 208 260 312 [2,] 224 280 336 [3,] 240 300 360 , , 2, E, sad, frequentist A B C [1,] 256 320 384 [2,] 272 340 408 [3,] 288 360 432 , , 3, E, sad, frequentist A B C [1,] 304 380 456 [2,] 320 400 480 [3,] 336 420 504 , , 4, E, sad, frequentist A B C [1,] 352 440 528 [2,] 368 460 552 [3,] 384 480 576 , , 1, F, sad, frequentist A B C [1,] 364 416 468 [2,] 392 448 504 [3,] 420 480 540 , , 2, F, sad, frequentist A B C [1,] 448 512 576 [2,] 476 544 612 [3,] 504 576 648 , , 3, F, sad, frequentist A B C [1,] 532 608 684 [2,] 560 640 720 [3,] 588 672 756 , , 4, F, sad, frequentist A B C [1,] 616 704 792 [2,] 644 736 828 [3,] 672 768 864 , , 1, G, sad, frequentist A B C [1,] 520 572 624 [2,] 560 616 672 [3,] 600 660 720 , , 2, G, sad, frequentist A B C [1,] 640 704 768 [2,] 680 748 816 [3,] 720 792 864 , , 3, G, sad, frequentist A B C [1,] 760 836 912 [2,] 800 880 960 [3,] 840 924 1008 , , 4, G, sad, frequentist A B C [1,] 880 968 1056 [2,] 920 1012 1104 [3,] 960 1056 1152 , , 1, D, happy, bayesian A B C [1,] 4000 8000 12000 [2,] 8000 16000 24000 [3,] 12000 24000 36000 , , 2, D, happy, bayesian A B C [1,] 16000 32000 48000 [2,] 20000 40000 60000 [3,] 24000 48000 72000 , , 3, D, happy, bayesian A B C [1,] 28000 56000 84000 [2,] 32000 64000 96000 [3,] 36000 72000 108000 , , 4, D, happy, bayesian A B C [1,] 40000 80000 120000 [2,] 44000 88000 132000 [3,] 48000 96000 144000 , , 1, E, happy, bayesian A B C [1,] 16000 20000 24000 [2,] 32000 40000 48000 [3,] 48000 60000 72000 , , 2, E, happy, bayesian A B C [1,] 64000 80000 96000 [2,] 80000 100000 120000 [3,] 96000 120000 144000 , , 3, E, happy, bayesian A B C [1,] 112000 140000 168000 [2,] 128000 160000 192000 [3,] 144000 180000 216000 , , 4, E, happy, bayesian A B C [1,] 160000 200000 240000 [2,] 176000 220000 264000 [3,] 192000 240000 288000 , , 1, F, happy, bayesian A B C [1,] 28000 32000 36000 [2,] 56000 64000 72000 [3,] 84000 96000 108000 , , 2, F, happy, bayesian A B C [1,] 112000 128000 144000 [2,] 140000 160000 180000 [3,] 168000 192000 216000 , , 3, F, happy, bayesian A B C [1,] 196000 224000 252000 [2,] 224000 256000 288000 [3,] 252000 288000 324000 , , 4, F, happy, bayesian A B C [1,] 280000 320000 360000 [2,] 308000 352000 396000 [3,] 336000 384000 432000 , , 1, G, happy, bayesian A B C [1,] 40000 44000 48000 [2,] 80000 88000 96000 [3,] 120000 132000 144000 , , 2, G, happy, bayesian A B C [1,] 160000 176000 192000 [2,] 200000 220000 240000 [3,] 240000 264000 288000 , , 3, G, happy, bayesian A B C [1,] 280000 308000 336000 [2,] 320000 352000 384000 [3,] 360000 396000 432000 , , 4, G, happy, bayesian A B C [1,] 400000 440000 480000 [2,] 440000 484000 528000 [3,] 480000 528000 576000 , , 1, D, sad, bayesian A B C [1,] 52000 104000 156000 [2,] 56000 112000 168000 [3,] 60000 120000 180000 , , 2, D, sad, bayesian A B C [1,] 64000 128000 192000 [2,] 68000 136000 204000 [3,] 72000 144000 216000 , , 3, D, sad, bayesian A B C [1,] 76000 152000 228000 [2,] 80000 160000 240000 [3,] 84000 168000 252000 , , 4, D, sad, bayesian A B C [1,] 88000 176000 264000 [2,] 92000 184000 276000 [3,] 96000 192000 288000 , , 1, E, sad, bayesian A B C [1,] 208000 260000 312000 [2,] 224000 280000 336000 [3,] 240000 300000 360000 , , 2, E, sad, bayesian A B C [1,] 256000 320000 384000 [2,] 272000 340000 408000 [3,] 288000 360000 432000 , , 3, E, sad, bayesian A B C [1,] 304000 380000 456000 [2,] 320000 400000 480000 [3,] 336000 420000 504000 , , 4, E, sad, bayesian A B C [1,] 352000 440000 528000 [2,] 368000 460000 552000 [3,] 384000 480000 576000 , , 1, F, sad, bayesian A B C [1,] 364000 416000 468000 [2,] 392000 448000 504000 [3,] 420000 480000 540000 , , 2, F, sad, bayesian A B C [1,] 448000 512000 576000 [2,] 476000 544000 612000 [3,] 504000 576000 648000 , , 3, F, sad, bayesian A B C [1,] 532000 608000 684000 [2,] 560000 640000 720000 [3,] 588000 672000 756000 , , 4, F, sad, bayesian A B C [1,] 616000 704000 792000 [2,] 644000 736000 828000 [3,] 672000 768000 864000 , , 1, G, sad, bayesian A B C [1,] 520000 572000 624000 [2,] 560000 616000 672000 [3,] 600000 660000 720000 , , 2, G, sad, bayesian A B C [1,] 640000 704000 768000 [2,] 680000 748000 816000 [3,] 720000 792000 864000 , , 3, G, sad, bayesian A B C [1,] 760000 836000 912000 [2,] 800000 880000 960000 [3,] 840000 924000 1008000 , , 4, G, sad, bayesian A B C [1,] 880000 968000 1056000 [2,] 920000 1012000 1104000 [3,] 960000 1056000 1152000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm2# #argv <- list(structure(c('[', 'as.data.frame', 'plot', 'print', 'summary', 'as.character', 'print', 'print', 'plot', 'update', 'dim', 'dimnames', 'dimnames<-', '[', 't', 'summary', 'print', 'barchart', 'barchart', 'barchart', 'barchart', 'barchart', 'barchart', 'bwplot', 'bwplot', 'densityplot', 'densityplot', 'dotplot', 'dotplot', 'dotplot', 'dotplot', 'dotplot', 'dotplot', 'histogram', 'histogram', 'histogram', 'qqmath', 'qqmath', 'stripplot', 'stripplot', 'qq', 'xyplot', 'xyplot', 'levelplot', 'levelplot', 'levelplot', 'levelplot', 'contourplot', 'contourplot', 'contourplot', 'contourplot', 'cloud', 'cloud', 'cloud', 'wireframe', 'wireframe', 'splom', 'splom', 'splom', 'parallelplot', 'parallelplot', 'parallelplot', 'parallel', 'parallel', 'parallel', 'tmd', 'tmd', 'llines', 'ltext', 'lpoints', 'shingle', 'shingle', 'shingle', 'shingle', 'shingle', 'shingleLevel', 'shingleLevel', 'trellis', 'trellis', 'trellis', 'trellis', 'trellis', 'trellis', 'trellis', 'trellis', 'trellis', 'summary.trellis', 'formula', 'array', 'default', 'matrix', 'numeric', 'table', 'formula', 'numeric', 'formula', 'numeric', 'formula', 'array', 'default', 'matrix', 'numeric', 'table', 'formula', 'factor', 'numeric', 'formula', 'numeric', 'formula', 'numeric', 'formula', 'formula', 'ts', 'formula', 'table', 'array', 'matrix', 'formula', 'table', 'array', 'matrix', 'formula', 'matrix', 'table', 'formula', 'matrix', 'formula', 'matrix', 'data.frame', 'formula', 'matrix', 'data.frame', 'formula', 'matrix', 'data.frame', 'formula', 'trellis', 'default', 'default', 'default', NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), .Dim = c(70L, 3L)), c(2L, 1L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [1,] "[" "as.data.frame" "plot" "print" "summary" "as.character" [2,] "shingle" "shingle" "shingle" "shingle" "shingle" "shingleLevel" [3,] NA NA NA NA NA NA [,7] [,8] [,9] [,10] [,11] [,12] [1,] "print" "print" "plot" "update" "dim" "dimnames" [2,] "shingleLevel" "trellis" "trellis" "trellis" "trellis" "trellis" [3,] NA NA NA NA NA NA [,13] [,14] [,15] [,16] [,17] [,18] [1,] "dimnames<-" "[" "t" "summary" "print" "barchart" [2,] "trellis" "trellis" "trellis" "trellis" "summary.trellis" "formula" [3,] NA NA NA NA NA NA [,19] [,20] [,21] [,22] [,23] [,24] [,25] [1,] "barchart" "barchart" "barchart" "barchart" "barchart" "bwplot" "bwplot" [2,] "array" "default" "matrix" "numeric" "table" "formula" "numeric" [3,] NA NA NA NA NA NA NA [,26] [,27] [,28] [,29] [,30] [,31] [1,] "densityplot" "densityplot" "dotplot" "dotplot" "dotplot" "dotplot" [2,] "formula" "numeric" "formula" "array" "default" "matrix" [3,] NA NA NA NA NA NA [,32] [,33] [,34] [,35] [,36] [,37] [1,] "dotplot" "dotplot" "histogram" "histogram" "histogram" "qqmath" [2,] "numeric" "table" "formula" "factor" "numeric" "formula" [3,] NA NA NA NA NA NA [,38] [,39] [,40] [,41] [,42] [,43] [,44] [1,] "qqmath" "stripplot" "stripplot" "qq" "xyplot" "xyplot" "levelplot" [2,] "numeric" "formula" "numeric" "formula" "formula" "ts" "formula" [3,] NA NA NA NA NA NA NA [,45] [,46] [,47] [,48] [,49] [1,] "levelplot" "levelplot" "levelplot" "contourplot" "contourplot" [2,] "table" "array" "matrix" "formula" "table" [3,] NA NA NA NA NA [,50] [,51] [,52] [,53] [,54] [,55] [1,] "contourplot" "contourplot" "cloud" "cloud" "cloud" "wireframe" [2,] "array" "matrix" "formula" "matrix" "table" "formula" [3,] NA NA NA NA NA NA [,56] [,57] [,58] [,59] [,60] [,61] [1,] "wireframe" "splom" "splom" "splom" "parallelplot" "parallelplot" [2,] "matrix" "formula" "matrix" "data.frame" "formula" "matrix" [3,] NA NA NA NA NA NA [,62] [,63] [,64] [,65] [,66] [,67] [1,] "parallelplot" "parallel" "parallel" "parallel" "tmd" "tmd" [2,] "data.frame" "formula" "matrix" "data.frame" "formula" "trellis" [3,] NA NA NA NA NA NA [,68] [,69] [,70] [1,] "llines" "ltext" "lpoints" [2,] "default" "default" "default" [3,] NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm20# #argv <- list(structure(1:24, .Dim = c(4L, 6L), .Dimnames = structure(list(happy = c('a', 'b', 'c', 'd'), sad = c('A', 'B', 'C', 'D', 'E', 'F')), .Names = c('happy', 'sad'))), c(2, 1), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) happy sad a b c d A 1 2 3 4 B 5 6 7 8 C 9 10 11 12 D 13 14 15 16 E 17 18 19 20 F 21 22 23 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm21# #argv <- list(structure(1:120, .Dim = 2:5, .Dimnames = list(NULL, c('a', 'b', 'c'), NULL, c('V5', 'V6', 'V7', 'V8', 'V9'))), 1:4, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) , , 1, V5 a b c [1,] 1 3 5 [2,] 2 4 6 , , 2, V5 a b c [1,] 7 9 11 [2,] 8 10 12 , , 3, V5 a b c [1,] 13 15 17 [2,] 14 16 18 , , 4, V5 a b c [1,] 19 21 23 [2,] 20 22 24 , , 1, V6 a b c [1,] 25 27 29 [2,] 26 28 30 , , 2, V6 a b c [1,] 31 33 35 [2,] 32 34 36 , , 3, V6 a b c [1,] 37 39 41 [2,] 38 40 42 , , 4, V6 a b c [1,] 43 45 47 [2,] 44 46 48 , , 1, V7 a b c [1,] 49 51 53 [2,] 50 52 54 , , 2, V7 a b c [1,] 55 57 59 [2,] 56 58 60 , , 3, V7 a b c [1,] 61 63 65 [2,] 62 64 66 , , 4, V7 a b c [1,] 67 69 71 [2,] 68 70 72 , , 1, V8 a b c [1,] 73 75 77 [2,] 74 76 78 , , 2, V8 a b c [1,] 79 81 83 [2,] 80 82 84 , , 3, V8 a b c [1,] 85 87 89 [2,] 86 88 90 , , 4, V8 a b c [1,] 91 93 95 [2,] 92 94 96 , , 1, V9 a b c [1,] 97 99 101 [2,] 98 100 102 , , 2, V9 a b c [1,] 103 105 107 [2,] 104 106 108 , , 3, V9 a b c [1,] 109 111 113 [2,] 110 112 114 , , 4, V9 a b c [1,] 115 117 119 [2,] 116 118 120 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm22# #argv <- list(structure(c(' Null deviance:', 'Residual deviance:', '67.5316', ' 4.5512', ' on', ' on', '9', '7', ' degrees of freedom\n', ' degrees of freedom\n'), .Dim = c(2L, 5L), .Dimnames = list(c('null.deviance', 'deviance'), NULL)), c(2L, 1L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) null.deviance deviance [1,] " Null deviance:" "Residual deviance:" [2,] "67.5316" " 4.5512" [3,] " on" " on" [4,] "9" "7" [5,] " degrees of freedom\n" " degrees of freedom\n" ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm23# #argv <- list(structure(c(FALSE, FALSE, FALSE), .Dim = c(3L, 1L)), c(2L, 1L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [1,] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm24# #argv <- list(structure(c(3, 3, 3, 3, 3, 3, 3, 3, 4, 3, 2, 1, 2, 3, 4, 5), .Dim = c(8L, 2L), .Dimnames = list(c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h'), c('x1', 'x2'))), c(2L, 1L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) a b c d e f g h x1 3 3 3 3 3 3 3 3 x2 4 3 2 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm25# #argv <- list(structure(c(0, 1.23517986278748, 1.95771376416406, 2.47035972557496, 2.86799882564536, 3.19289362695154, 3.46758826742286, 3.70553958836244, 3.91542752832811, 4.10317868843284, 4.27302027203108, 4.42807348973901, 4.57070862330685, 4.70276813021034, 4.82571258980942, 4.94071945114991, 5.04875179140451, 5.15060739111559, 5.2469545231864, 5.33835855122032, 5.42530203158692, 5.50820013481856, 5.58741263619316, 5.66325335252649, 5.73599765129073, 5.80588848609433, 5.87314129249217, 5.93794799299782, 6.00048029898585, 6.0608924525969, 6.11932351888589, 6.17589931393739, 6.23073403619514, 6.28393165419199, 6.33558709306823, 6.38578725390307, 6.43461189335533, 6.48213438597388, 6.52842238747091, 6.5735384140078, 6.61754034994095, 6.6604818943744, 6.70241295516147, 6.74337999760604, 6.78342635397348, 6.82259249898064, 6.86091629565604, 6.89843321531397, 6.93517653484573, 6.97117751407821, 7.00646555556857, 7.04106834888181, 7.07501200112497, 7.10832115527965, 7.14101909767645, 7.1731278557853, 7.20466828735046, 7.23566016177333, 7.26612223453848, 7.29607231538438, 7.3255273308395, 7.35450338167337, 7.38301579575098, 7.41107917672487, 7.43870744895221, 7.46591389898262, 7.49271121392624, 7.51911151697947, 7.54512640035722, 7.57076695585571, 7.59604380324749, 7.62096711669055, 7.64554664931599, 7.66979175614282, 7.69371141545478, 7.71731424876136, 7.74060853945395, 7.76360225025839, 7.78630303957574, 7.80871827679528, 7.83085505665623, 7.85272021272842, 7.87432033007586, 7.89566175716188, 7.91675061704988, 7.93759281794895, 7.95819406314991, 7.97855986039352, 7.99869553070936, 8.01860621676096, 8.03829689072971, 8.05777236176812, 8.07703728304995, 8.09609615844352, 8.11495334883177, 8.13361307810145, 8.15207943882202, 8.17035639763321, 8.1884478003592, 8.20635737686569, 5.76558893216369, 5.5342688729893, 5.69366159038267, 6.17674775070929, 6.08762735966107, 6.68653280779044, 6.70253591217234, 6.32938323618963, 6.81735284786279, 6.64835766778347, 6.91213030655848, 7.1496842781073, 7.25682341590407, 7.46164094256645, 7.37149913131863, 7.56470707593246, 7.71334191900841, 7.71375128844693, 7.82793409372511, 7.90749319121623, 7.96255733207686, 8.11381187364273, 8.21211505208663, 8.18427543602736, 8.29133399017863, 8.31295002652197, 8.345677476918, 8.39053879616249, 8.40857122007675, 8.48086068897741, 8.7064475146364, 8.66563269607315, 8.79435721712053, 8.7996087849725, 8.82443395257555, 8.91314507957224, 8.8999544270272, 8.96760168103462, 8.93548690078514, 9.01332239000153, 9.07083338712431, 9.15422051683385, 9.20109302097792, 9.2062218972166, 9.31170984199071, 9.30909253379462, 9.35447695163181, 9.45333740615033, 9.41458248768079, 9.46983861007334, 9.51652628670815, 9.5301888386762, 9.59497468213833, 9.61268143770055, 9.64141492393412, 9.68857453461133, 9.77580537125637, 9.79816256416163, 9.79128849346381, 9.80699184934282, 9.91833626833319, 9.95487179604373, 9.88086373278725, 9.93505313047982, 9.97034080826287, 9.97752630228797, 10.1165750634827, 10.0977558023188, 10.1414502841663, 10.129071787117, 10.166774063688, 10.1792762662323, 10.2172491181904, 10.2670710204409, 10.2742314938915, 10.287876622612, 10.3447249333494, 10.4075370351282, 10.3465199067119, 10.4404223214255, 10.422301774768, 10.4739543513507, 10.5314461891317, 10.4813429169605, 10.5097541699286, 10.5389544549716, 10.5752633644781, 10.6133054015308, 10.6776080133421, 10.6266190058322, 10.6657950921482, 10.7067723709738, 10.7424707425861, 10.7418659657784, 10.7335163259687, 10.780101845273, 10.8334343829096, 10.8616735406708, 10.8535694508523, 10.8900668188725), .Dim = c(100L, 2L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100'), c('log(x)', 'log(z)'))), 1:2, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) log(x) log(z) 1 0.000000 5.765589 2 1.235180 5.534269 3 1.957714 5.693662 4 2.470360 6.176748 5 2.867999 6.087627 6 3.192894 6.686533 7 3.467588 6.702536 8 3.705540 6.329383 9 3.915428 6.817353 10 4.103179 6.648358 11 4.273020 6.912130 12 4.428073 7.149684 13 4.570709 7.256823 14 4.702768 7.461641 15 4.825713 7.371499 16 4.940719 7.564707 17 5.048752 7.713342 18 5.150607 7.713751 19 5.246955 7.827934 20 5.338359 7.907493 21 5.425302 7.962557 22 5.508200 8.113812 23 5.587413 8.212115 24 5.663253 8.184275 25 5.735998 8.291334 26 5.805888 8.312950 27 5.873141 8.345677 28 5.937948 8.390539 29 6.000480 8.408571 30 6.060892 8.480861 31 6.119324 8.706448 32 6.175899 8.665633 33 6.230734 8.794357 34 6.283932 8.799609 35 6.335587 8.824434 36 6.385787 8.913145 37 6.434612 8.899954 38 6.482134 8.967602 39 6.528422 8.935487 40 6.573538 9.013322 41 6.617540 9.070833 42 6.660482 9.154221 43 6.702413 9.201093 44 6.743380 9.206222 45 6.783426 9.311710 46 6.822592 9.309093 47 6.860916 9.354477 48 6.898433 9.453337 49 6.935177 9.414582 50 6.971178 9.469839 51 7.006466 9.516526 52 7.041068 9.530189 53 7.075012 9.594975 54 7.108321 9.612681 55 7.141019 9.641415 56 7.173128 9.688575 57 7.204668 9.775805 58 7.235660 9.798163 59 7.266122 9.791288 60 7.296072 9.806992 61 7.325527 9.918336 62 7.354503 9.954872 63 7.383016 9.880864 64 7.411079 9.935053 65 7.438707 9.970341 66 7.465914 9.977526 67 7.492711 10.116575 68 7.519112 10.097756 69 7.545126 10.141450 70 7.570767 10.129072 71 7.596044 10.166774 72 7.620967 10.179276 73 7.645547 10.217249 74 7.669792 10.267071 75 7.693711 10.274231 76 7.717314 10.287877 77 7.740609 10.344725 78 7.763602 10.407537 79 7.786303 10.346520 80 7.808718 10.440422 81 7.830855 10.422302 82 7.852720 10.473954 83 7.874320 10.531446 84 7.895662 10.481343 85 7.916751 10.509754 86 7.937593 10.538954 87 7.958194 10.575263 88 7.978560 10.613305 89 7.998696 10.677608 90 8.018606 10.626619 91 8.038297 10.665795 92 8.057772 10.706772 93 8.077037 10.742471 94 8.096096 10.741866 95 8.114953 10.733516 96 8.133613 10.780102 97 8.152079 10.833434 98 8.170356 10.861674 99 8.188448 10.853569 100 8.206357 10.890067 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm27# #argv <- structure(list(a = structure(c(0.124248979591837, 0.266432653061224, 0.404342857142857, 0.0992163265306122, 0.0851836734693878, 0.0937632653061225, 0.0163551020408163, 0.182897959183673, 0.303289795918367, 0.010330612244898, 0.0557795918367347, 0.0490938775510204, 0.0992163265306122, 0.0851836734693878, 0.0937632653061225, 0.143689795918367, 0.098469387755102, 0.104004081632653, 0.0116979591836735, 0.0826530612244898, 0.0713795918367347, 0.00929795918367347, 0.0412040816326531, 0.0476285714285714, 0.0163551020408163, 0.182897959183673, 0.303289795918367, 0.0116979591836735, 0.0826530612244898, 0.0713795918367347, 0.0301591836734694, 0.220816326530612, 0.304587755102041, 0.00606938775510204, 0.0731020408163265, 0.0488244897959184, 0.010330612244898, 0.0557795918367347, 0.0490938775510204, 0.00929795918367347, 0.0412040816326531, 0.0476285714285714, 0.00606938775510204, 0.0731020408163265, 0.0488244897959184, 0.0111061224489796, 0.0391061224489796, 0.0754326530612245), .Dim = c(3L, 4L, 4L), .Dimnames = structure(list(Species = c('setosa', 'versicolor', 'virginica'), c('Sepal.Length', 'Sepal.Width', 'Petal.Length', 'Petal.Width'), c('Sepal.Length', 'Sepal.Width', 'Petal.Length', 'Petal.Width')), .Names = c('Species', '', ''))), perm = c(2, 3, 1)), .Names = c('a', 'perm'));do.call('aperm', argv) , , Species = setosa Sepal.Length Sepal.Width Petal.Length Petal.Width Sepal.Length 0.12424898 0.099216327 0.016355102 0.010330612 Sepal.Width 0.09921633 0.143689796 0.011697959 0.009297959 Petal.Length 0.01635510 0.011697959 0.030159184 0.006069388 Petal.Width 0.01033061 0.009297959 0.006069388 0.011106122 , , Species = versicolor Sepal.Length Sepal.Width Petal.Length Petal.Width Sepal.Length 0.26643265 0.08518367 0.18289796 0.05577959 Sepal.Width 0.08518367 0.09846939 0.08265306 0.04120408 Petal.Length 0.18289796 0.08265306 0.22081633 0.07310204 Petal.Width 0.05577959 0.04120408 0.07310204 0.03910612 , , Species = virginica Sepal.Length Sepal.Width Petal.Length Petal.Width Sepal.Length 0.40434286 0.09376327 0.30328980 0.04909388 Sepal.Width 0.09376327 0.10400408 0.07137959 0.04762857 Petal.Length 0.30328980 0.07137959 0.30458776 0.04882449 Petal.Width 0.04909388 0.04762857 0.04882449 0.07543265 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm3# #argv <- list(structure(c(0.666666666666667, 0.666666666666667, 0.666666666666667, 0.666666666666667, 0.666666666666667, 0.666666666666667, 0.666666666666667, 0.666666666666667, 0.666666666666667), .Dim = c(1L, 9L)), c(2L, 1L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) [,1] [1,] 0.6666667 [2,] 0.6666667 [3,] 0.6666667 [4,] 0.6666667 [5,] 0.6666667 [6,] 0.6666667 [7,] 0.6666667 [8,] 0.6666667 [9,] 0.6666667 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm4# #argv <- list(structure(c(0L, 0L, 0L, 1L, 0L, 1L, 1L, 1L), .Dim = c(1L, 8L), .Dimnames = list('strata(enum)', c('rx', 'size', 'number', 'strata(enum)', 'cluster(id)', 'rx:strata(enum)', 'size:strata(enum)', 'number:strata(enum)'))), 1:2, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) rx size number strata(enum) cluster(id) rx:strata(enum) strata(enum) 0 0 0 1 0 1 size:strata(enum) number:strata(enum) strata(enum) 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm5# #argv <- list(structure(c(9.2319289524956, -0.470372045488369, 186.857050189827), .Dim = c(1L, 3L), .Dimnames = list('118', c('age', 'sex', 'meal.cal'))), 1:2, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) age sex meal.cal 118 9.231929 -0.470372 186.8571 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm6# #argv <- list(structure(c(414L, 439L, 382L, 388L, 383L, 364L, 364L, 363L, 349L, 371L, 102L, 388L, 388L, 363L, 367L, 365L, 382L, 362L, 373L, 385L, 376L, 360L, 306L, 160L, 316L, 316L, 315L, 357L, 360L, 347L, 353L, 308L, 327L, 329L, 343L, 251L, 318L, 304L, 316L, 335L, 365L, 336L, 350L, 356L, 339L, 301L, 330L, 300L, 300L, 312L, 334L, 270L, 347L, 293L, 303L, 337L, 287L, 293L, 293L, 318L, 359L, 351L, 322L, 343L, 269L, 286L, 286L, 273L, 297L, 273L, 273L, 273L, 294L, 303L, 281L, 273L, 255L, 269L, 270L, 270L, 276L, 264L, 245L, 261L, 270L, 273L, 306L, 274L, 279L, 278L, 278L, 284L, 276L, 265L, 294L, 277L, 259L, 287L, 263L, 240L, 217L, 271L, 252L, 331L, 255L, 271L, 254L, 185L, 213L, 210L, 203L, 288L, 269L, 269L, 91L, 91L, 192L, 199L, 195L, 198L, 207L, 200L, 197L, 243L, 203L, 197L, 227L, 227L, 219L, 8L, NA, NA, 246L, NA, 292L, NA, 294L, NA, 19L, 373L, NA, 211L, 82L, NA, 334L, 18L, NA, 280L, NA, NA, NA, NA, 146L, NA, NA, NA, 267L, 206L, 175L, NA, NA, NA, NA, 118L, NA, NA, NA, NA, 274L, NA, NA, 187L, NA, 6L, NA, NA, 146L, 304L, NA, 52L, 67L, NA, 265L, NA, 91L, NA, NA, NA, 318L, 57L, 226L, 65L, NA, 264L, NA, NA, NA, 236L, NA, 207L, NA, NA, NA, NA, NA, NA, 23L, NA, NA, NA, NA, NA, NA, 113L, 99L, NA, NA, 14L, NA, NA, NA, NA, NA, NA, NA, 4L, NA, 167L, NA, NA, NA, NA, NA, NA, NA, NA, NA, 165L, NA, NA, NA, NA, NA, NA, NA, NA, 11L, NA, NA, 168L, NA, NA, 120L, NA, 104L, NA, 373L, 26L, NA, NA, 253L, NA, NA, NA, NA, NA, NA, NA, NA, 260L, 114L, NA, 370L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 280L, NA, NA, NA, NA, 240L, NA, NA, NA, NA, 361L, NA, NA, NA, NA, NA, NA, NA, 188L, NA, NA, 65L, 248L, NA, NA, NA, 121L, NA, NA, NA, NA, 121L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 306L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 159L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 22L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 152L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 265L, 337L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 255L, 250L, NA, NA, NA, 203L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 213L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 169L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 241L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 269L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 284L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 249L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 307L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 322L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 350L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), .Dim = c(128L, 8L), .Dimnames = list( NULL, c('futime', 'e1', 'e2', 'e3', 'e4', 'e5', 'e6', 'e7'))), c(2L, 1L), TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] futime 414 439 382 388 383 364 364 363 349 371 102 388 388 e1 219 8 NA NA 246 NA 292 NA 294 NA 19 373 NA e2 373 26 NA NA 253 NA NA NA NA NA NA NA NA e3 NA 152 NA NA NA NA NA NA NA NA NA NA NA e4 NA 241 NA NA NA NA NA NA NA NA NA NA NA e5 NA 249 NA NA NA NA NA NA NA NA NA NA NA e6 NA 322 NA NA NA NA NA NA NA NA NA NA NA e7 NA 350 NA NA NA NA NA NA NA NA NA NA NA [,14] [,15] [,16] [,17] [,18] [,19] [,20] [,21] [,22] [,23] [,24] [,25] futime 363 367 365 382 362 373 385 376 360 306 160 316 e1 211 82 NA 334 18 NA 280 NA NA NA NA 146 e2 260 114 NA 370 NA NA NA NA NA NA NA NA e3 265 337 NA NA NA NA NA NA NA NA NA NA e4 269 NA NA NA NA NA NA NA NA NA NA NA e5 307 NA NA NA NA NA NA NA NA NA NA NA e6 NA NA NA NA NA NA NA NA NA NA NA NA e7 NA NA NA NA NA NA NA NA NA NA NA NA [,26] [,27] [,28] [,29] [,30] [,31] [,32] [,33] [,34] [,35] [,36] [,37] futime 316 315 357 360 347 353 308 327 329 343 251 318 e1 NA NA NA 267 206 175 NA NA NA NA 118 NA e2 NA NA NA NA NA 280 NA NA NA NA 240 NA e3 NA NA NA NA NA NA NA NA NA NA NA NA e4 NA NA NA NA NA NA NA NA NA NA NA NA e5 NA NA NA NA NA NA NA NA NA NA NA NA e6 NA NA NA NA NA NA NA NA NA NA NA NA e7 NA NA NA NA NA NA NA NA NA NA NA NA [,38] [,39] [,40] [,41] [,42] [,43] [,44] [,45] [,46] [,47] [,48] [,49] futime 304 316 335 365 336 350 356 339 301 330 300 300 e1 NA NA NA 274 NA NA 187 NA 6 NA NA 146 e2 NA NA NA 361 NA NA NA NA NA NA NA 188 e3 NA NA NA NA NA NA NA NA NA NA NA NA e4 NA NA NA NA NA NA NA NA NA NA NA NA e5 NA NA NA NA NA NA NA NA NA NA NA NA e6 NA NA NA NA NA NA NA NA NA NA NA NA e7 NA NA NA NA NA NA NA NA NA NA NA NA [,50] [,51] [,52] [,53] [,54] [,55] [,56] [,57] [,58] [,59] [,60] [,61] futime 312 334 270 347 293 303 337 287 293 293 318 359 e1 304 NA 52 67 NA 265 NA 91 NA NA NA 318 e2 NA NA 65 248 NA NA NA 121 NA NA NA NA e3 NA NA 255 250 NA NA NA 203 NA NA NA NA e4 NA NA NA 284 NA NA NA NA NA NA NA NA e5 NA NA NA NA NA NA NA NA NA NA NA NA e6 NA NA NA NA NA NA NA NA NA NA NA NA e7 NA NA NA NA NA NA NA NA NA NA NA NA [,62] [,63] [,64] [,65] [,66] [,67] [,68] [,69] [,70] [,71] [,72] [,73] futime 351 322 343 269 286 286 273 297 273 273 273 294 e1 57 226 65 NA 264 NA NA NA 236 NA 207 NA e2 121 NA NA NA NA NA NA NA NA NA NA NA e3 NA NA NA NA NA NA NA NA NA NA NA NA e4 NA NA NA NA NA NA NA NA NA NA NA NA e5 NA NA NA NA NA NA NA NA NA NA NA NA e6 NA NA NA NA NA NA NA NA NA NA NA NA e7 NA NA NA NA NA NA NA NA NA NA NA NA [,74] [,75] [,76] [,77] [,78] [,79] [,80] [,81] [,82] [,83] [,84] [,85] futime 303 281 273 255 269 270 270 276 264 245 261 270 e1 NA NA NA NA NA 23 NA NA NA NA NA NA e2 NA NA NA NA NA NA NA NA NA NA NA NA e3 NA NA NA NA NA NA NA NA NA NA NA NA e4 NA NA NA NA NA NA NA NA NA NA NA NA e5 NA NA NA NA NA NA NA NA NA NA NA NA e6 NA NA NA NA NA NA NA NA NA NA NA NA e7 NA NA NA NA NA NA NA NA NA NA NA NA [,86] [,87] [,88] [,89] [,90] [,91] [,92] [,93] [,94] [,95] [,96] [,97] futime 273 306 274 279 278 278 284 276 265 294 277 259 e1 113 99 NA NA 14 NA NA NA NA NA NA NA e2 NA 306 NA NA NA NA NA NA NA NA NA NA e3 NA NA NA NA NA NA NA NA NA NA NA NA e4 NA NA NA NA NA NA NA NA NA NA NA NA e5 NA NA NA NA NA NA NA NA NA NA NA NA e6 NA NA NA NA NA NA NA NA NA NA NA NA e7 NA NA NA NA NA NA NA NA NA NA NA NA [,98] [,99] [,100] [,101] [,102] [,103] [,104] [,105] [,106] [,107] futime 287 263 240 217 271 252 331 255 271 254 e1 4 NA 167 NA NA NA NA NA NA NA e2 159 NA NA NA NA NA NA NA NA NA e3 213 NA NA NA NA NA NA NA NA NA e4 NA NA NA NA NA NA NA NA NA NA e5 NA NA NA NA NA NA NA NA NA NA e6 NA NA NA NA NA NA NA NA NA NA e7 NA NA NA NA NA NA NA NA NA NA [,108] [,109] [,110] [,111] [,112] [,113] [,114] [,115] [,116] [,117] futime 185 213 210 203 288 269 269 91 91 192 e1 NA NA 165 NA NA NA NA NA NA NA e2 NA NA NA NA NA NA NA NA NA NA e3 NA NA NA NA NA NA NA NA NA NA e4 NA NA NA NA NA NA NA NA NA NA e5 NA NA NA NA NA NA NA NA NA NA e6 NA NA NA NA NA NA NA NA NA NA e7 NA NA NA NA NA NA NA NA NA NA [,118] [,119] [,120] [,121] [,122] [,123] [,124] [,125] [,126] [,127] futime 199 195 198 207 200 197 243 203 197 227 e1 NA 11 NA NA 168 NA NA 120 NA 104 e2 NA 22 NA NA NA NA NA NA NA NA e3 NA 169 NA NA NA NA NA NA NA NA e4 NA NA NA NA NA NA NA NA NA NA e5 NA NA NA NA NA NA NA NA NA NA e6 NA NA NA NA NA NA NA NA NA NA e7 NA NA NA NA NA NA NA NA NA NA [,128] futime 227 e1 NA e2 NA e3 NA e4 NA e5 NA e6 NA e7 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm7# #argv <- list(structure(c(0, -10, 0, -10, -10, 0, NA, NA, 0, 0, 0, 0, 0, 150, 0, 170, 180, 0, 0, 0, NA, 0, 0, 0, 0, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 310, 0, 330, 340, 0, 0, 350, 0, 370, 380, 0), .Dim = c(6L, 8L), .Dimnames = list(NULL, NULL)), 1:2, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [1,] 0 NA 0 0 0 0 0 0 [2,] -10 NA 150 0 0 0 310 350 [3,] 0 0 0 NA NA 0 0 0 [4,] -10 0 170 0 0 0 330 370 [5,] -10 0 180 0 0 0 340 380 [6,] 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm8# #argv <- list(structure(c(544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 1539.44739946315, 1548.66655077773, 1557.88570209231, 1566.45228027983, 1575.01885846735, 1583.14083472285, 1591.26281097836, 1599.26100149451, 1607.25919201066, 1611.39689466313, 1615.5345973156, 1612.61129444623, 1609.68799157686, 1603.44643859537, 1597.20488561388, 1588.73002343463, 1580.25516125537, 1570.86127478964, 1561.46738832392, 1549.89535441445, 1538.32332050498, 1524.62526591843, 1510.92721133189, 1499.65830819836, 1488.38940506483, 1479.31388700637, 1470.23836894792, 1460.03887936132, 1449.83938977473, 1441.27547309544, 1432.71155641615, 1432.51830671501, 1432.32505701387, 1433.15763708544, 1433.99021715701, 1434.96142536256, 1435.9326335681, 1435.47421580154, 1435.01579803498, 1433.4368629411, 1431.85792784722, 1430.85617066215, 1429.85441347709, 1432.59097206397, 1435.32753065085, 1440.49425642708, 1445.66098220331, 1448.76676550395, 1451.87254880459, 1452.9163236715, 1453.96009853841, 1454.6961768366, 1455.43225513478, 1452.22362902495, 1449.01500291512, 1442.43484036078, 1435.85467780644, 1426.50159512644, 1417.14851244644, 1409.58997614642, 1402.0314398464, 1397.59624058751, 1393.16104132862, 1386.64426440334, 1380.12748747807, 1371.71107833433, 1363.2946691906, 1354.59002807904, 1345.88538696748, 1336.94914699242, 1328.01290701735, 1318.64960669271, 49.7622186359663, -84.1535032467218, -121.764781099341, 37.2870304782966, 82.528433600382, -44.2319392670254, 25.3010406627996, -34.7698782399993, 48.5709781995188, 110.301655093951, -1.96962838525201, -3.7990131710535, -51.4783734777507, 135.066608935635, 114.916035379091, -28.990712676497, -11.7078691876363, 7.04762066618673, -38.9035366827579, 16.5957688400649, -38.4931502947952, 52.0732838386475, 26.6377575984557, 329.153973076816, -13.1797869657194, 872.199160524634, 371.882552045056, -254.299568603192, -95.2920977069916, 8.63342236039193, 16.852295225008, -29.0271834604991, 13.5051131963112, 4.54091267164154, 25.5747517733375, 386.850855912621, 259.276984531009, -199.961168270532, -153.894877042003, 94.302447817031, -20.3106357794875, 21.0527247936745, -6.29056183593116, 13.9001511905426, -29.4973604406664, -31.7957066699985, -224.096013272965, -30.9544842287708, 22.3370692945275, 432.596723859509, 47.1608224545594, -304.956866078466, 50.1150369329559, 24.6852664308792, -14.4511512739648, -4.94371710626865, -19.024507596255, -56.8030453693573, -314.583543516094, 165.222305128756, 316.17817825271, 23.9168069434991, 11.9598796643579, -128.904953645213, 0.419804589665318, -6.80218287850425, 29.2691824505584, 53.9010951754703, 40.9447832426993, -26.2505972353374, -41.4479380870087, -214.837325417531, 2134, 1863, 1877, 1877, 1492, 1249, 1280, 1131, 1209, 1492, 1621, 1846, 2103, 2137, 2153, 1833, 1403, 1288, 1186, 1133, 1053, 1347, 1545, 2066, 2020, 2750, 2283, 1479, 1189, 1160, 1113, 970, 999, 1208, 1467, 2059, 2240, 1634, 1722, 1801, 1246, 1162, 1087, 1013, 959, 1179, 1229, 1655, 2019, 2284, 1942, 1423, 1340, 1187, 1098, 1004, 970, 1140, 1110, 1812, 2263, 1820, 1846, 1531, 1215, 1075, 1056, 975, 940, 1081, 1294, 1341), .Dim = c(72L, 4L), .Dimnames = list(NULL, c('STL.seasonal', 'STL.trend', 'STL.remainder', 'data')), .Tsp = c(1974, 1979.91666666667, 12), class = c('mts', 'ts', 'matrix')), 1:2, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) STL.seasonal STL.trend STL.remainder data [1,] 544.790382 1539.447 49.7622186 2134 [2,] 398.486952 1548.667 -84.1535032 1863 [3,] 440.879079 1557.886 -121.7647811 1877 [4,] 273.260689 1566.452 37.2870305 1877 [5,] -165.547292 1575.019 82.5284336 1492 [6,] -289.908895 1583.141 -44.2319393 1249 [7,] -336.563852 1591.263 25.3010407 1280 [8,] -433.491123 1599.261 -34.7698782 1131 [9,] -446.830170 1607.259 48.5709782 1209 [10,] -229.698550 1611.397 110.3016551 1492 [11,] 7.435031 1615.535 -1.9696284 1621 [12,] 237.187719 1612.611 -3.7990132 1846 [13,] 544.790382 1609.688 -51.4783735 2103 [14,] 398.486952 1603.446 135.0666089 2137 [15,] 440.879079 1597.205 114.9160354 2153 [16,] 273.260689 1588.730 -28.9907127 1833 [17,] -165.547292 1580.255 -11.7078692 1403 [18,] -289.908895 1570.861 7.0476207 1288 [19,] -336.563852 1561.467 -38.9035367 1186 [20,] -433.491123 1549.895 16.5957688 1133 [21,] -446.830170 1538.323 -38.4931503 1053 [22,] -229.698550 1524.625 52.0732838 1347 [23,] 7.435031 1510.927 26.6377576 1545 [24,] 237.187719 1499.658 329.1539731 2066 [25,] 544.790382 1488.389 -13.1797870 2020 [26,] 398.486952 1479.314 872.1991605 2750 [27,] 440.879079 1470.238 371.8825520 2283 [28,] 273.260689 1460.039 -254.2995686 1479 [29,] -165.547292 1449.839 -95.2920977 1189 [30,] -289.908895 1441.275 8.6334224 1160 [31,] -336.563852 1432.712 16.8522952 1113 [32,] -433.491123 1432.518 -29.0271835 970 [33,] -446.830170 1432.325 13.5051132 999 [34,] -229.698550 1433.158 4.5409127 1208 [35,] 7.435031 1433.990 25.5747518 1467 [36,] 237.187719 1434.961 386.8508559 2059 [37,] 544.790382 1435.933 259.2769845 2240 [38,] 398.486952 1435.474 -199.9611683 1634 [39,] 440.879079 1435.016 -153.8948770 1722 [40,] 273.260689 1433.437 94.3024478 1801 [41,] -165.547292 1431.858 -20.3106358 1246 [42,] -289.908895 1430.856 21.0527248 1162 [43,] -336.563852 1429.854 -6.2905618 1087 [44,] -433.491123 1432.591 13.9001512 1013 [45,] -446.830170 1435.328 -29.4973604 959 [46,] -229.698550 1440.494 -31.7957067 1179 [47,] 7.435031 1445.661 -224.0960133 1229 [48,] 237.187719 1448.767 -30.9544842 1655 [49,] 544.790382 1451.873 22.3370693 2019 [50,] 398.486952 1452.916 432.5967239 2284 [51,] 440.879079 1453.960 47.1608225 1942 [52,] 273.260689 1454.696 -304.9568661 1423 [53,] -165.547292 1455.432 50.1150369 1340 [54,] -289.908895 1452.224 24.6852664 1187 [55,] -336.563852 1449.015 -14.4511513 1098 [56,] -433.491123 1442.435 -4.9437171 1004 [57,] -446.830170 1435.855 -19.0245076 970 [58,] -229.698550 1426.502 -56.8030454 1140 [59,] 7.435031 1417.149 -314.5835435 1110 [60,] 237.187719 1409.590 165.2223051 1812 [61,] 544.790382 1402.031 316.1781783 2263 [62,] 398.486952 1397.596 23.9168069 1820 [63,] 440.879079 1393.161 11.9598797 1846 [64,] 273.260689 1386.644 -128.9049536 1531 [65,] -165.547292 1380.127 0.4198046 1215 [66,] -289.908895 1371.711 -6.8021829 1075 [67,] -336.563852 1363.295 29.2691825 1056 [68,] -433.491123 1354.590 53.9010952 975 [69,] -446.830170 1345.885 40.9447832 940 [70,] -229.698550 1336.949 -26.2505972 1081 [71,] 7.435031 1328.013 -41.4479381 1294 [72,] 237.187719 1318.650 -214.8373254 1341 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aperm.testaperm9# #argv <- list(structure(c(0.36376697930799, 0.252815298286177, 0.144820268657847, 0.059950033165656, 0.0137701755391906, 0.00220408917547991, 6.22489401973083e-05, -0.36376697846279, -0.252815298708777, -0.144820267390048, -0.0599500327958813, -0.0137701747732286, -0.00220408987788688, -6.22486118855004e-05), .Dim = c(7L, 2L, 1L)), 1:3, TRUE); .Internal(aperm(argv[[1]], argv[[2]], argv[[3]])) , , 1 [,1] [,2] [1,] 3.637670e-01 -3.637670e-01 [2,] 2.528153e-01 -2.528153e-01 [3,] 1.448203e-01 -1.448203e-01 [4,] 5.995003e-02 -5.995003e-02 [5,] 1.377018e-02 -1.377017e-02 [6,] 2.204089e-03 -2.204090e-03 [7,] 6.224894e-05 -6.224861e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_append.testappend1# #argv <- structure(list(x = 1:5, values = 0:1, after = 3), .Names = c('x', 'values', 'after'));do.call('append', argv) [1] 1 2 3 0 1 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aregexec.testaregexec1#Ignored.Unimplemented# #argv <- list('FALSE', 'FALSE', c(0.1, NA, NA, NA, NA), c(1L, 1L, 1L), FALSE, FALSE, FALSE); .Internal(aregexec(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [[1]] [1] 1 attr(,"match.length") [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aregexec.testaregexec2#Ignored.Unimplemented# #argv <- list('(lay)(sy)', c('1 lazy', '1', '1 LAZY'), c(2, NA, NA, NA, NA), c(1L, 1L, 1L), FALSE, FALSE, FALSE); .Internal(aregexec(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [[1]] [1] 3 3 5 attr(,"match.length") [1] 4 2 2 [[2]] [1] -1 attr(,"match.length") [1] -1 [[3]] [1] -1 attr(,"match.length") [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_args.testArgs#Output.IgnoreWhitespace# #{ f <- function(x=1, y) x + y; args(f); } function (x = 1, y) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_args.testArgs# #{ f <- function(a) {}; fa <- args(f); } ##com.oracle.truffle.r.test.builtins.TestBuiltin_args.testArgs# #{ f <- function(a, b) {}; fa <- args(f); } ##com.oracle.truffle.r.test.builtins.TestBuiltin_args.testArgs# #{ sa <- args(sum); } ##com.oracle.truffle.r.test.builtins.TestBuiltin_args.testargs1# #argv <- list(NULL); .Internal(args(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_args.testargs2# #argv <- list(character(0)); .Internal(args(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_args.testargs3# #argv <- list(.Primitive(':')); .Internal(args(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_args.testargs4# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame')); .Internal(args(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_args.testargs5# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L))); .Internal(args(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ .Internal(array(1:4, NULL, NULL)) } Error: 'dims' cannot be of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ .Internal(array(NA, 1, NULL)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ .Internal(array(NULL, 1, NULL)) } Error: 'data' must be of a vector type, was 'NULL' ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(1:4, 1:2, 4) } Error in array(1:4, 1:2, 4) : 'dimnames' must be a list ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(1:4, NULL) } Error in array(1:4, NULL) : 'dims' cannot be of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(1:4, c(1+2i, 2+2i)) } [,1] [,2] [1,] 1 2 Warning message: In array(1:4, c(1 + (0+2i), 2 + (0+2i))) : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(1:4, integer()) } Error in array(1:4, integer()) : 'dims' cannot be of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(NULL) } Error in array(NULL) : 'data' must be of a vector type, was 'NULL' ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(as.raw(1:4)) } [1] 01 02 03 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(character(0), dim=2, dimnames=list(c("1", "2")))} 1 2 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(complex(0), dim=2, dimnames=list(c("1", "2")))} 1 2 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(double(0), dim=2, dimnames=list(c("1", "2")))} 1 2 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(integer(0), dim=2, dimnames=list(c("1", "2")))} 1 2 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(list(0), dim=2, dimnames=list(c("1", "2")))} $`1` [1] 0 $`2` [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ array(logical(0), dim=2, dimnames=list(c("1", "2")))} 1 2 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testArray# #{ f<-function() 42; .Internal(array(f, 1, NULL)) } Error: 'data' must be of a vector type, was 'closure' ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray1# #argv <- list(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L), 59L, structure(list(dr = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59.5')), .Names = 'dr')); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) dr 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 49 50 51 52 53 54 55 56 57 58 59.5 1 1 1 1 1 1 1 1 1 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray10#Output.IgnoreWhitespace# #argv <- list(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), c(5L, 16L), list(c('#ifdef', '\\Sexpr', 'build', 'install', 'render'), NULL)); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] #ifdef FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE \\Sexpr FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE build FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE install FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE render FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [,13] [,14] [,15] [,16] #ifdef FALSE FALSE FALSE FALSE \\Sexpr FALSE FALSE FALSE FALSE build FALSE FALSE FALSE FALSE install FALSE FALSE FALSE FALSE render FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray11# #argv <- list(list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL), 8L, list(c('1', '2', '3', '4', '5', '6', '7', '8'))); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) $`1` NULL $`2` NULL $`3` NULL $`4` NULL $`5` NULL $`6` NULL $`7` NULL $`8` NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray12# #argv <- list(c(-Inf, -Inf, 0, 2, 4, 5, Inf, Inf, Inf, -Inf, -Inf, 0, 2, 4, 5, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 3, 5, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1.5, 3.2, 4.9, Inf, Inf, Inf, -Inf, -Inf, 0.300000000000001, 2, 3.7, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.2, 2, 3.8, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.4, 2, 3.6, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.266666666666667, 2, 3.73333333333333, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.275, 2, 3.725, Inf, Inf, Inf, Inf), c(9L, 9L), list(c('20%', '30%', '40%', '50%', '60%', '70%', '80%', '90%', '100%'), NULL)); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] 20% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 30% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 40% 0 0 0 -Inf 0.3 0.2 0.4 0.2666667 0.275 50% 2 2 1 1.5 2.0 2.0 2.0 2.0000000 2.000 60% 4 4 3 3.2 3.7 3.8 3.6 3.7333333 3.725 70% 5 5 5 4.9 Inf Inf Inf Inf Inf 80% Inf Inf Inf Inf Inf Inf Inf Inf Inf 90% Inf Inf Inf Inf Inf Inf Inf Inf Inf 100% Inf Inf Inf Inf Inf Inf Inf Inf Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray13# #argv <- list(NA, 1L, list('1')); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray14# #argv <- list(logical(0), 0L, NULL); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray15# #argv <- list(structure(c(-5.3088868291531, 5.2393213877113, -5.301817110509, 5.29234872074472), .Names = c('5%', '95%', '5%', '95%')), c(2, 2), list(c('5%', '95%'), NULL)); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] 5% -5.308887 -5.301817 95% 5.239321 5.292349 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray16# #argv <- list(c(1L, 0L), 2L, structure(list(object = c('FALSE', NA)), .Names = 'object')); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) object FALSE 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray17# #argv <- list(c('', '', ''), c(3, 1), NULL); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [1,] "" [2,] "" [3,] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray18# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)), 0L, NULL); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray19# #argv <- list(structure(c(31.9166666666667, -5.77777777777778, -10.4101831674686, -2.63888888888889, NA), .Names = c('(Intercept)', 'woolB', 'tens.L', 'tensionM', 'tensionH')), c(5L, 1L), list(c('(Intercept)', 'woolB', 'tens.L', 'tensionM', 'tensionH'), NULL)); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] (Intercept) 31.916667 woolB -5.777778 tens.L -10.410183 tensionM -2.638889 tensionH NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray2# #argv <- list(FALSE, FALSE, NULL); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray20# #argv <- list(c(0.92317305817397+0i, 0.160449395256071+0.220125597679977i, 0.40353715410585+2.39063261466203i, -3.64092275386503+3.51619480964107i, -0.30877433127864+1.37503901638266i, -0.5590368753986+2.95994484328048i, 2.07117052177259-1.58552086053907i, 5.12796916272868+5.50114308371867i, 0.71791019962021-4.36295436036464i, 3.6182846955548+0.01693946731429i, 5.86560669896785+3.41674024963709i, 7.14153164455803+0i, 5.86560669896785-3.41674024963709i, 3.6182846955548-0.01693946731429i, 0.71791019962021+4.36295436036464i, 5.12796916272868-5.50114308371867i, 2.07117052177259+1.58552086053907i, -0.5590368753986-2.95994484328048i, -0.30877433127864-1.37503901638266i, -3.64092275386503-3.51619480964107i, 0.40353715410585-2.39063261466203i, 0.160449395256071-0.220125597679976i, 0.994686860835215+0i, -0.711636086238366+0.034977366507257i, -3.47255638259391-3.00654729467177i, -1.61617641806619-2.52564108817258i, -1.83729841635945+1.24025696654912i, -0.05940773912914+1.99807537840182i, 2.14861624215501+1.14547234755584i, -0.18935885218927+5.11711397439959i, 3.55025883223277-3.01463113510177i, 0.37587194655463-4.62160286369829i, -0.57999032040714+3.57394816552023i, -3.22078701201057+0i, -0.57999032040714-3.57394816552023i, 0.37587194655463+4.62160286369829i, 3.55025883223277+3.01463113510177i, -0.18935885218927-5.11711397439959i, 2.14861624215501-1.14547234755584i, -0.05940773912914-1.99807537840182i, -1.83729841635945-1.24025696654912i, -1.61617641806619+2.52564108817258i, -3.47255638259391+3.00654729467177i, -0.711636086238366-0.034977366507256i, -0.376031201145236+0i, 0.36561036190112-2.94822783523588i, 2.53378536984825+1.14599403212998i, -0.59345500414631-1.46249091231517i, -5.47371957596241-2.40983118775265i, 0.994698295196402+0.827012883372647i, 4.88614691865207-0.66440097322583i, -1.22869446246947-1.85036568311679i, 4.54719422944744-1.7507307644741i, -1.25805718969215-0.46461775748286i, -6.6950163960079-1.32606545879492i, -1.8510470181104-0i, -6.6950163960079+1.32606545879492i, -1.25805718969215+0.46461775748286i, 4.54719422944744+1.7507307644741i, -1.22869446246947+1.85036568311679i, 4.88614691865207+0.66440097322583i, 0.994698295196402-0.827012883372647i, -5.47371957596241+2.40983118775265i, -0.59345500414631+1.46249091231517i, 2.53378536984825-1.14599403212998i, 0.36561036190112+2.94822783523588i, 1.86949363581639+0i, 3.2510927680528+3.7297126359622i, 5.77117909703734-0.58113122596059i, -2.73489323319193-2.03739778844743i, 1.59256247378073-3.23882870600546i, -2.21652163259476+3.70287191787544i, -6.80966667821261-4.74346958471693i, -0.48551953206469-3.42445496113818i, -4.95350216815663-1.60107509096991i, -0.651322462114205+0.588393022429161i, 3.32067078328635+3.75999833207777i, -1.35013798358527+0i, 3.32067078328635-3.75999833207777i, -0.651322462114205-0.588393022429161i, -4.95350216815663+1.60107509096991i, -0.48551953206469+3.42445496113818i, -6.80966667821261+4.74346958471693i, -2.21652163259476-3.70287191787544i, 1.59256247378073+3.23882870600546i, -2.73489323319193+2.03739778844743i, 5.77117909703734+0.58113122596059i, 3.2510927680528-3.7297126359622i, -3.90806827793786+0i, -4.10078155861753-4.25996878161911i, -0.63461032994351-2.08074582601136i, -0.10593736514835-3.82022652091785i, 6.14817602783479+2.33657685886581i, 0.64431546852762-1.776774088028i, 3.43771282488202-3.00904523977379i, -3.6812061457129+3.53944567666635i, 3.07722382691467+4.5373840425762i, 3.3679046040028+7.20820407858926i, 7.47003475089893-0.4463480891006i, 13.9322715624418-0i, 7.47003475089893+0.4463480891006i, 3.3679046040028-7.20820407858926i, 3.07722382691467-4.5373840425762i, -3.6812061457129-3.53944567666635i, 3.43771282488202+3.00904523977379i, 0.64431546852762+1.776774088028i, 6.14817602783479-2.33657685886581i, -0.10593736514835+3.82022652091785i, -0.63461032994351+2.08074582601136i, -4.10078155861753+4.25996878161911i), c(22, 5), NULL); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [1,] 0.9231731+0.0000000i 0.9946869+0.0000000i -0.3760312+0.0000000i [2,] 0.1604494+0.2201256i -0.7116361+0.0349774i 0.3656104-2.9482278i [3,] 0.4035372+2.3906326i -3.4725564-3.0065473i 2.5337854+1.1459940i [4,] -3.6409228+3.5161948i -1.6161764-2.5256411i -0.5934550-1.4624909i [5,] -0.3087743+1.3750390i -1.8372984+1.2402570i -5.4737196-2.4098312i [6,] -0.5590369+2.9599448i -0.0594077+1.9980754i 0.9946983+0.8270129i [7,] 2.0711705-1.5855209i 2.1486162+1.1454723i 4.8861469-0.6644010i [8,] 5.1279692+5.5011431i -0.1893589+5.1171140i -1.2286945-1.8503657i [9,] 0.7179102-4.3629544i 3.5502588-3.0146311i 4.5471942-1.7507308i [10,] 3.6182847+0.0169395i 0.3758719-4.6216029i -1.2580572-0.4646178i [11,] 5.8656067+3.4167402i -0.5799903+3.5739482i -6.6950164-1.3260655i [12,] 7.1415316+0.0000000i -3.2207870+0.0000000i -1.8510470+0.0000000i [13,] 5.8656067-3.4167402i -0.5799903-3.5739482i -6.6950164+1.3260655i [14,] 3.6182847-0.0169395i 0.3758719+4.6216029i -1.2580572+0.4646178i [15,] 0.7179102+4.3629544i 3.5502588+3.0146311i 4.5471942+1.7507308i [16,] 5.1279692-5.5011431i -0.1893589-5.1171140i -1.2286945+1.8503657i [17,] 2.0711705+1.5855209i 2.1486162-1.1454723i 4.8861469+0.6644010i [18,] -0.5590369-2.9599448i -0.0594077-1.9980754i 0.9946983-0.8270129i [19,] -0.3087743-1.3750390i -1.8372984-1.2402570i -5.4737196+2.4098312i [20,] -3.6409228-3.5161948i -1.6161764+2.5256411i -0.5934550+1.4624909i [21,] 0.4035372-2.3906326i -3.4725564+3.0065473i 2.5337854-1.1459940i [22,] 0.1604494-0.2201256i -0.7116361-0.0349774i 0.3656104+2.9482278i [,4] [,5] [1,] 1.8694936+0.000000i -3.908068+0.000000i [2,] 3.2510928+3.729713i -4.100782-4.259969i [3,] 5.7711791-0.581131i -0.634610-2.080746i [4,] -2.7348932-2.037398i -0.105937-3.820227i [5,] 1.5925625-3.238829i 6.148176+2.336577i [6,] -2.2165216+3.702872i 0.644315-1.776774i [7,] -6.8096667-4.743470i 3.437713-3.009045i [8,] -0.4855195-3.424455i -3.681206+3.539446i [9,] -4.9535022-1.601075i 3.077224+4.537384i [10,] -0.6513225+0.588393i 3.367905+7.208204i [11,] 3.3206708+3.759998i 7.470035-0.446348i [12,] -1.3501380+0.000000i 13.932272+0.000000i [13,] 3.3206708-3.759998i 7.470035+0.446348i [14,] -0.6513225-0.588393i 3.367905-7.208204i [15,] -4.9535022+1.601075i 3.077224-4.537384i [16,] -0.4855195+3.424455i -3.681206-3.539446i [17,] -6.8096667+4.743470i 3.437713+3.009045i [18,] -2.2165216-3.702872i 0.644315+1.776774i [19,] 1.5925625+3.238829i 6.148176-2.336577i [20,] -2.7348932+2.037398i -0.105937+3.820227i [21,] 5.7711791+0.581131i -0.634610+2.080746i [22,] 3.2510928-3.729713i -4.100782+4.259969i ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray21# #argv <- list(NA, c(1, 4), NULL); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [1,] NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray22# #argv <- list(structure(c(-0.350406242534262, -0.350406242534262, -3.35040624253426, 0.649593757465738, 1.64959375746574, 17.755677101477, 7.755677101477, -11.3171453341876, 5.68285466581244, -11.3171453341876, -2.31714533418756, 6.68285466581244, -16.3171453341876, 8.38722300809366, 42.3872230080937, 13.3872230080937, 27.8866653386156, -25.1133346613844, 7.88666533861561, -21.1133346613844, 9.71094990017841, 5.71094990017841, 26.7109499001784, -7.28905009982159, 21.7109499001784, -20.2890500998216, 6.226070726676, -15.773929273324, -28.773929273324, 14.226070726676, -14.773929273324, 21.226070726676, 6.226070726676, 29.226070726676, 13.226070726676, -1.18678877265756, 15.8132112273424, 1.81321122734244, 25.8132112273424, -0.186788772657565, 3.81321122734244, -10.1867887726576, 15.8132112273424, 9.81321122734244, 9.81321122734244, -35.0551967576179, 14.9448032423821, 13.9448032423821, -17.0551967576179, -6.05519675761792, -17.7296046985831, 14.9139035439664), gradient = structure(c(0, 0, 0, 0, 0, 56.989995924654, 56.989995924654, 94.3649041101607, 94.3649041101607, 94.3649041101607, 94.3649041101607, 94.3649041101607, 94.3649041101607, 109.608811230383, 109.608811230383, 109.608811230383, 107.478028232287, 107.478028232287, 107.478028232287, 107.478028232287, 94.6057793667664, 94.6057793667664, 94.6057793667664, 94.6057793667664, 94.6057793667664, 94.6057793667664, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 39.6403646307366, 39.6403646307366, 39.6403646307366, 39.6403646307366, 39.6403646307366, 10.7055301785859, 0, 1.00000000551046, 1.00000000551046, 1.00000000551046, 1.00000000551046, 1.00000000551046, 0.914597467778369, 0.914597467778369, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.599195286063472, 0.599195286063472, 0.599195286063472, 0.446659102876937, 0.446659102876937, 0.446659102876937, 0.446659102876937, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.0889140940358009, 0.0889140940358009, 0.0889140940358009, 0.0889140940358009, 0.0889140940358009, 0.0202635232425103, 2.60032456603692e-08, 0, 0, 0, 0, 0, 0.165626203544259, 0.165626203544259, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.503396799290371, 0.503396799290371, 0.503396799290371, 0.638987326722699, 0.638987326722699, 0.638987326722699, 0.638987326722699, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.931061257482989, 0.931061257482989, 0.931061257482989, 0.931061257482989, 0.931061257482989, 0.984387422945875, 0.999999996451695), .Dim = c(52L, 3L))), c(52L, 1L), NULL); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [1,] -0.3504062 [2,] -0.3504062 [3,] -3.3504062 [4,] 0.6495938 [5,] 1.6495938 [6,] 17.7556771 [7,] 7.7556771 [8,] -11.3171453 [9,] 5.6828547 [10,] -11.3171453 [11,] -2.3171453 [12,] 6.6828547 [13,] -16.3171453 [14,] 8.3872230 [15,] 42.3872230 [16,] 13.3872230 [17,] 27.8866653 [18,] -25.1133347 [19,] 7.8866653 [20,] -21.1133347 [21,] 9.7109499 [22,] 5.7109499 [23,] 26.7109499 [24,] -7.2890501 [25,] 21.7109499 [26,] -20.2890501 [27,] 6.2260707 [28,] -15.7739293 [29,] -28.7739293 [30,] 14.2260707 [31,] -14.7739293 [32,] 21.2260707 [33,] 6.2260707 [34,] 29.2260707 [35,] 13.2260707 [36,] -1.1867888 [37,] 15.8132112 [38,] 1.8132112 [39,] 25.8132112 [40,] -0.1867888 [41,] 3.8132112 [42,] -10.1867888 [43,] 15.8132112 [44,] 9.8132112 [45,] 9.8132112 [46,] -35.0551968 [47,] 14.9448032 [48,] 13.9448032 [49,] -17.0551968 [50,] -6.0551968 [51,] -17.7296047 [52,] 14.9139035 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray23# #argv <- list(c(1L, 2L, 1L), 3L, structure(list(c('1', '2', NA)), .Names = '')); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) 1 2 1 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray24# #argv <- list(c(4L, 10L, 16L, 22L, 28L, 34L, 40L, 46L, 52L, 58L, 64L, 70L, 76L, 82L, 88L, 94L, 100L, 106L, 112L, 118L), 4:5, list(NULL, c('V5', 'V6', 'V7', 'V8', 'V9'))); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) V5 V6 V7 V8 V9 [1,] 4 28 52 76 100 [2,] 10 34 58 82 106 [3,] 16 40 64 88 112 [4,] 22 46 70 94 118 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray25# #argv <- list(c(1, 1, 1, 1, 1, 2, 2, 2, 2, 2, 3, 3, 3, 3, 3, 4, 4, 4, 4, 4, 5, 5, 5, 5, 5, 6, 6, 6, 6, 6, 7, 7, 7, 7, 7, 8, 8, 8, 8, 8, 9, 9, 9, 9, 9, 10, 10, 10, 10, 10, 11, 11, 11, 11, 11, 12, 12, 12, 12, 12, 13, 13, 13, 13, 13, 14, 14, 14, 14, 14, 15, 15, 15, 15, 15, 16, 16, 16, 16, 16, 17, 17, 17, 17, 17, 18, 18, 18, 18, 18, 19, 19, 19, 19, 19, 20, 20, 20, 20, 20, 21, 21, 21, 21, 21, 22, 22, 22, 22, 22, 23, 23, 23, 23, 23, 24, 24, 24, 24, 24, 25, 25, 25, 25, 25, 26, 26, 26, 26, 26, 27, 27, 27, 27, 27, 28, 28, 28, 28, 28, 29, 29, 29, 29, 29, 30, 30, 30, 30, 30, 31, 31, 31, 31, 31, 32, 32, 32, 32, 32, 33, 33, 33, 33, 33, 34, 34, 34, 34, 34, 35, 35, 35, 35, 35, 36, 36, 36, 36, 36, 37, 37, 37, 37, 37, 38, 38, 38, 38, 38, 39, 39, 39, 39, 39, 40, 40, 40, 40, 40, 41, 41, 41, 41, 41, 42, 42, 42, 42, 42, 43, 43, 43, 43, 43, 44, 44, 44, 44, 44, 45, 45, 45, 45, 45, 46, 46, 46, 46, 46, 47, 47, 47, 47, 47, 48, 48, 48, 48, 48, 49, 49, 49, 49, 49, 50, 50, 50, 50, 50, 51, 51, 51, 51, 51, 52, 52, 52, 52, 52, 53, 53, 53, 53, 53, 54, 54, 54, 54, 54, 55, 55, 55, 55, 55, 56, 56, 56, 56, 56, 57, 57, 57, 57, 57, 58, 58, 58, 58, 58, 59, 59, 59, 59, 59, 60, 60, 60, 60, 60, 61, 61, 61, 61, 61, 62, 62, 62, 62, 62, 63, 63, 63, 63, 63, 64, 64, 64, 64, 64, 65, 65, 65, 65, 65, 66, 66, 66, 66, 66, 67, 67, 67, 67, 67, 68, 68, 68, 68, 68, 69, 69, 69, 69, 69, 70, 70, 70, 70, 70, 71, 71, 71, 71, 71, 72, 72, 72, 72, 72, 73, 73, 73, 73, 73, 74, 74, 74, 74, 74, 75, 75, 75, 75, 75, 76, 76, 76, 76, 76, 77, 77, 77, 77, 77, 78, 78, 78, 78, 78, 79, 79, 79, 79, 79, 80, 80, 80, 80, 80, 81, 81, 81, 81, 81, 82, 82, 82, 82, 82, 83, 83, 83, 83, 83, 84, 84, 84, 84, 84, 85, 85, 85, 85, 85, 86, 86, 86, 86, 86, 87, 87, 87, 87, 87, 88, 88, 88, 88, 88, 89, 89, 89, 89, 89, 90, 90, 90, 90, 90, 91, 91, 91, 91, 91, 92, 92, 92, 92, 92, 93, 93, 93, 93, 93, 94, 94, 94, 94, 94, 95, 95, 95, 95, 95, 96, 96, 96, 96, 96, 97, 97, 97, 97, 97, 98, 98, 98, 98, 98, 99, 99, 99, 99, 99, 100, 100, 100, 100, 100, 101, 101, 101, 101, 101, 102, 102, 102, 102, 102, 103, 103, 103, 103, 103, 104, 104, 104, 104, 104, 105, 105, 105, 105, 105, 106, 106, 106, 106, 106, 107, 107, 107, 107, 107, 108, 108, 108, 108, 108, 109, 109, 109, 109, 109, 110, 110, 110, 110, 110, 111, 111, 111, 111, 111, 112, 112, 112, 112, 112, 113, 113, 113, 113, 113, 114, 114, 114, 114, 114, 115, 115, 115, 115, 115, 116, 116, 116, 116, 116, 117, 117, 117, 117, 117, 118, 118, 118, 118, 118, 119, 119, 119, 119, 119, 120, 120, 120, 120, 120), c(5, 2, 3, 4, 5), list(NULL, NULL, c('a', 'b', 'c'), NULL, c('V5', 'V6', 'V7', 'V8', 'V9'))); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) , , a, 1, V5 [,1] [,2] [1,] 1 2 [2,] 1 2 [3,] 1 2 [4,] 1 2 [5,] 1 2 , , b, 1, V5 [,1] [,2] [1,] 3 4 [2,] 3 4 [3,] 3 4 [4,] 3 4 [5,] 3 4 , , c, 1, V5 [,1] [,2] [1,] 5 6 [2,] 5 6 [3,] 5 6 [4,] 5 6 [5,] 5 6 , , a, 2, V5 [,1] [,2] [1,] 7 8 [2,] 7 8 [3,] 7 8 [4,] 7 8 [5,] 7 8 , , b, 2, V5 [,1] [,2] [1,] 9 10 [2,] 9 10 [3,] 9 10 [4,] 9 10 [5,] 9 10 , , c, 2, V5 [,1] [,2] [1,] 11 12 [2,] 11 12 [3,] 11 12 [4,] 11 12 [5,] 11 12 , , a, 3, V5 [,1] [,2] [1,] 13 14 [2,] 13 14 [3,] 13 14 [4,] 13 14 [5,] 13 14 , , b, 3, V5 [,1] [,2] [1,] 15 16 [2,] 15 16 [3,] 15 16 [4,] 15 16 [5,] 15 16 , , c, 3, V5 [,1] [,2] [1,] 17 18 [2,] 17 18 [3,] 17 18 [4,] 17 18 [5,] 17 18 , , a, 4, V5 [,1] [,2] [1,] 19 20 [2,] 19 20 [3,] 19 20 [4,] 19 20 [5,] 19 20 , , b, 4, V5 [,1] [,2] [1,] 21 22 [2,] 21 22 [3,] 21 22 [4,] 21 22 [5,] 21 22 , , c, 4, V5 [,1] [,2] [1,] 23 24 [2,] 23 24 [3,] 23 24 [4,] 23 24 [5,] 23 24 , , a, 1, V6 [,1] [,2] [1,] 25 26 [2,] 25 26 [3,] 25 26 [4,] 25 26 [5,] 25 26 , , b, 1, V6 [,1] [,2] [1,] 27 28 [2,] 27 28 [3,] 27 28 [4,] 27 28 [5,] 27 28 , , c, 1, V6 [,1] [,2] [1,] 29 30 [2,] 29 30 [3,] 29 30 [4,] 29 30 [5,] 29 30 , , a, 2, V6 [,1] [,2] [1,] 31 32 [2,] 31 32 [3,] 31 32 [4,] 31 32 [5,] 31 32 , , b, 2, V6 [,1] [,2] [1,] 33 34 [2,] 33 34 [3,] 33 34 [4,] 33 34 [5,] 33 34 , , c, 2, V6 [,1] [,2] [1,] 35 36 [2,] 35 36 [3,] 35 36 [4,] 35 36 [5,] 35 36 , , a, 3, V6 [,1] [,2] [1,] 37 38 [2,] 37 38 [3,] 37 38 [4,] 37 38 [5,] 37 38 , , b, 3, V6 [,1] [,2] [1,] 39 40 [2,] 39 40 [3,] 39 40 [4,] 39 40 [5,] 39 40 , , c, 3, V6 [,1] [,2] [1,] 41 42 [2,] 41 42 [3,] 41 42 [4,] 41 42 [5,] 41 42 , , a, 4, V6 [,1] [,2] [1,] 43 44 [2,] 43 44 [3,] 43 44 [4,] 43 44 [5,] 43 44 , , b, 4, V6 [,1] [,2] [1,] 45 46 [2,] 45 46 [3,] 45 46 [4,] 45 46 [5,] 45 46 , , c, 4, V6 [,1] [,2] [1,] 47 48 [2,] 47 48 [3,] 47 48 [4,] 47 48 [5,] 47 48 , , a, 1, V7 [,1] [,2] [1,] 49 50 [2,] 49 50 [3,] 49 50 [4,] 49 50 [5,] 49 50 , , b, 1, V7 [,1] [,2] [1,] 51 52 [2,] 51 52 [3,] 51 52 [4,] 51 52 [5,] 51 52 , , c, 1, V7 [,1] [,2] [1,] 53 54 [2,] 53 54 [3,] 53 54 [4,] 53 54 [5,] 53 54 , , a, 2, V7 [,1] [,2] [1,] 55 56 [2,] 55 56 [3,] 55 56 [4,] 55 56 [5,] 55 56 , , b, 2, V7 [,1] [,2] [1,] 57 58 [2,] 57 58 [3,] 57 58 [4,] 57 58 [5,] 57 58 , , c, 2, V7 [,1] [,2] [1,] 59 60 [2,] 59 60 [3,] 59 60 [4,] 59 60 [5,] 59 60 , , a, 3, V7 [,1] [,2] [1,] 61 62 [2,] 61 62 [3,] 61 62 [4,] 61 62 [5,] 61 62 , , b, 3, V7 [,1] [,2] [1,] 63 64 [2,] 63 64 [3,] 63 64 [4,] 63 64 [5,] 63 64 , , c, 3, V7 [,1] [,2] [1,] 65 66 [2,] 65 66 [3,] 65 66 [4,] 65 66 [5,] 65 66 , , a, 4, V7 [,1] [,2] [1,] 67 68 [2,] 67 68 [3,] 67 68 [4,] 67 68 [5,] 67 68 , , b, 4, V7 [,1] [,2] [1,] 69 70 [2,] 69 70 [3,] 69 70 [4,] 69 70 [5,] 69 70 , , c, 4, V7 [,1] [,2] [1,] 71 72 [2,] 71 72 [3,] 71 72 [4,] 71 72 [5,] 71 72 , , a, 1, V8 [,1] [,2] [1,] 73 74 [2,] 73 74 [3,] 73 74 [4,] 73 74 [5,] 73 74 , , b, 1, V8 [,1] [,2] [1,] 75 76 [2,] 75 76 [3,] 75 76 [4,] 75 76 [5,] 75 76 , , c, 1, V8 [,1] [,2] [1,] 77 78 [2,] 77 78 [3,] 77 78 [4,] 77 78 [5,] 77 78 , , a, 2, V8 [,1] [,2] [1,] 79 80 [2,] 79 80 [3,] 79 80 [4,] 79 80 [5,] 79 80 , , b, 2, V8 [,1] [,2] [1,] 81 82 [2,] 81 82 [3,] 81 82 [4,] 81 82 [5,] 81 82 , , c, 2, V8 [,1] [,2] [1,] 83 84 [2,] 83 84 [3,] 83 84 [4,] 83 84 [5,] 83 84 , , a, 3, V8 [,1] [,2] [1,] 85 86 [2,] 85 86 [3,] 85 86 [4,] 85 86 [5,] 85 86 , , b, 3, V8 [,1] [,2] [1,] 87 88 [2,] 87 88 [3,] 87 88 [4,] 87 88 [5,] 87 88 , , c, 3, V8 [,1] [,2] [1,] 89 90 [2,] 89 90 [3,] 89 90 [4,] 89 90 [5,] 89 90 , , a, 4, V8 [,1] [,2] [1,] 91 92 [2,] 91 92 [3,] 91 92 [4,] 91 92 [5,] 91 92 , , b, 4, V8 [,1] [,2] [1,] 93 94 [2,] 93 94 [3,] 93 94 [4,] 93 94 [5,] 93 94 , , c, 4, V8 [,1] [,2] [1,] 95 96 [2,] 95 96 [3,] 95 96 [4,] 95 96 [5,] 95 96 , , a, 1, V9 [,1] [,2] [1,] 97 98 [2,] 97 98 [3,] 97 98 [4,] 97 98 [5,] 97 98 , , b, 1, V9 [,1] [,2] [1,] 99 100 [2,] 99 100 [3,] 99 100 [4,] 99 100 [5,] 99 100 , , c, 1, V9 [,1] [,2] [1,] 101 102 [2,] 101 102 [3,] 101 102 [4,] 101 102 [5,] 101 102 , , a, 2, V9 [,1] [,2] [1,] 103 104 [2,] 103 104 [3,] 103 104 [4,] 103 104 [5,] 103 104 , , b, 2, V9 [,1] [,2] [1,] 105 106 [2,] 105 106 [3,] 105 106 [4,] 105 106 [5,] 105 106 , , c, 2, V9 [,1] [,2] [1,] 107 108 [2,] 107 108 [3,] 107 108 [4,] 107 108 [5,] 107 108 , , a, 3, V9 [,1] [,2] [1,] 109 110 [2,] 109 110 [3,] 109 110 [4,] 109 110 [5,] 109 110 , , b, 3, V9 [,1] [,2] [1,] 111 112 [2,] 111 112 [3,] 111 112 [4,] 111 112 [5,] 111 112 , , c, 3, V9 [,1] [,2] [1,] 113 114 [2,] 113 114 [3,] 113 114 [4,] 113 114 [5,] 113 114 , , a, 4, V9 [,1] [,2] [1,] 115 116 [2,] 115 116 [3,] 115 116 [4,] 115 116 [5,] 115 116 , , b, 4, V9 [,1] [,2] [1,] 117 118 [2,] 117 118 [3,] 117 118 [4,] 117 118 [5,] 117 118 , , c, 4, V9 [,1] [,2] [1,] 119 120 [2,] 119 120 [3,] 119 120 [4,] 119 120 [5,] 119 120 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray26# #argv <- list('', c(4L, 3L), list(c('', 'Hair:Eye', 'Hair:Sex', 'Eye:Sex'), c('Df', 'Deviance', 'AIC'))); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) Df Deviance AIC "" "" "" Hair:Eye "" "" "" Hair:Sex "" "" "" Eye:Sex "" "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray27# #argv <- list(-1, c(3L, 2L), list(c('a', 'b', 'c'), NULL)); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] a -1 -1 b -1 -1 c -1 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray3# #argv <- list(2.10239639473973e-05, c(1L, 1L), NULL); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [1,] 2.102396e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray4# #argv <- list(0, c(105L, 1L), list(NULL, structure('d', .Names = 'CURVE'))); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) d [1,] 0 [2,] 0 [3,] 0 [4,] 0 [5,] 0 [6,] 0 [7,] 0 [8,] 0 [9,] 0 [10,] 0 [11,] 0 [12,] 0 [13,] 0 [14,] 0 [15,] 0 [16,] 0 [17,] 0 [18,] 0 [19,] 0 [20,] 0 [21,] 0 [22,] 0 [23,] 0 [24,] 0 [25,] 0 [26,] 0 [27,] 0 [28,] 0 [29,] 0 [30,] 0 [31,] 0 [32,] 0 [33,] 0 [34,] 0 [35,] 0 [36,] 0 [37,] 0 [38,] 0 [39,] 0 [40,] 0 [41,] 0 [42,] 0 [43,] 0 [44,] 0 [45,] 0 [46,] 0 [47,] 0 [48,] 0 [49,] 0 [50,] 0 [51,] 0 [52,] 0 [53,] 0 [54,] 0 [55,] 0 [56,] 0 [57,] 0 [58,] 0 [59,] 0 [60,] 0 [61,] 0 [62,] 0 [63,] 0 [64,] 0 [65,] 0 [66,] 0 [67,] 0 [68,] 0 [69,] 0 [70,] 0 [71,] 0 [72,] 0 [73,] 0 [74,] 0 [75,] 0 [76,] 0 [77,] 0 [78,] 0 [79,] 0 [80,] 0 [81,] 0 [82,] 0 [83,] 0 [84,] 0 [85,] 0 [86,] 0 [87,] 0 [88,] 0 [89,] 0 [90,] 0 [91,] 0 [92,] 0 [93,] 0 [94,] 0 [95,] 0 [96,] 0 [97,] 0 [98,] 0 [99,] 0 [100,] 0 [101,] 0 [102,] 0 [103,] 0 [104,] 0 [105,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray5# #argv <- list(structure(list(`1` = structure(list(lower = 13.2743449189798, est. = 24.8054653131966, upper = 46.3534067526313), .Names = c('lower', 'est.', 'upper'), row.names = 'reStruct.Rail.sd((Intercept))', class = 'data.frame')), .Names = '1'), c(1L, 1L), list('1', NULL)); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] 1 List,3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray6# #argv <- list(0, 61, NULL); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [39] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray7# #argv <- list(c(10L, 10L, 11L, 10L, 12L, 11L, 13L, 12L, 14L, 13L, 15L, 14L, 16L, 15L, 17L, 16L, 18L, 17L, 19L, 18L, 20L, 19L, 21L, 20L, 22L, 21L, 23L, 22L, 24L, 23L, 25L, 24L, 26L, 25L, 27L, 26L, 28L, 27L, 29L, 28L, 30L, 29L, 31L, 30L, 32L, 31L, 33L, 32L, 34L, 33L, 35L, 34L, 36L, 35L, 37L, 36L, 38L, 36L, 39L, 38L, 40L, 39L), c(2L, 31L), list(c('target', 'actual'), NULL)); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] target 10 11 12 13 14 15 16 17 18 19 20 21 22 actual 10 10 11 12 13 14 15 16 17 18 19 20 21 [,14] [,15] [,16] [,17] [,18] [,19] [,20] [,21] [,22] [,23] [,24] [,25] target 23 24 25 26 27 28 29 30 31 32 33 34 actual 22 23 24 25 26 27 28 29 30 31 32 33 [,26] [,27] [,28] [,29] [,30] [,31] target 35 36 37 38 39 40 actual 34 35 36 36 38 39 ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray8# #argv <- list(c(NA, NA, NA, NA, NA, NA, 29L, NA, 71L, 39L, NA, NA, 23L, NA, NA, 21L, 37L, 20L, 12L, 13L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), c(30L, 1L), NULL); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) [,1] [1,] NA [2,] NA [3,] NA [4,] NA [5,] NA [6,] NA [7,] 29 [8,] NA [9,] 71 [10,] 39 [11,] NA [12,] NA [13,] 23 [14,] NA [15,] NA [16,] 21 [17,] 37 [18,] 20 [19,] 12 [20,] 13 [21,] NA [22,] NA [23,] NA [24,] NA [25,] NA [26,] NA [27,] NA [28,] NA [29,] NA [30,] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_array.testarray9# #argv <- list(integer(0), c(1L, 0L), structure(list('1', NULL), .Names = c('', ''))); .Internal(array(argv[[1]], argv[[2]], argv[[3]])) 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #argv <- structure(list(x = c('2007-11-06', NA)), .Names = 'x');do.call('as.Date.character', argv) [1] "2007-11-06" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2016-02-29') } [1] "2016-02-29" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-00-10') } Error in charToDate(x) : character string is not in a standard unambiguous format ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-01-31') } [1] "2017-01-31" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-01-32') } Error in charToDate(x) : character string is not in a standard unambiguous format ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-02-28') } [1] "2017-02-28" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-02-29') } Error in charToDate(x) : character string is not in a standard unambiguous format ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-02-30') } Error in charToDate(x) : character string is not in a standard unambiguous format ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-03-31') } [1] "2017-03-31" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-04-31') } Error in charToDate(x) : character string is not in a standard unambiguous format ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-04-32') } Error in charToDate(x) : character string is not in a standard unambiguous format ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-05-31') } [1] "2017-05-31" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-10-00') } Error in charToDate(x) : character string is not in a standard unambiguous format ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-12-31') } [1] "2017-12-31" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-12-32') } Error in charToDate(x) : character string is not in a standard unambiguous format ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatecharacter.testasDatecharacter1# #{ as.Date('2017-13-01') } Error in charToDate(x) : character string is not in a standard unambiguous format ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatedefault.testasDatedefault1# #argv <- structure(list(x = logical(0)), .Names = 'x');do.call('as.Date.default', argv) Date of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatefactor.testasDatefactor1# #argv <- structure(list(x = structure(1L, .Label = '2000-01-02', class = 'factor')), .Names = 'x');do.call('as.Date.factor', argv) [1] "2000-01-02" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asDatenumeric.testasDatenumeric1# #argv <- structure(list(x = 0.5, origin = '1969-12-31'), .Names = c('x', 'origin'));do.call('as.Date.numeric', argv) [1] "1969-12-31" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct1# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1L, mon = 0L, year = 109L, wday = 4L, yday = 0L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'UTC'), 'UTC'); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] 1230768000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct10# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1, mon = 1L, year = 109L, wday = 0L, yday = 31L, isdst = -1), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'UTC'), 'UTC'); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] 1233446400 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct11# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1L, mon = c(0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49), year = 105L, wday = 6L, yday = 0L, isdst = -1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'UTC'), 'UTC'); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] 1104537600 1107216000 1109635200 1112313600 1114905600 1117584000 [7] 1120176000 1122854400 1125532800 1128124800 1130803200 1133395200 [13] 1136073600 1138752000 1141171200 1143849600 1146441600 1149120000 [19] 1151712000 1154390400 1157068800 1159660800 1162339200 1164931200 [25] 1167609600 1170288000 1172707200 1175385600 1177977600 1180656000 [31] 1183248000 1185926400 1188604800 1191196800 1193875200 1196467200 [37] 1199145600 1201824000 1204329600 1207008000 1209600000 1212278400 [43] 1214870400 1217548800 1220227200 1222819200 1225497600 1228089600 [49] 1230768000 1233446400 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct12# #argv <- list(structure(list(sec = 0, min = 2L, hour = 2L, mday = 2L, mon = 1L, year = c(102L, 1102L), wday = 6L, yday = 32L, isdst = -1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')), ''); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] 1012615320 32569524120 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct13# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = c(2L, 4L, 6L, 8L, 10L, 12L, 14L, 16L, 18L, 20L, 22L, 24L, 26L, 28L, 30L, 32L), mon = 1L, year = 102L, wday = 6L, yday = 32L, isdst = -1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')), ''); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] 1012608000 1012780800 1012953600 1013126400 1013299200 1013472000 [7] 1013644800 1013817600 1013990400 1014163200 1014336000 1014508800 [13] 1014681600 1014854400 1015027200 1015200000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct2# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1, mon = c(11, 12, 13, 14), year = 100L, wday = 0L, yday = 365L, isdst = -1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'), 'GMT'); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] 975628800 978307200 980985600 983404800 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct3# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = -3L, mon = 1L, year = 102L, wday = 6L, yday = 32L, isdst = -1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')), ''); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] 1012176000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct4# #argv <- list(structure(list(sec = 0, min = 0L, hour = 12L, mday = 1L, mon = 0L, year = c(70L, 75L, 80L, 85L, 90L, 95L, 100L, 105L, 110L, 115L), wday = 4L, yday = 0L, isdst = -1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'), 'GMT'); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] 43200 157809600 315576000 473428800 631195200 788961600 [7] 946728000 1104580800 1262347200 1420113600 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct5# #argv <- list(structure(list(sec = numeric(0), min = integer(0), hour = integer(0), mday = integer(0), mon = integer(0), year = integer(0), wday = integer(0), yday = integer(0), isdst = integer(0)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt')), ''); .Internal(as.POSIXct(argv[[1]], argv[[2]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct6# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1L, mon = 0L, year = -5L, wday = 2L, yday = 0L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'), 'GMT'); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] -2366755200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct7# #argv <- list(structure(list(sec = NA_real_, min = NA_integer_, hour = NA_integer_, mday = NA_integer_, mon = NA_integer_, year = NA_integer_, wday = NA_integer_, yday = NA_integer_, isdst = -1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'), 'GMT'); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct8# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1L, mon = 0L, year = 70L, wday = 4L, yday = 0L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'), 'GMT'); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXct.testasPOSIXct9# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 22:27, mon = 3L, year = 108L, wday = 2L, yday = 112L, isdst = -1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'), 'GMT'); .Internal(as.POSIXct(argv[[1]], argv[[2]])) [1] 1208822400 1208908800 1208995200 1209081600 1209168000 1209254400 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt#Output.MayIgnoreErrorContext# #.Internal(as.POSIXlt(, 1)) Error in .Internal(as.POSIXlt(, 1)) : argument 1 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt#Output.MayIgnoreErrorContext# #.Internal(as.POSIXlt(2, )) Error in .Internal(as.POSIXlt(2, )) : argument 2 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt# #as.POSIXlt(c('10/1/2017 0:00', '10/1/2017 0:00'), '%m/%e/%Y %H:%M', tz='America/Los_Angeles')$isdst [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt# #as.POSIXlt(c('10/1/2017 0:00', '10/1/2017 0:00'), '%m/%e/%Y %H:%M', tz='Europe/Belarus')$isdst [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt# #{ q <- Sys.time(); as.vector(unclass(as.POSIXct(as.POSIXlt(q))) - unclass(q)) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt1# #argv <- list(structure(c(2147483648.4, 2147483648.8), class = c('POSIXct', 'POSIXt'), tzone = ''), ''); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) [1] "2038-01-19 03:14:08 GMT" "2038-01-19 03:14:08 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt10# #argv <- list(character(0), ''); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) POSIXlt of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt11# #argv <- list(NULL, ''); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) POSIXlt of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt2# #argv <- list(structure(c(FALSE, FALSE), class = c('POSIXct', 'POSIXt')), ''); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) [1] "1970-01-01 GMT" "1970-01-01 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt3# #argv <- list(structure(1041324768, class = c('POSIXct', 'POSIXt'), tzone = 'GMT'), 'GMT'); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) [1] "2002-12-31 08:52:48 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt4# #argv <- list(structure(c(1208865600, 1208952000, 1209038400, 1209124800, 1209211200), tzone = 'GMT', class = c('POSIXct', 'POSIXt')), 'GMT'); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) [1] "2008-04-22 12:00:00 GMT" "2008-04-23 12:00:00 GMT" [3] "2008-04-24 12:00:00 GMT" "2008-04-25 12:00:00 GMT" [5] "2008-04-26 12:00:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt5# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)), ''); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) POSIXlt of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt6# #argv <- list(structure(32569542120, class = c('POSIXct', 'POSIXt')), ''); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) [1] "3002-02-02 07:02:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt7# #argv <- list(structure(c(1012798800, 1013403600, 1014008400, 1014613200), class = c('POSIXct', 'POSIXt'), tzone = ''), ''); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) [1] "2002-02-04 05:00:00 GMT" "2002-02-11 05:00:00 GMT" [3] "2002-02-18 05:00:00 GMT" "2002-02-25 05:00:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt8# #argv <- list(structure(c(-1893412800, -1861876800, -1830340800, -1798718400, -1767182400, -1735646400, -1704110400, -1672488000, -1640952000, -1609416000, -1577880000, -1546257600, -1514721600, -1483185600, -1451649600, -1420027200, -1388491200, -1356955200, -1325419200, -1293796800, -1262260800, -1230724800, -1199188800, -1167566400, -1136030400, -1104494400, -1072958400, -1041336000, -1009800000, -978264000, -946728000, -915105600, -883569600, -852033600, -820497600, -788875200, -757339200, -725803200, -694267200, -662644800, -631108800, -599572800, -568036800, -536414400, -504878400, -473342400, -441806400, -410184000, -378648000, -347112000, -315576000, -283953600, -252417600, -220881600, -189345600, -157723200, -126187200, -94651200, -63115200, -31492800, 43200, 31579200, 63115200, 94737600, 126273600, 157809600, 189345600, 220968000, 252504000, 284040000, 315576000, 347198400, 378734400, 410270400, 441806400, 473428800, 504964800, 536500800, 568036800, 599659200, 631195200, 662731200, 694267200, 725889600, 757425600, 788961600, 820497600, 852120000, 883656000, 915192000), class = c('POSIXct', 'POSIXt'), tzone = 'GMT'), 'GMT'); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) [1] "1910-01-01 12:00:00 GMT" "1911-01-01 12:00:00 GMT" [3] "1912-01-01 12:00:00 GMT" "1913-01-01 12:00:00 GMT" [5] "1914-01-01 12:00:00 GMT" "1915-01-01 12:00:00 GMT" [7] "1916-01-01 12:00:00 GMT" "1917-01-01 12:00:00 GMT" [9] "1918-01-01 12:00:00 GMT" "1919-01-01 12:00:00 GMT" [11] "1920-01-01 12:00:00 GMT" "1921-01-01 12:00:00 GMT" [13] "1922-01-01 12:00:00 GMT" "1923-01-01 12:00:00 GMT" [15] "1924-01-01 12:00:00 GMT" "1925-01-01 12:00:00 GMT" [17] "1926-01-01 12:00:00 GMT" "1927-01-01 12:00:00 GMT" [19] "1928-01-01 12:00:00 GMT" "1929-01-01 12:00:00 GMT" [21] "1930-01-01 12:00:00 GMT" "1931-01-01 12:00:00 GMT" [23] "1932-01-01 12:00:00 GMT" "1933-01-01 12:00:00 GMT" [25] "1934-01-01 12:00:00 GMT" "1935-01-01 12:00:00 GMT" [27] "1936-01-01 12:00:00 GMT" "1937-01-01 12:00:00 GMT" [29] "1938-01-01 12:00:00 GMT" "1939-01-01 12:00:00 GMT" [31] "1940-01-01 12:00:00 GMT" "1941-01-01 12:00:00 GMT" [33] "1942-01-01 12:00:00 GMT" "1943-01-01 12:00:00 GMT" [35] "1944-01-01 12:00:00 GMT" "1945-01-01 12:00:00 GMT" [37] "1946-01-01 12:00:00 GMT" "1947-01-01 12:00:00 GMT" [39] "1948-01-01 12:00:00 GMT" "1949-01-01 12:00:00 GMT" [41] "1950-01-01 12:00:00 GMT" "1951-01-01 12:00:00 GMT" [43] "1952-01-01 12:00:00 GMT" "1953-01-01 12:00:00 GMT" [45] "1954-01-01 12:00:00 GMT" "1955-01-01 12:00:00 GMT" [47] "1956-01-01 12:00:00 GMT" "1957-01-01 12:00:00 GMT" [49] "1958-01-01 12:00:00 GMT" "1959-01-01 12:00:00 GMT" [51] "1960-01-01 12:00:00 GMT" "1961-01-01 12:00:00 GMT" [53] "1962-01-01 12:00:00 GMT" "1963-01-01 12:00:00 GMT" [55] "1964-01-01 12:00:00 GMT" "1965-01-01 12:00:00 GMT" [57] "1966-01-01 12:00:00 GMT" "1967-01-01 12:00:00 GMT" [59] "1968-01-01 12:00:00 GMT" "1969-01-01 12:00:00 GMT" [61] "1970-01-01 12:00:00 GMT" "1971-01-01 12:00:00 GMT" [63] "1972-01-01 12:00:00 GMT" "1973-01-01 12:00:00 GMT" [65] "1974-01-01 12:00:00 GMT" "1975-01-01 12:00:00 GMT" [67] "1976-01-01 12:00:00 GMT" "1977-01-01 12:00:00 GMT" [69] "1978-01-01 12:00:00 GMT" "1979-01-01 12:00:00 GMT" [71] "1980-01-01 12:00:00 GMT" "1981-01-01 12:00:00 GMT" [73] "1982-01-01 12:00:00 GMT" "1983-01-01 12:00:00 GMT" [75] "1984-01-01 12:00:00 GMT" "1985-01-01 12:00:00 GMT" [77] "1986-01-01 12:00:00 GMT" "1987-01-01 12:00:00 GMT" [79] "1988-01-01 12:00:00 GMT" "1989-01-01 12:00:00 GMT" [81] "1990-01-01 12:00:00 GMT" "1991-01-01 12:00:00 GMT" [83] "1992-01-01 12:00:00 GMT" "1993-01-01 12:00:00 GMT" [85] "1994-01-01 12:00:00 GMT" "1995-01-01 12:00:00 GMT" [87] "1996-01-01 12:00:00 GMT" "1997-01-01 12:00:00 GMT" [89] "1998-01-01 12:00:00 GMT" "1999-01-01 12:00:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asPOSIXlt.testasPOSIXlt9# #argv <- list(list(), ''); .Internal(as.POSIXlt(argv[[1]], argv[[2]])) POSIXlt of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asS4.testasS41# #argv <- structure(list(object = structure(NA, .Dim = c(1L, 1L))), .Names = 'object');do.call('asS4', argv) [,1] [1,] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asarray.testasarray1# #argv <- structure(list(x = 1:3), .Names = 'x');do.call('as.array', argv) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asarraydefault.testasarraydefault1# #argv <- structure(list(x = structure(c(1, 2), .Dim = 2L, .Dimnames = list(c('a', 'b')))), .Names = 'x');do.call('as.array.default', argv) a b 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #as.call(list('function', pairlist(a=1), 5)) "function"(pairlist(a = 1), 5) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #as.call(list(as.symbol('function'))) function() NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #as.call(list(as.symbol('function'), pairlist(a=1))) function(a = 1) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #as.call(list(as.symbol('function'), pairlist(a=1), 5)) function(a = 1) 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #call('foo') foo() ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #call('function') function() NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #call('function', pairlist(a=1)) function(a = 1) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #call('function', pairlist(a=1), 3) function(a = 1) 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #call('function', pairlist(a=1), 5) function(a = 1) 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #call('function', pairlist(a=1), 5,3) function(a = 1) 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #e <- expression(function(a) b); as.call(list(e[[1]][[1]])) function() NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #e <- expression(function(a) b); as.call(list(e[[1]][[2]])) as.pairlist(alist(a = ))() ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #e <- substitute(a$b(c)); as.call(lapply(e, function(x) x)) a$b(c) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #invisible(call('function', 'a')) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #length(call('function', 'a')) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #typeof(as.call(list(substitute(graphics::par)))) [1] "language" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #{ as.call(42) } Error in as.call(42) : invalid argument list ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall#Output.IgnoreWhitespace# #{ cl <- quote(fun(3)); as.call(cl) } fun(3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #{ f <- function() 23 ; l <- list(f) ; cl <- as.call(l) ; eval(cl) } [1] 23 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #{ f <- function(a,b) a+b ; l <- list(f,2,3) ; cl <- as.call(l) ; eval(cl) } [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #{ f <- function(x) x ; l <- list(f, 42) ; cl <- as.call(l); typeof(cl[[1]]) } [1] "closure" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #{ f <- function(x) x ; l <- list(f, 42) ; cl <- as.call(l); typeof(cl[[2]]) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #{ f <- function(x) x+19 ; g <- function() 23 ; l <- list(f, g()) ; cl <- as.call(l) ; eval(cl) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #{ f <- round ; g <- as.call(list(f, quote(A))) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #{ g <- function() 23 ; l <- list(f, g()) ; as.call(l) } Error: object 'f' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #{ l <- list(f) ; as.call(l) } Error: object 'f' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testAsCall# #{ l <- list(f, 2, 3) ; as.call(l) } Error: object 'f' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testSideEffect# #{ a <- c(1, 2, 3); b <- function() { a[1] <<-10 ; 4 }; f <- sum; (g <- as.call(list(f, quote(a), quote(b()), quote(a[1] <- 11)))); eval(g) } [1] 21 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testascall1# #argv <- list(list(quote(quote), c(0.568, 1.432, -1.08, 1.08)));as.call(argv[[1]]); quote(c(0.568, 1.432, -1.08, 1.08)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testascall2# #argv <- list(list(quote(quote), FALSE));as.call(argv[[1]]); quote(FALSE) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testascall3# #argv <- list(list(quote(quote), list(NULL, c('time', 'status'))));as.call(argv[[1]]); quote(list(NULL, c("time", "status"))) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testascall4# #argv <- list(structure(expression(data.frame, check.names = TRUE, stringsAsFactors = TRUE), .Names = c('', 'check.names', 'stringsAsFactors')));as.call(argv[[1]]); data.frame(check.names = TRUE, stringsAsFactors = TRUE) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testascall5# #argv <- list(list(quote(quote), 80L));as.call(argv[[1]]); quote(80L) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascall.testascall6# #argv <- list(list(quote(quote), NA));as.call(argv[[1]]); quote(NA) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.noCopyCheck# #if (!any(R.version$engine == "FastR")) { [1] TRUE } else { { x <- c('a', 'abc'); .fastr.identity(x) == .fastr.identity(as.character(x)); } } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #nchar(as.character(stats:::C_df['address'])) > 5 [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character() } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(1) } [1] "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(1.1:3.1) } [1] "1.1" "2.1" "3.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(1:3) } [1] "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(1L) } [1] "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(NULL) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(TRUE) } [1] "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(list(1,2,3)) } [1] "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(list(c("hello", "hi"))) } [1] "c(\"hello\", \"hi\")" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(list(c(2L, 3L))) } [1] "2:3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(list(c(2L, 3L, 5L))) } [1] "c(2, 3, 5)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character(list(list(c("hello", "hi")))) } [1] "list(c(\"hello\", \"hi\"))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ as.character.cls <- function(x) 42; as.character(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ f1<-function() 7; f2<-function(x) { sys.call() }; as.character(f2(f1())) } [1] "f2" "f1()" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ f1<-function(x) 7; f2<-function(y) { sys.call() }; as.character(f2(f1(42))) } [1] "f2" "f1(42)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ f<-function(x) { sys.call() }; as.character(f(7)) } [1] "f" "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ x<-as.character(Sys.time()) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testAsCharacter# #{ y <- c('a', 'b'); attr(y, 'someAttr') <- 'someValue'; x <- as.character(y); x[[1]] <- '42'; y } [1] "a" "b" attr(,"someAttr") [1] "someValue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter1# #argv <- list('bessel_y(2,nu=181.2): precision lost in result');as.character(argv[[1]]); [1] "bessel_y(2,nu=181.2): precision lost in result" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter10# #argv <- list(structure(character(0), package = character(0), class = structure('ObjectsWithPackage', package = 'methods')));as.character(argv[[1]]); character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter11# #argv <- list(c(FALSE, TRUE));as.character(argv[[1]]); [1] "FALSE" "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter12# #argv <- list(structure(1:4, .Dim = c(1L, 4L)));as.character(argv[[1]]); [1] "1" "2" "3" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter13# #argv <- list(structure('1', .Tsp = c(1, 1, 1), class = 'ts'));as.character(argv[[1]]); [1] "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter14# #argv <- list(structure('Estimates a probability density function, \n', Rd_tag = 'TEXT'));as.character(argv[[1]]); [1] "Estimates a probability density function, \n" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter15# #argv <- list(c(2L, 1L, 3L, NA, 4L));as.character(argv[[1]]); [1] "2" "1" "3" NA "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter16# #argv <- list(structure(-841, class = 'Date'));as.character(argv[[1]]); [1] "1967-09-13" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter17# #argv <- list(structure(list(list(structure('x', Rd_tag = 'TEXT')), list(structure('an R object representing a hierarchical clustering.\n', Rd_tag = 'TEXT'), structure(' For the default method, an object of class ', Rd_tag = 'TEXT'), structure(list(structure('\'', Rd_tag = 'RCODE'), structure(list(structure('hclust', Rd_tag = 'TEXT')), Rd_tag = '\\link'), structure('\'', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' or\n', Rd_tag = 'TEXT'), structure(' with a method for ', Rd_tag = 'TEXT'), structure(list( structure(list(structure('as.hclust', Rd_tag = 'TEXT')), Rd_tag = '\\link'), structure('()', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' such as\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(structure('\'', Rd_tag = 'RCODE'), structure(list(structure('agnes', Rd_tag = 'TEXT')), Rd_tag = '\\link', Rd_option = structure('cluster', Rd_tag = 'TEXT')), structure('\'', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' in package ', Rd_tag = 'TEXT'), structure(c('\\href{http://CRAN.R-project.org/package=#1}{\\pkg{#1}}', 'cluster'), Rd_tag = 'USERMACRO'), structure(list(list(structure('http://CRAN.R-project.org/package=cluster', Rd_tag = 'VERB')), list(structure(list(structure('cluster', Rd_tag = 'TEXT')), Rd_tag = '\\pkg'))), Rd_tag = '\\href'), structure('.', Rd_tag = 'TEXT'))), Rd_tag = '\\item'));as.character(argv[[1]]); [1] "list(\"x\")" [2] "list(\"an R object representing a hierarchical clustering.\\n\", \" For the default method, an object of class \", list(\"'\", list(\"hclust\"), \"'\"), \" or\\n\", \" with a method for \", list(list(\"as.hclust\"), \"()\"), \" such as\\n\", \" \", list(\"'\", list(\"agnes\"), \"'\"), \" in package \", c(\"\\\\href{http://CRAN.R-project.org/package=#1}{\\\\pkg{#1}}\", \"cluster\"), list(list(\"http://CRAN.R-project.org/package=cluster\"), list(list(\"cluster\"))), \".\")" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter18# #argv <- list(list(epsilon = 1e-08, maxit = 25, trace = FALSE));as.character(argv[[1]]); [1] "1e-08" "25" "FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter19# #argv <- list(structure(list(structure(list(given = c('George', 'E.', 'P.'), family = 'Box', role = NULL, email = NULL, comment = NULL), .Names = c('given', 'family', 'role', 'email', 'comment')), structure(list(given = c('David', 'R.'), family = 'Cox', role = NULL, email = NULL, comment = NULL), .Names = c('given', 'family', 'role', 'email', 'comment'))), class = 'person'));as.character(argv[[1]]); [1] "George E. P. Box" "David R. Cox" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter2# #argv <- list(structure(c(12784, 12874, 12965, 13057, 13149, 13239, 13330, 13422, 13514, 13604, 13695, 13787, 13879, 13970, 14061, 14153, 14245), class = 'Date'));as.character(argv[[1]]); [1] "2005-01-01" "2005-04-01" "2005-07-01" "2005-10-01" "2006-01-01" [6] "2006-04-01" "2006-07-01" "2006-10-01" "2007-01-01" "2007-04-01" [11] "2007-07-01" "2007-10-01" "2008-01-01" "2008-04-01" "2008-07-01" [16] "2008-10-01" "2009-01-01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter20# #argv <- list(structure(list(structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(list(structure('coerce', Rd_tag = 'TEXT')), list(structure(list(structure('signature(from = \'dgCMatrix\', to =\n', Rd_tag = 'RCODE'), structure('\t\'ngCMatrix\')', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(', and many similar ones; typically you should\n', Rd_tag = 'TEXT'), structure(' coerce to ', Rd_tag = 'TEXT'), structure(list(structure('\'nsparseMatrix\'', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' (or ', Rd_tag = 'TEXT'), structure(list(structure('\'nMatrix\'', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure('). Note that\n', Rd_tag = 'TEXT'), structure(' coercion to a sparse pattern matrix records all the potential\n', Rd_tag = 'TEXT'), structure(' non-zero entries, i.e., explicit (', Rd_tag = 'TEXT'), structure(list(structure('non-structural', Rd_tag = 'TEXT')), Rd_tag = '\\dQuote'), structure(') zeroes\n', Rd_tag = 'TEXT'), structure(' are coerced to ', Rd_tag = 'TEXT'), structure(list(structure('TRUE', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(', not ', Rd_tag = 'TEXT'), structure(list(structure('FALSE', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(', see the example.\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'))), Rd_tag = '\\item'), structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(list(structure('t', Rd_tag = 'TEXT')), list(structure(list(structure('signature(x = \'ngCMatrix\')', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(': returns the transpose\n', Rd_tag = 'TEXT'), structure(' of ', Rd_tag = 'TEXT'), structure(list(structure('x', Rd_tag = 'RCODE')), Rd_tag = '\\code'))), Rd_tag = '\\item'), structure('\n', Rd_tag = 'TEXT'), structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(list(structure('which', Rd_tag = 'TEXT')), list(structure(list(structure('signature(x = \'lsparseMatrix\')', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(', semantically\n', Rd_tag = 'TEXT'), structure(' equivalent to ', Rd_tag = 'TEXT'), structure(list(structure('base', Rd_tag = 'TEXT')), Rd_tag = '\\pkg'), structure(' function ', Rd_tag = 'TEXT'), structure(list(structure(list(structure('which', Rd_tag = 'TEXT')), Rd_tag = '\\link'), structure('(x, arr.ind)', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(';\n', Rd_tag = 'TEXT'), structure(' for details, see the ', Rd_tag = 'TEXT'), structure(list(structure(list(structure('lMatrix', Rd_tag = 'TEXT')), Rd_tag = '\\linkS4class')), Rd_tag = '\\code'), structure(' class documentation.', Rd_tag = 'TEXT'))), Rd_tag = '\\item'), structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT')), Rd_tag = '\\describe'));as.character(argv[[1]]); [1] "\n" [2] " " [3] "list(list(\"coerce\"), list(list(\"signature(from = 'dgCMatrix', to =\\n\", \"\\t'ngCMatrix')\"), \", and many similar ones; typically you should\\n\", \" coerce to \", list(\"'nsparseMatrix'\"), \" (or \", list(\"'nMatrix'\"), \"). Note that\\n\", \" coercion to a sparse pattern matrix records all the potential\\n\", \" non-zero entries, i.e., explicit (\", list(\"non-structural\"), \") zeroes\\n\", \" are coerced to \", list(\"TRUE\"), \", not \", list(\"FALSE\"), \", see the example.\\n\", \" \"))" [4] "\n" [5] " " [6] "list(list(\"t\"), list(list(\"signature(x = 'ngCMatrix')\"), \": returns the transpose\\n\", \" of \", list(\"x\")))" [7] "\n" [8] "\n" [9] " " [10] "list(list(\"which\"), list(list(\"signature(x = 'lsparseMatrix')\"), \", semantically\\n\", \" equivalent to \", list(\"base\"), \" function \", list(list(\"which\"), \"(x, arr.ind)\"), \";\\n\", \" for details, see the \", list(list(\"lMatrix\")), \" class documentation.\"))" [11] "\n" [12] " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter21# #argv <- list(c(3, 3, NA, NA, NA, NA, 4, 3, 4, NA, NA, 2, 3, 3, NA, NA, 2, 4, NA, 2, 5, 2, 2, 4, 3, NA, 2, NA, 3, 3));as.character(argv[[1]]); [1] "3" "3" NA NA NA NA "4" "3" "4" NA NA "2" "3" "3" NA NA "2" "4" NA [20] "2" "5" "2" "2" "4" "3" NA "2" NA "3" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter22# #argv <- list(structure(list(structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(list(structure(list(structure('languageEl', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(':', Rd_tag = 'TEXT')), list(structure('\n', Rd_tag = 'TEXT'), structure(' extract an element of a language object, consistently for\n', Rd_tag = 'TEXT'), structure(' different kinds of objects.\n', Rd_tag = 'TEXT'), structure('\n', Rd_tag = 'TEXT'), structure(' The 1st., etc. elements of a function are the corresponding formal\n', Rd_tag = 'TEXT'), structure(' arguments, with the default expression if any as value.\n', Rd_tag = 'TEXT'), structure('\n', Rd_tag = 'TEXT'), structure(' The first element of a call is the name or the function object\n', Rd_tag = 'TEXT'), structure(' being called.\n', Rd_tag = 'TEXT'), structure('\n', Rd_tag = 'TEXT'), structure(' The 2nd, 3rd, etc. elements are the 1st, 2nd, etc. arguments\n', Rd_tag = 'TEXT'), structure(' expressions. Note that the form of the extracted name is\n', Rd_tag = 'TEXT'), structure(' different for R and S-Plus. When the name (the first element) of\n', Rd_tag = 'TEXT'), structure(' a call is replaced, the languageEl replacement function coerces a\n', Rd_tag = 'TEXT'), structure(' character string to the internal form for each system.\n', Rd_tag = 'TEXT'), structure('\n', Rd_tag = 'TEXT'), structure(' The 1st, 2nd, 3rd elements of an ', Rd_tag = 'TEXT'), structure(list(structure('if', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' expression are the\n', Rd_tag = 'TEXT'), structure(' test, first, and second branch.\n', Rd_tag = 'TEXT'), structure('\n', Rd_tag = 'TEXT'), structure(' The 1st element of a ', Rd_tag = 'TEXT'), structure(list(structure('for', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' object is the name (symbol) being\n', Rd_tag = 'TEXT'), structure(' used in the loop, the second is the expression for the range of\n', Rd_tag = 'TEXT'), structure(' the loop, the third is the body of the loop.\n', Rd_tag = 'TEXT'), structure('\n', Rd_tag = 'TEXT'), structure(' The first element of a ', Rd_tag = 'TEXT'), structure(list(structure('while', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' object is the loop test, and\n', Rd_tag = 'TEXT'), structure(' the second the body of the loop.\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'))), Rd_tag = '\\item'), structure('\n', Rd_tag = 'TEXT'), structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(list(structure(list(structure('isGrammarSymbol', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(':', Rd_tag = 'TEXT')), list(structure('\n', Rd_tag = 'TEXT'), structure(' Checks whether the symbol is part of the grammar.\n', Rd_tag = 'TEXT'), structure(' Don\'t use this function directly.\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'))), Rd_tag = '\\item'), structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT')), Rd_tag = '\\describe'));as.character(argv[[1]]); [1] "\n" [2] " " [3] "list(list(list(\"languageEl\"), \":\"), list(\"\\n\", \" extract an element of a language object, consistently for\\n\", \" different kinds of objects.\\n\", \"\\n\", \" The 1st., etc. elements of a function are the corresponding formal\\n\", \" arguments, with the default expression if any as value.\\n\", \"\\n\", \" The first element of a call is the name or the function object\\n\", \" being called.\\n\", \"\\n\", \" The 2nd, 3rd, etc. elements are the 1st, 2nd, etc. arguments\\n\", \" expressions. Note that the form of the extracted name is\\n\", \n \" different for R and S-Plus. When the name (the first element) of\\n\", \" a call is replaced, the languageEl replacement function coerces a\\n\", \" character string to the internal form for each system.\\n\", \"\\n\", \" The 1st, 2nd, 3rd elements of an \", list(\"if\"), \" expression are the\\n\", \" test, first, and second branch.\\n\", \"\\n\", \" The 1st element of a \", list(\"for\"), \" object is the name (symbol) being\\n\", \" used in the loop, the second is the expression for the range of\\n\", \n \" the loop, the third is the body of the loop.\\n\", \"\\n\", \" The first element of a \", list(\"while\"), \" object is the loop test, and\\n\", \" the second the body of the loop.\\n\", \" \"))" [4] "\n" [5] "\n" [6] " " [7] "list(list(list(\"isGrammarSymbol\"), \":\"), list(\"\\n\", \" Checks whether the symbol is part of the grammar.\\n\", \" Don't use this function directly.\\n\", \" \"))" [8] "\n" [9] " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter23# #argv <- list(structure(c(1L, 2L, 2L, 3L, 3L, 1L, NA), .Label = c('Australia', 'UK', 'US'), class = 'factor'));as.character(argv[[1]]); [1] "Australia" "UK" "UK" "US" "US" "Australia" [7] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter24# #argv <- list(structure(list(4L), class = c('package_version', 'numeric_version')));as.character(argv[[1]]); [1] "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter25# #argv <- list(c(-Inf, NaN, Inf));as.character(argv[[1]]); [1] "-Inf" "NaN" "Inf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter26# #argv <- list(FALSE, useSource = TRUE);as.character(argv[[1]],argv[[2]]); [1] "FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter27# #argv <- list(structure(c(1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, NA, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 2L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, NA, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, NA, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 2L, NA, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L), .Label = c('0', '1'), class = 'factor'));as.character(argv[[1]]); [1] "0" "0" "0" "0" "0" "0" "1" "0" "0" "0" "1" "1" "0" "0" "0" "0" "0" "0" [19] "0" "0" "0" "0" "0" "0" "0" "0" "0" "0" "0" "0" "0" "0" "0" "1" "0" "0" [37] "0" "0" NA "0" "0" "0" "1" "0" "0" "0" "0" "0" "0" "0" "0" "0" "0" "0" [55] "0" "1" "0" "0" "0" "1" "0" "0" "0" "1" "1" "0" "0" "1" "0" "1" "0" "0" [73] "0" "0" "0" "0" NA "0" "0" "0" "1" "1" "0" "0" "0" "0" "0" "0" "0" "1" [91] "0" "0" "0" "0" "0" "0" "0" "0" "1" "0" "0" "0" NA "0" "0" "1" "0" "0" [109] "0" "0" "0" "0" "0" "0" "0" "1" "0" "0" "0" "0" "1" NA "0" "0" "0" "1" [127] "0" "0" "0" "1" "0" "0" "0" "0" "0" "0" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter28# #argv <- list(structure(c(11323, 11330, 11337, 11344, 11351, 11358, 11365, 11372, 11379, 11386), class = 'Date'));as.character(argv[[1]]); [1] "2001-01-01" "2001-01-08" "2001-01-15" "2001-01-22" "2001-01-29" [6] "2001-02-05" "2001-02-12" "2001-02-19" "2001-02-26" "2001-03-05" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter29# #argv <- list(structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Dim = c(10L, 2L)));as.character(argv[[1]]); [1] "1" "1" "1" "1" "1" "1" "1" "1" "1" "1" "2" "2" "2" "2" "2" "2" "2" "2" "2" [20] "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter3# #argv <- list(c(2L, 1L, NA));as.character(argv[[1]]); [1] "2" "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter30# #argv <- list(c(FALSE, FALSE, FALSE, FALSE, NA, FALSE, FALSE, FALSE, FALSE, NA, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, NA, NA, NA, FALSE, FALSE, TRUE, FALSE, NA, NA, NA, NA, NA, NA, FALSE, NA, FALSE, FALSE, NA, NA, FALSE, NA, NA, FALSE, FALSE, FALSE, FALSE, FALSE, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, TRUE, FALSE, FALSE, NA, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, NA, FALSE, FALSE, NA, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, NA, NA, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, NA, NA, FALSE, FALSE, FALSE, NA, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, NA, FALSE, TRUE, FALSE, NA, FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, NA, FALSE, FALSE, FALSE));as.character(argv[[1]]); [1] "FALSE" "FALSE" "FALSE" "FALSE" NA "FALSE" "FALSE" "FALSE" "FALSE" [10] NA "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" [19] "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" NA NA NA [28] "FALSE" "FALSE" "TRUE" "FALSE" NA NA NA NA NA [37] NA "FALSE" NA "FALSE" "FALSE" NA NA "FALSE" NA [46] NA "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" NA NA NA [55] NA NA NA NA NA NA NA "TRUE" "FALSE" [64] "FALSE" NA "FALSE" "FALSE" "FALSE" "TRUE" "TRUE" "TRUE" NA [73] "FALSE" "FALSE" NA "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" [82] "FALSE" NA NA "FALSE" "TRUE" "FALSE" "FALSE" "TRUE" "FALSE" [91] "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "TRUE" [100] "TRUE" "TRUE" NA NA "FALSE" "FALSE" "FALSE" NA "FALSE" [109] "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" NA "FALSE" "TRUE" [118] "FALSE" NA "FALSE" "TRUE" "TRUE" "TRUE" "TRUE" "FALSE" "FALSE" [127] "TRUE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" [136] "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" [145] "FALSE" "FALSE" "FALSE" "FALSE" "FALSE" NA "FALSE" "FALSE" "FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter31# #argv <- list(structure(c(1338523200, 1338609600, 1338696000, 1338782400, 1338868800, 1338955200, 1339041600), class = c('POSIXct', 'POSIXt'), tzone = ''));as.character(argv[[1]]); [1] "2012-06-01 04:00:00" "2012-06-02 04:00:00" "2012-06-03 04:00:00" [4] "2012-06-04 04:00:00" "2012-06-05 04:00:00" "2012-06-06 04:00:00" [7] "2012-06-07 04:00:00" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter32# #argv <- list(structure(1:4, class = 'roman'));as.character(argv[[1]]); [1] "I" "II" "III" "IV" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter33# #argv <- list(logical(0));as.character(argv[[1]]); character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter34# #argv <- list(structure(c(1104537600, 1107216000, 1109635200, 1112313600, 1114905600, 1117584000, 1120176000, 1122854400, 1125532800, 1128124800, 1130803200, 1133395200, 1136073600, 1138752000, 1141171200, 1143849600, 1146441600, 1149120000, 1151712000, 1154390400, 1157068800, 1159660800, 1162339200, 1164931200, 1167609600, 1170288000, 1172707200, 1175385600, 1177977600, 1180656000, 1183248000, 1185926400, 1188604800, 1191196800, 1193875200, 1196467200, 1199145600, 1201824000, 1204329600, 1207008000, 1209600000, 1212278400, 1214870400, 1217548800, 1220227200, 1222819200, 1225497600, 1228089600, 1230768000), class = c('POSIXct', 'POSIXt'), tzone = 'UTC'));as.character(argv[[1]]); [1] "2005-01-01" "2005-02-01" "2005-03-01" "2005-04-01" "2005-05-01" [6] "2005-06-01" "2005-07-01" "2005-08-01" "2005-09-01" "2005-10-01" [11] "2005-11-01" "2005-12-01" "2006-01-01" "2006-02-01" "2006-03-01" [16] "2006-04-01" "2006-05-01" "2006-06-01" "2006-07-01" "2006-08-01" [21] "2006-09-01" "2006-10-01" "2006-11-01" "2006-12-01" "2007-01-01" [26] "2007-02-01" "2007-03-01" "2007-04-01" "2007-05-01" "2007-06-01" [31] "2007-07-01" "2007-08-01" "2007-09-01" "2007-10-01" "2007-11-01" [36] "2007-12-01" "2008-01-01" "2008-02-01" "2008-03-01" "2008-04-01" [41] "2008-05-01" "2008-06-01" "2008-07-01" "2008-08-01" "2008-09-01" [46] "2008-10-01" "2008-11-01" "2008-12-01" "2009-01-01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter35# #argv <- list(c(-4, 4, 3.99, -1, -3.01));as.character(argv[[1]]); [1] "-4" "4" "3.99" "-1" "-3.01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter36# #argv <- list(list(exit.code = 0L, send = NULL));as.character(argv[[1]]); [1] "0" "NULL" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter37# #argv <- list(c(34L, -45L));as.character(argv[[1]]); [1] "34" "-45" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter38# #argv <- list(structure(c(978307200, 978912000, 979516800, 980121600, 980726400, 981331200, 981936000, 982540800, 983145600, 983750400), class = c('POSIXct', 'POSIXt'), tzone = 'GMT'));as.character(argv[[1]]); [1] "2001-01-01" "2001-01-08" "2001-01-15" "2001-01-22" "2001-01-29" [6] "2001-02-05" "2001-02-12" "2001-02-19" "2001-02-26" "2001-03-05" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter39# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));as.character(argv[[1]],argv[[2]]); [1] "integer(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter4# #argv <- list(c('### Encoding: UTF-8', '', '### Name: text', '### Title: Add Text to a Plot', '### Aliases: text text.default', '### Keywords: aplot', '', '### ** Examples', '', 'plot(-1:1, -1:1, type = \'n\', xlab = \'Re\', ylab = \'Im\')', 'K <- 16; text(exp(1i * 2 * pi * (1:K) / K), col = 2)', '', '## The following two examples use latin1 characters: these may not', '## appear correctly (or be omitted entirely).', 'plot(1:10, 1:10, main = \'text(...) examples\\n~~~~~~~~~~~~~~\',', ' sub = \'R is GNU ©, but not ® ...\')', 'mtext(\'«Latin-1 accented chars»: éè øØ å<Å æ<Æ\', side = 3)', 'points(c(6,2), c(2,1), pch = 3, cex = 4, col = \'red\')', 'text(6, 2, \'the text is CENTERED around (x,y) = (6,2) by default\',', ' cex = .8)', 'text(2, 1, \'or Left/Bottom - JUSTIFIED at (2,1) by \'adj = c(0,0)\'\',', ' adj = c(0,0))', 'text(4, 9, expression(hat(beta) == (X^t * X)^{-1} * X^t * y))', 'text(4, 8.4, \'expression(hat(beta) == (X^t * X)^{-1} * X^t * y)\',', ' cex = .75)', 'text(4, 7, expression(bar(x) == sum(frac(x[i], n), i==1, n)))', '', '## Two more latin1 examples', 'text(5, 10.2,', ' \'Le français, c\'est façile: Règles, Liberté, Egalité, Fraternité...\')', 'text(5, 9.8,', ' \'Jetz no chli züritüütsch: (noch ein bißchen Zürcher deutsch)\')', '', '', ''));as.character(argv[[1]]); [1] "### Encoding: UTF-8" [2] "" [3] "### Name: text" [4] "### Title: Add Text to a Plot" [5] "### Aliases: text text.default" [6] "### Keywords: aplot" [7] "" [8] "### ** Examples" [9] "" [10] "plot(-1:1, -1:1, type = 'n', xlab = 'Re', ylab = 'Im')" [11] "K <- 16; text(exp(1i * 2 * pi * (1:K) / K), col = 2)" [12] "" [13] "## The following two examples use latin1 characters: these may not" [14] "## appear correctly (or be omitted entirely)." [15] "plot(1:10, 1:10, main = 'text(...) examples\\n~~~~~~~~~~~~~~'," [16] " sub = 'R is GNU ©, but not ® ...')" [17] "mtext('«Latin-1 accented chars»: éè øØ å<Å æ<Æ', side = 3)" [18] "points(c(6,2), c(2,1), pch = 3, cex = 4, col = 'red')" [19] "text(6, 2, 'the text is CENTERED around (x,y) = (6,2) by default'," [20] " cex = .8)" [21] "text(2, 1, 'or Left/Bottom - JUSTIFIED at (2,1) by 'adj = c(0,0)''," [22] " adj = c(0,0))" [23] "text(4, 9, expression(hat(beta) == (X^t * X)^{-1} * X^t * y))" [24] "text(4, 8.4, 'expression(hat(beta) == (X^t * X)^{-1} * X^t * y)'," [25] " cex = .75)" [26] "text(4, 7, expression(bar(x) == sum(frac(x[i], n), i==1, n)))" [27] "" [28] "## Two more latin1 examples" [29] "text(5, 10.2," [30] " 'Le français, c'est façile: Règles, Liberté, Egalité, Fraternité...')" [31] "text(5, 9.8," [32] " 'Jetz no chli züritüütsch: (noch ein bißchen Zürcher deutsch)')" [33] "" [34] "" [35] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter40# #argv <- list(structure(list(), class = 'numeric_version'));as.character(argv[[1]]); character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter41# #argv <- list(structure(list(c0 = structure(character(0), class = 'AsIs')), .Names = 'c0', row.names = character(0), class = 'data.frame'));as.character(argv[[1]]); [1] "character(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter42# #argv <- list(structure(c(12784, 13879), class = 'Date'));as.character(argv[[1]]); [1] "2005-01-01" "2008-01-01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter43# #argv <- list(NaN);as.character(argv[[1]]); [1] "NaN" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter44# #argv <- list(Inf);as.character(argv[[1]]); [1] "Inf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter45# #argv <- list(c('class', 'names', 'package'));as.character(argv[[1]]); [1] "class" "names" "package" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter46# #argv <- list(c(59.5, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59.5));as.character(argv[[1]]); [1] "59.5" "1" "2" "3" "4" "5" "6" "7" "8" "9" [11] "10" "11" "12" "13" "14" "15" "16" "17" "18" "19" [21] "20" "21" "22" "23" "24" "25" "26" "27" "28" "29" [31] "30" "31" "32" "33" "34" "35" "36" "37" "38" "39" [41] "40" "41" "42" "43" "44" "45" "46" "47" "48" "49" [51] "50" "51" "52" "53" "54" "55" "56" "57" "58" "59.5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter5# #argv <- list(structure(1395082040.29392, class = c('POSIXct', 'POSIXt')));as.character(argv[[1]]); [1] "2014-03-17 18:47:20" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter6# #argv <- list(structure(2:3, .Label = c('C', 'A', 'B'), class = 'factor'));as.character(argv[[1]]); [1] "A" "B" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter7# #argv <- list(structure(1:255, class = 'octmode'));as.character(argv[[1]]); [1] "001" "002" "003" "004" "005" "006" "007" "010" "011" "012" "013" "014" [13] "015" "016" "017" "020" "021" "022" "023" "024" "025" "026" "027" "030" [25] "031" "032" "033" "034" "035" "036" "037" "040" "041" "042" "043" "044" [37] "045" "046" "047" "050" "051" "052" "053" "054" "055" "056" "057" "060" [49] "061" "062" "063" "064" "065" "066" "067" "070" "071" "072" "073" "074" [61] "075" "076" "077" "100" "101" "102" "103" "104" "105" "106" "107" "110" [73] "111" "112" "113" "114" "115" "116" "117" "120" "121" "122" "123" "124" [85] "125" "126" "127" "130" "131" "132" "133" "134" "135" "136" "137" "140" [97] "141" "142" "143" "144" "145" "146" "147" "150" "151" "152" "153" "154" [109] "155" "156" "157" "160" "161" "162" "163" "164" "165" "166" "167" "170" [121] "171" "172" "173" "174" "175" "176" "177" "200" "201" "202" "203" "204" [133] "205" "206" "207" "210" "211" "212" "213" "214" "215" "216" "217" "220" [145] "221" "222" "223" "224" "225" "226" "227" "230" "231" "232" "233" "234" [157] "235" "236" "237" "240" "241" "242" "243" "244" "245" "246" "247" "250" [169] "251" "252" "253" "254" "255" "256" "257" "260" "261" "262" "263" "264" [181] "265" "266" "267" "270" "271" "272" "273" "274" "275" "276" "277" "300" [193] "301" "302" "303" "304" "305" "306" "307" "310" "311" "312" "313" "314" [205] "315" "316" "317" "320" "321" "322" "323" "324" "325" "326" "327" "330" [217] "331" "332" "333" "334" "335" "336" "337" "340" "341" "342" "343" "344" [229] "345" "346" "347" "350" "351" "352" "353" "354" "355" "356" "357" "360" [241] "361" "362" "363" "364" "365" "366" "367" "370" "371" "372" "373" "374" [253] "375" "376" "377" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter8# #argv <- list(c(Inf, -Inf, NaN, NA));as.character(argv[[1]]); [1] "Inf" "-Inf" "NaN" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacter.testascharacter9# #argv <- list(c(1, 2, NA, 2));as.character(argv[[1]]); [1] "1" "2" NA "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacterfactor.testascharacterfactor1# #argv <- structure(list(x = structure(c(1L, 2L, NA), .Label = c('AB', 'CD'), class = 'factor')), .Names = 'x');do.call('as.character.factor', argv) [1] "AB" "CD" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascharacterfactor.testascharacterfactor1# #f <- structure(c(3L, 1L, 2L, 3L), 'levels' = c('a', NA_character_, 'c'), class = 'factor'); print(f) [1] c a c Levels: a c ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.noCopyCheck# #if (!any(R.version$engine == "FastR")) { [1] TRUE } else { { x <- c(1+2i, 3.5+3i); .fastr.identity(x) == .fastr.identity(as.complex(x)); } } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex#Ignored.ImplementationError# #{ as.complex("+.1e+2-3i") } [1] 10-3i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex("-.1e10+5i") } [1] -1e+09+0e+00i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex("-1+5i") } [1] -1+5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex("-1-5i") } [1] -1-5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex("0x42") } [1] 66+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex#Ignored.ImplementationError# #{ as.complex("1e-2+3i") } [1] 0.01+3i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex("1e10+5i") } [1] 1e+10+0e+00i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex("Inf") } [1] Inf+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex("NaN") } [1] NaN+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex('1+5i') } [1] 1+5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex('TRUE') } [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex() } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex(0) } [1] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex(0/0) } [1] NaN+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex(NULL) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex(TRUE) } [1] 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex(c('1', NA_character_)) } [1] 1+0i NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex(c('1','hello')) } [1] 1+0i NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex(c('1+5i', '1+5i')) } [1] 1+5i 1+5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex(c(0/0, 0/0)) } [1] NaN+0i NaN+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex(c(1, NA)) } [1] 1+0i NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex#Output.IgnoreWarningContext# #{ as.complex(list("foo")) } [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex(list(42)) } [1] 42+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex#Output.IgnoreErrorContext# #{ as.complex(list(NULL)) } Error: 'list' object cannot be coerced to type 'complex' ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ as.complex.cls <- function(x) 42; as.complex(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ f <- function() as.complex('aaa'); f() } [1] NA Warning message: In f() : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ f1 <- function() {f<- function() as.complex('aaa'); f()}; f1() } [1] NA Warning message: In f() : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ x<-c(a=1.1, b=2.2); dim(x)<-c(1,2); attr(x, "foo")<-"foo"; y<-as.complex(x); attributes(y) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testAsComplex# #{ x<-c(a=1L, b=2L); dim(x)<-c(1,2); attr(x, "foo")<-"foo"; y<-as.complex(x); attributes(y) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testSideEffect# #{ x <- c(1, 2, 3); f <- function() { x[1] <<- 10; 2 }; as.complex(x, f()) } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex1# #argv <- list(logical(0), logical(0));as.complex(argv[[1]],argv[[2]]); complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex10# #argv <- list(structure(list(a = 1), .Names = 'a'));as.complex(argv[[1]]); [1] 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex11# #argv <- list(NULL, NULL);as.complex(argv[[1]],argv[[2]]); complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex2# #argv <- list(FALSE, FALSE);as.complex(argv[[1]],argv[[2]]); [1] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex3#Output.IgnoreWarningMessage# #argv <- list(' ');as.complex(argv[[1]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex4# #argv <- list(structure(c(-0.626453810742332, 0.183643324222082, -0.835628612410047, 1.59528080213779, 0.329507771815361, -0.820468384118015, 0.487429052428485, 0.738324705129217, 0.575781351653492, -0.305388387156356, 1.51178116845085, 0.389843236411431, -0.621240580541804, -2.2146998871775, 1.12493091814311, -0.0449336090152309, -0.0161902630989461, 0.943836210685299, 0.821221195098089, 0.593901321217509, 0.918977371608218, 0.782136300731067, 0.0745649833651906, -1.98935169586337, 0.61982574789471), .Dim = c(5L, 5L), .Dimnames = list(c('1', '2', '3', '4', '5'), c('a', 'b', 'c', 'd', 'e'))));as.complex(argv[[1]]); [1] -0.62645381+0i 0.18364332+0i -0.83562861+0i 1.59528080+0i 0.32950777+0i [6] -0.82046838+0i 0.48742905+0i 0.73832471+0i 0.57578135+0i -0.30538839+0i [11] 1.51178117+0i 0.38984324+0i -0.62124058+0i -2.21469989+0i 1.12493092+0i [16] -0.04493361+0i -0.01619026+0i 0.94383621+0i 0.82122120+0i 0.59390132+0i [21] 0.91897737+0i 0.78213630+0i 0.07456498+0i -1.98935170+0i 0.61982575+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex5# #argv <- list('1.3');as.complex(argv[[1]]); [1] 1.3+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex6# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));as.complex(argv[[1]],argv[[2]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex7# #argv <- list(NA_complex_);as.complex(argv[[1]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex8# #argv <- list(integer(0));as.complex(argv[[1]]); complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ascomplex.testascomplex9# #argv <- list(1L);as.complex(argv[[1]]); [1] 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdataframe.testWithDimnames# #{ v1 <- matrix(rep(1.1, 16), 4, 4, dimnames=list(c('a', 'b', 'c', 'd'), c('e', 'f', 'g', 'h'))); v0 <- matrix(rep(1.2, 16), 4, 4, dimnames=list(1L:4L, c('e', 'f', 'g', 'h'))); as.data.frame(v1); as.data.frame(v0) } e f g h 1 1.2 1.2 1.2 1.2 2 1.2 1.2 1.2 1.2 3 1.2 1.2 1.2 1.2 4 1.2 1.2 1.2 1.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdataframe.testasdataframe1# #argv <- structure(list(x = structure(c(3.5, 2, 1.7, 0.40625, 0.5, 0.882, 4, 2, 2, 4, 2, 3, 0.625, 0.5, 0.444444444444444, 0, 0, 0.333333333333333, 0.833333333333333, 1, 0.333333333333333, 0.5, 0.666666666666667, 0.666666666666667, 0.166666666666667, 0, 0.5), .Dim = c(3L, 9L), .Dimnames = list(c('q1.csv', 'q2.csv', 'q3.csv'), c('effsize', 'constraint', 'outdegree', 'indegree', 'efficiency', 'hierarchy', 'centralization', 'gden', 'ego.gden')))), .Names = 'x');do.call('as.data.frame', argv) effsize constraint outdegree indegree efficiency hierarchy q1.csv 3.5 0.40625 4 4 0.6250000 0.0000000 q2.csv 2.0 0.50000 2 2 0.5000000 0.0000000 q3.csv 1.7 0.88200 2 3 0.4444444 0.3333333 centralization gden ego.gden q1.csv 0.8333333 0.5000000 0.1666667 q2.csv 1.0000000 0.6666667 0.0000000 q3.csv 0.3333333 0.6666667 0.5000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdataframetable.testasdataframetable1# #argv <- structure(list(x = structure(integer(0), .Dim = 0L, .Dimnames = structure(list(NULL), .Names = ''), class = 'table')), .Names = 'x');do.call('as.data.frame.table', argv) [1] Freq <0 rows> (or 0-length row.names) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdifftime.testasdifftime1# #argv <- structure(list(tim = c('0:3:20', '11:23:15')), .Names = 'tim');do.call('as.difftime', argv) Time differences in mins [1] 3.333333 683.250000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdifftime.testasdifftime2# #argv <- structure(list(tim = c('3:20', '23:15', '2:'), format = '%H:%M'), .Names = c('tim', 'format'));do.call('as.difftime', argv) Time differences in hours [1] 3.333333 23.250000 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.noCopyCheck# #if (!any(R.version$engine == "FastR")) { [1] TRUE } else { { x <- c(1, 3.5); .fastr.identity(x) == .fastr.identity(as.double(x)); } } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #as.double(' <<>> +Inf <<>> ') [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #as.double(' <<>> +NaN <<>> ') [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #as.double(' <<>> -Inf <<>> ') [1] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #as.double(' <<>> -NaN <<>> ') [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #as.double(' <<>> Inf <<>> ') [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #as.double(' <<>> NaN <<>> ') [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #as.double('- Inf') [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ as.double("1.27") } [1] 1.27 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ as.double('TRUE') } [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ as.double() } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ as.double(10+2i) } [1] 10 Warning message: imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ as.double(1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ as.double(NULL) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ as.double(as.raw(1)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ as.double(c('1','hello')) } [1] 1 NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ as.double(c(3+3i, 4+4i)) } [1] 3 4 Warning message: imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ as.double.cls <- function(x) 42; as.double(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ f <- function() as.double('aaa'); f() } [1] NA Warning message: In f() : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ f <- function() as.numeric('aaa'); f() } [1] NA Warning message: In f() : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ f1 <- function() {f<- function() as.double('aaa'); f()}; f1() } [1] NA Warning message: In f() : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ x<-c(a=1.1, b=2.2); dim(x)<-c(1,2); attr(x, "foo")<-"foo"; y<-as.double(x); attributes(y) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ x<-c(a=1L, b=2L); dim(x)<-c(1,2); attr(x, "foo")<-"foo"; y<-as.double(x); attributes(y) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testAsDouble# #{ y <- c(3.1, 3.2); attr(y, 'someAttr') <- 'someValue'; x <- as.double(y); x[[1]] <- 42; y } [1] 3.1 3.2 attr(,"someAttr") [1] "someValue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble1# #argv <- list(c(3.14159265358979, 3.14159265358981, 3.14159265358981, 3.14159265358981, 3.14159265358978, 3.1415926535898, 3.1415926535898, 3.14159265358978, 3.14159265358981, 3.14159265358979, 3.14159265358979, 3.14159265358978, 3.14159265358979, 3.14159265358981, 3.1415926535898, 3.14159265358978, 3.14159265358978, 3.14159265358978, 3.14159265358978, 3.14159265358981, 3.14159265358981, 3.14159265358978, 3.14159265358979, 3.14159265358978, 3.14159265358978, 3.14159265358978, 3.1415926535898, 3.14159265358977, 3.14159265358979, 3.14159265358979, 3.1415926535898, 3.14159265358979, 3.1415926535898, 3.14159265358979, 3.14159265358979, 3.14159265358981, 3.14159265358978, 3.1415926535898, 3.14159265358979, 3.14159265358981, 3.1415926535898, 3.14159265358981, 3.14159265358978, 3.1415926535898, 3.14159265358981, 3.1415926535898, 3.14159265358978, 3.14159265358979, 3.14159265358978, 3.14159265358979, 3.1415926535898, 3.14159265358981, 3.14159265358978, 3.1415926535898, 3.14159265358979, 3.1415926535898, 3.14159265358978, 3.1415926535898, 3.14159265358978, 3.14159265358979, 3.1415926535898, 3.14159265358978, 3.1415926535898, 3.14159265358981, 3.14159265358977, 3.14159265358981, 3.14159265358978, 3.14159265358978, 3.14159265358981, 3.14159265358979, 3.14159265358977, 3.14159265358978, 3.14159265358981, 3.14159265358979, 3.14159265358981, 3.1415926535898, 3.14159265358979, 3.14159265358979, 3.1415926535898, 3.14159265358979, 3.14159265358981, 3.14159265358979, 3.14159265358979, 3.14159265358981, 3.14159265358977, 3.1415926535898, 3.14159265358979, 3.1415926535898, 3.14159265358979, 3.1415926535898, 3.1415926535898, 3.1415926535898, 3.14159265358978, 3.1415926535898, 3.1415926535898, 3.1415926535898, 3.14159265358981, 3.14159265358979, 3.14159265358978, 3.14159265358981, 3.14159265358981));as.double(argv[[1]]); [1] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [9] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [17] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [25] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [33] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [41] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [49] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [57] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [65] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [73] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [81] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [89] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [97] 3.141593 3.141593 3.141593 3.141593 3.141593 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble10# #argv <- list(structure(c(1, 2, 3, 4, 5, 0, 7, 8, 9, 10, 11, 12), .Dim = c(4L, 3L)));as.double(argv[[1]]); [1] 1 2 3 4 5 0 7 8 9 10 11 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble11# #argv <- list(c(NA, '0.0021'));as.double(argv[[1]]); [1] NA 0.0021 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble12# #argv <- list(character(0));as.double(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble13# #argv <- list(structure(c(21, 16.4, 18.7, 16.8, 17.8, 10.9, 14, 3.5, 4.3, 3.5, 2.7, 6, 14, 2.3), .Dim = c(7L, 2L), .Dimnames = list(c('L', 'NL', 'D', 'B', 'F', 'IRL', 'UK'), c('x', 'y'))));as.double(argv[[1]]); [1] 21.0 16.4 18.7 16.8 17.8 10.9 14.0 3.5 4.3 3.5 2.7 6.0 14.0 2.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble14# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707712e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.96881154539801e-173, 0, 8.23599653846971e-150, 0, 0, 0, 0, 6.51733217171342e-10, 0, 2.36840184577368e-67, 0, 9.43484083575241e-307, 0, 1.59959906013772e-89, 0, 8.73836857865035e-286, 7.09716190970993e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044552e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.07028772732371e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.75227273320951e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));as.double(argv[[1]]); [1] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [6] 1.753688e-134 0.000000e+00 0.000000e+00 0.000000e+00 2.604776e-251 [11] 1.164850e-260 0.000000e+00 1.531604e-322 3.333314e-01 0.000000e+00 [16] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [21] 0.000000e+00 0.000000e+00 0.000000e+00 3.441613e-123 0.000000e+00 [26] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [31] 0.000000e+00 0.000000e+00 0.000000e+00 1.968812e-173 0.000000e+00 [36] 8.235997e-150 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [41] 6.517332e-10 0.000000e+00 2.368402e-67 0.000000e+00 9.434841e-307 [46] 0.000000e+00 1.599599e-89 0.000000e+00 8.738369e-286 7.097162e-54 [51] 0.000000e+00 0.000000e+00 0.000000e+00 1.530425e-274 8.575901e-14 [56] 3.333331e-01 0.000000e+00 0.000000e+00 1.368952e-199 2.022610e-177 [61] 5.504454e-42 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [66] 1.078464e-44 1.886055e-186 1.091561e-26 0.000000e+00 3.070288e-124 [71] 3.333332e-01 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [76] 0.000000e+00 0.000000e+00 3.098161e-94 0.000000e+00 0.000000e+00 [81] 4.752273e-272 0.000000e+00 0.000000e+00 2.300933e-06 0.000000e+00 [86] 0.000000e+00 1.270828e-274 0.000000e+00 0.000000e+00 0.000000e+00 [91] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 4.566203e-65 [96] 0.000000e+00 2.779959e-149 0.000000e+00 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble15# #argv <- list(structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L), .Label = c('WinF', 'WinNF', 'Veh', 'Con', 'Tabl', 'Head'), class = 'factor'));as.double(argv[[1]]); [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 [38] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 2 2 2 2 [75] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [112] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 3 3 [149] 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 4 4 4 4 4 4 4 4 4 4 4 4 4 5 5 5 5 5 5 5 5 5 [186] 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble16# #argv <- list(structure(28, units = 'days', class = 'difftime'), units = 'secs');as.double(argv[[1]],argv[[2]]); [1] 2419200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble17# #argv <- list(structure(c(0, 0.000202660677936876, 0.00241803309686265, 0.00307283986031733, 0.00265711006681184, 0.00284334291579362, 0.00328411981940272, 0.00355926216704063, 0.00344761438149018, 0.00289210744006633, 0.00204225708046235, 0.00178504641867207, 0.00172572372502035, 0.00159946455058003, 0.00194868716238274, 0.00230753595074067, 0.00246954915831488, 0.00290833971278575, 0.00337412960419987, 0.00358181270769781, 0.00354428559372645, 0.00326334045783046, 0.00298117073292367, 0.00293436142844913, 0.0029459867318606, 0.00298412396438805, 0.00320781989229225, 0.00342867445796099, 0.00405369787195761, 0.00417753179826535, 0.00414267894375602, 0.00407024400729904, 0.00393965520892809, 0.00385238230694322, 0.00383595140804293, 0.00378781523717584, 0.0037736404476557, 0.00382248725149436, 0.00381326514145668, 0.0038973026728862, 0.00395676065396717, 0.00431861015154494, 0.00443079015716877, 0.00450544753584657, 0.00439372971759073, 0.00433442297069524, 0.00429954456230782, 0.00426944313801568, 0.00423795462806802, 0.00417472474765742, 0.0042795282659813, 0.00454163385850258, 0.00473601380444899, 0.00466407336984038, 0.00462392764582444, 0.00456056187379283, 0.0045055003087985, 0.00442670076624794, 0.00431121205766447, 0.00421990442925801, 0.00416971729251421, 0.00407853686842565, 0.00409133004830999, 0.0041364805798209, 0.00427208054940612, 0.0044573146303062, 0.00463786827882152, 0.00462599613024964, 0.00456902544608922, 0.00448500474247415, 0.00443631355776013, 0.0043987926301962, 0.00439976139365821, 0.00444739366229557, 0.00441357461857941, 0.00445091952164202, 0.00450346393728121, 0.00462169457996522, 0.004734024297345, 0.00475873200245829, 0.00475253573403064, 0.00471631526131182, 0.00465515282727091, 0.00464698887217466, 0.00462685789718263, 0.00462996361305565, 0.00464191147874474, 0.00464879307071608, 0.00469113571839472, 0.00476270873398438, 0.00477314235918783, 0.00479544142345609, 0.0047737904084596, 0.00471999826644103, 0.00469372169840419, 0.0046463488677134, 0.00461799759453906, 0.00458947682120691, 0.00460912357592989, 0.00463333675159159, 0.00466732307616235, 0.00471231441093801, 0.00474022677208645, 0.00477297287765633, 0.00476766819213148, 0.00473849505147981, 0.00469782534032621, 0.00463861048753855, 0.00457840111456501, 0.00452291229235016, 0.00446341204452307, 0.00442002128896248, 0.00442991931450486, 0.00446688166198173, 0.00452411449686222, 0.00458536543416883, 0.00454175859707822, 0.00450829288322652, 0.00445725707512455, 0.00439091360820385, 0.00437267387139272, 0.00436951404759565, 0.00439586780117785, 0.00443132731253063, 0.00447997483459774, 0.00446916178054371, 0.00448357738281654, 0.00448976052744213, 0.00450610513067692, 0.00449385388080097, 0.00448875792730345, 0.00450025038413588, 0.00448200635475038, 0.00445933490412089, 0.00437269614488144, 0.00441152247400175, 0.00444283816260407, 0.00446748686328766, 0.00448539598299297, 0.00445924890176085, 0.00444386385593038, 0.00445984197910477, 0.00443574296742794, 0.00440036042966077), .Tsp = c(1949, 1960.91666666667, 12), class = 'ts'));as.double(argv[[1]]); [1] 0.0000000000 0.0002026607 0.0024180331 0.0030728399 0.0026571101 [6] 0.0028433429 0.0032841198 0.0035592622 0.0034476144 0.0028921074 [11] 0.0020422571 0.0017850464 0.0017257237 0.0015994646 0.0019486872 [16] 0.0023075360 0.0024695492 0.0029083397 0.0033741296 0.0035818127 [21] 0.0035442856 0.0032633405 0.0029811707 0.0029343614 0.0029459867 [26] 0.0029841240 0.0032078199 0.0034286745 0.0040536979 0.0041775318 [31] 0.0041426789 0.0040702440 0.0039396552 0.0038523823 0.0038359514 [36] 0.0037878152 0.0037736404 0.0038224873 0.0038132651 0.0038973027 [41] 0.0039567607 0.0043186102 0.0044307902 0.0045054475 0.0043937297 [46] 0.0043344230 0.0042995446 0.0042694431 0.0042379546 0.0041747247 [51] 0.0042795283 0.0045416339 0.0047360138 0.0046640734 0.0046239276 [56] 0.0045605619 0.0045055003 0.0044267008 0.0043112121 0.0042199044 [61] 0.0041697173 0.0040785369 0.0040913300 0.0041364806 0.0042720805 [66] 0.0044573146 0.0046378683 0.0046259961 0.0045690254 0.0044850047 [71] 0.0044363136 0.0043987926 0.0043997614 0.0044473937 0.0044135746 [76] 0.0044509195 0.0045034639 0.0046216946 0.0047340243 0.0047587320 [81] 0.0047525357 0.0047163153 0.0046551528 0.0046469889 0.0046268579 [86] 0.0046299636 0.0046419115 0.0046487931 0.0046911357 0.0047627087 [91] 0.0047731424 0.0047954414 0.0047737904 0.0047199983 0.0046937217 [96] 0.0046463489 0.0046179976 0.0045894768 0.0046091236 0.0046333368 [101] 0.0046673231 0.0047123144 0.0047402268 0.0047729729 0.0047676682 [106] 0.0047384951 0.0046978253 0.0046386105 0.0045784011 0.0045229123 [111] 0.0044634120 0.0044200213 0.0044299193 0.0044668817 0.0045241145 [116] 0.0045853654 0.0045417586 0.0045082929 0.0044572571 0.0043909136 [121] 0.0043726739 0.0043695140 0.0043958678 0.0044313273 0.0044799748 [126] 0.0044691618 0.0044835774 0.0044897605 0.0045061051 0.0044938539 [131] 0.0044887579 0.0045002504 0.0044820064 0.0044593349 0.0043726961 [136] 0.0044115225 0.0044428382 0.0044674869 0.0044853960 0.0044592489 [141] 0.0044438639 0.0044598420 0.0044357430 0.0044003604 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble18# #argv <- list(c(0.0099, 0.099, 0.99, 9.9, 99, 990, 9900, 99000, 990000, 9900000, 9.9e+07, 9.9e+08, 9.9e+09, 9.9e+10));as.double(argv[[1]]); [1] 9.9e-03 9.9e-02 9.9e-01 9.9e+00 9.9e+01 9.9e+02 9.9e+03 9.9e+04 9.9e+05 [10] 9.9e+06 9.9e+07 9.9e+08 9.9e+09 9.9e+10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble19# #argv <- list(structure(180.958333333333, units = 'days', class = 'difftime'), units = 'secs');as.double(argv[[1]],argv[[2]]); [1] 15634800 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble2# #argv <- list(c('10', '2.7404', '0.27404', ''));as.double(argv[[1]]); [1] 10.00000 2.74040 0.27404 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble20# #argv <- list(NULL);as.double(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble21# #argv <- list(structure(list(foo = 5L, Species = 2L), .Names = c('foo', 'Species'), out.attrs = structure(list(dim = structure(c(6L, 3L), .Names = c('foo', 'Species')), dimnames = structure(list(foo = c('foo=1', 'foo=2', 'foo=3', 'foo=4', 'foo=5', 'foo=6'), Species = c('Species=1', 'Species=2', 'Species=3')), .Names = c('foo', 'Species'))), .Names = c('dim', 'dimnames')), row.names = 11L, class = 'data.frame'));as.double(argv[[1]]); [1] 5 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble22# #argv <- list(c(TRUE, FALSE, TRUE));as.double(argv[[1]]); [1] 1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble23# #argv <- list(c(TRUE, TRUE, FALSE));as.double(argv[[1]]); [1] 1 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble24# #argv <- list(c(NA, NA, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L));as.double(argv[[1]]); [1] NA NA 1 2 3 4 5 6 7 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble25# #argv <- list(structure(c(1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L), .Label = c('Rural Male', 'Rural Female', 'Urban Male', 'Urban Female'), class = 'factor', .Dim = c(5L, 4L)));as.double(argv[[1]]); [1] 1 1 1 1 1 2 2 2 2 2 3 3 3 3 3 4 4 4 4 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble26# #argv <- list(c(NaN, 9.51350769866873, 4.5908437119988, 2.99156898768759, 2.21815954375769, 1.77245385090552, 1.48919224881282, 1.29805533264756, 1.1642297137253, 1.06862870211932, 1));as.double(argv[[1]]); [1] NaN 9.513508 4.590844 2.991569 2.218160 1.772454 1.489192 1.298055 [9] 1.164230 1.068629 1.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble27# #argv <- list(structure(3:5, .Tsp = c(1, 3, 1), class = 'ts'));as.double(argv[[1]]); [1] 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble28# #argv <- list('Inf');as.double(argv[[1]]); [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble29# #argv <- list(c(' 9', ' 3', ' 3', ' 6.761', '156.678', ' 18.327', ' 11.764', '191.64', '323.56', '197.21', '190.64'));as.double(argv[[1]]); [1] 9.000 3.000 3.000 6.761 156.678 18.327 11.764 191.640 323.560 [10] 197.210 190.640 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble3# #argv <- list(structure(4, tzone = 'GMT', units = 'days', class = 'difftime'), units = 'secs');as.double(argv[[1]],argv[[2]]); [1] 345600 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble30# #argv <- list(structure(c(NA, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 35L, 36L, 37L, 38L, 39L, 40L, 41L, 42L, 43L, 44L, 45L, 46L, 47L, 48L, 49L, 50L, 51L, 52L, 53L, 54L, 55L, 56L, 57L, 58L, 59L, 60L, 61L, 62L, 63L, 64L, 65L, 66L, 67L, 68L, 69L, 70L, 71L, 72L, 73L, 74L, 75L, 76L, 77L, 78L, 79L, 80L, 81L, 82L, 83L, 84L, 85L, 86L, 87L, 88L, 89L, 90L, 91L, 92L, 93L, 94L, 95L, 96L, 97L, 98L, 99L, 100L), .Tsp = c(1, 101, 1), class = 'ts'));as.double(argv[[1]]); [1] NA 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 [19] 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 [37] 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 [55] 54 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 [73] 72 73 74 75 76 77 78 79 80 81 82 83 84 85 86 87 88 89 [91] 90 91 92 93 94 95 96 97 98 99 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble32# #argv <- list(NA);do.call('as.double', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble4# #argv <- list('NaN');as.double(argv[[1]]); [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble5# #argv <- list(structure(c(1.97479242156194, 1.71068206679967, 1.52241456554483), .Names = c('Bens of Jura', 'Knock Hill', 'Lairig Ghru')));as.double(argv[[1]]); [1] 1.974792 1.710682 1.522415 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble6# #argv <- list(c(856722023.658297, 302896976.260735, 107090252.958018, 37862122.0336249, 13386281.6212132, 4732765.25626924, 1673285.20557359, 591595.661165903, 209160.656540579, 73949.4659102332, 26145.0937553316, 9243.69976775411, 3268.16009484595, 1155.49552841673, 408.56675987247, 144.503039869403, 51.1642500846007, 18.1945635811076, 6.57944169516568, 2.52146555042134, 1.10249557516018, 0.395623281358704, -0.367112032460934, 0.27396220835345, -0.0693674921217567, 0.0814543296800769, 0.0923699793060252, 0.0504684833914985, -0.0498360425475413, 0.00273531641447061, -0.00392881268836618));as.double(argv[[1]]); [1] 8.567220e+08 3.028970e+08 1.070903e+08 3.786212e+07 1.338628e+07 [6] 4.732765e+06 1.673285e+06 5.915957e+05 2.091607e+05 7.394947e+04 [11] 2.614509e+04 9.243700e+03 3.268160e+03 1.155496e+03 4.085668e+02 [16] 1.445030e+02 5.116425e+01 1.819456e+01 6.579442e+00 2.521466e+00 [21] 1.102496e+00 3.956233e-01 -3.671120e-01 2.739622e-01 -6.936749e-02 [26] 8.145433e-02 9.236998e-02 5.046848e-02 -4.983604e-02 2.735316e-03 [31] -3.928813e-03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble7# #argv <- list(c(1.90069420068965e+68, 1.85614668036113e+65, 1.81264324254072e+62, 1.77015941654582e+59, 1.72867130522891e+56, 1.68815557154536e+53, 1.64858942546521e+50, 1.60995061130567e+47, 1.57221739580551e+44, 1.53536855821758e+41, 1.49938338742443e+38, 1.46424170564914e+35, 1.42992399523352e+32, 1.39641192722393e+29, 1.36369045875401e+26, 1.33175605805513e+23, 1.30064886911081e+20, 127057845771019376, 124241617095379, 121963623349.57, 121618014.278689, 129184.542208039, 178.330555907964, 0.906701004569228, -0.0905266041439205, 0.141777480680994, 0.0921442943441807, 0.0658533118803105, -0.0402995417166551, 0.0244881559995369, -0.0194680918617461));as.double(argv[[1]]); [1] 1.900694e+68 1.856147e+65 1.812643e+62 1.770159e+59 1.728671e+56 [6] 1.688156e+53 1.648589e+50 1.609951e+47 1.572217e+44 1.535369e+41 [11] 1.499383e+38 1.464242e+35 1.429924e+32 1.396412e+29 1.363690e+26 [16] 1.331756e+23 1.300649e+20 1.270578e+17 1.242416e+14 1.219636e+11 [21] 1.216180e+08 1.291845e+05 1.783306e+02 9.067010e-01 -9.052660e-02 [26] 1.417775e-01 9.214429e-02 6.585331e-02 -4.029954e-02 2.448816e-02 [31] -1.946809e-02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble8# #argv <- list(c(3.69420518444359e+25, 2.30887824027777e+24, 1.44304890017492e+23, 9.01905562612606e+21, 5.63690976641081e+20, 35230686042118275072, 2201917878145066496, 137619867512235136, 8601241751556820, 537577617482832, 33598603095309.8, 2099913194115.17, 131244699796.888, 8202825028.58974, 512684387.219832, 32044730.0464007, 2003284.70114408, 125327.674230857, 7863.68742857025, 499.272560819512, 33.2784230289721, 2.7659432263306, 0.488936768533843, -0.282943224311172, 7.32218543045282e-05, -0.00636442868227041, -0.0483709204009262, -0.0704795507649514, 0.0349437746169591, -0.0264830837608839, 0.0200901469411759));as.double(argv[[1]]); [1] 3.694205e+25 2.308878e+24 1.443049e+23 9.019056e+21 5.636910e+20 [6] 3.523069e+19 2.201918e+18 1.376199e+17 8.601242e+15 5.375776e+14 [11] 3.359860e+13 2.099913e+12 1.312447e+11 8.202825e+09 5.126844e+08 [16] 3.204473e+07 2.003285e+06 1.253277e+05 7.863687e+03 4.992726e+02 [21] 3.327842e+01 2.765943e+00 4.889368e-01 -2.829432e-01 7.322185e-05 [26] -6.364429e-03 -4.837092e-02 -7.047955e-02 3.494377e-02 -2.648308e-02 [31] 2.009015e-02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdouble.testasdouble9# #argv <- list(c('-.1', ' 2.7 ', 'B'));as.double(argv[[1]]); [1] -0.1 2.7 NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asdoubledifftime.testasdoubledifftime1# #argv <- structure(list(x = structure(16351.8259046444, units = 'days', class = 'difftime', origin = structure(0, class = c('POSIXct', 'POSIXt'), tzone = 'GMT'))), .Names = 'x');do.call('as.double.difftime', argv) [1] 16351.83 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.fromLanguage# #{ as.expression(parse(text='a+b')[[1]]) } expression(a + b) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.fromLanguage# #{ as.expression(parse(text='a+b+c')[[1]]) } expression(a + b + c) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.noCopyCheck# #if (!any(R.version$engine == "FastR")) { [1] TRUE } else { { x <- as.expression(quote(x+2)); .fastr.identity(x) == .fastr.identity(as.expression(x)); } } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression# #{ as.expression("name") } expression("name") ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression# #{ as.expression(123) } expression(123) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression# #{ as.expression(NULL) } expression(NULL) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression# #{ as.expression(as.raw(1)) } expression(as.raw(0x01)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression#Output.IgnoreWhitespace# #{ as.expression(as.raw(c(0, 1, 2, 127, 128, 255))) } expression(as.raw(0x00), as.raw(0x01), as.raw(0x02), as.raw(0x7f), as.raw(0x80), as.raw(0xff)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression# #{ as.expression(as.symbol(123)) } expression(`123`) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression# #{ as.expression(c(1,2)) } expression(1, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression#Output.IgnoreErrorContext# #{ as.expression(function() {}) } Error in as.vector(x, "expression") : cannot coerce type 'closure' to vector of type 'expression' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression# #{ as.expression(list("x" = 1, "y" = 2)) } expression(x = 1, y = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression# #{ as.expression(list(1,2)) } expression(1, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testAsExpression#Output.IgnoreErrorContext# #{ as.expression(sum) } Error in as.vector(x, "expression") : cannot coerce type 'builtin' to vector of type 'expression' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asexpression.testasexpression1# #argv <- structure(list(x = 1), .Names = 'x');do.call('as.expression', argv) expression(1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction#Output.IgnoreWhitespace# #as.function(c(alist(a=1+14, b=foo(x),c=), quote(a+foo(c)*b))) function (a = 1 + 14, b = foo(x), c) a + foo(c) * b ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction#Output.IgnoreWhitespace# #f <- function() a+foo(c)*b; as.function(c(alist(a=1+14, b=foo(x),c=), body(f))) function (a = 1 + 14, b = foo(x), c) a + foo(c) * b ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction# #foo <- function(x) x*2; as.function(c(alist(a=1+14, b=foo(x),c=), quote(a+foo(c)*b)))(c=3,b=1) [1] 21 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction# #foo <- function(x) x*2; f <- function() a+foo(c)*b; as.function(c(alist(a=1+14, b=foo(x),c=), body(f)))(c=3,b=1) [1] 21 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction# #{ .Internal(as.function.default(alist(a+b), "foo")) } Error: invalid environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction# #{ .Internal(as.function.default(function() 42, parent.frame())) } Error: list argument expected ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction# #{ as.function(alist("foo"))() } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction# #{ as.function(alist(42))() } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction# #{ as.function(alist(42L))() } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction# #{ as.function(alist(7+42i))() } [1] 7+42i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction# #{ as.function(alist(TRUE))() } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asfunction.testasfunction# #{ as.function(alist(as.raw(7)))() } [1] 07 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asin.testTrigExp# #{ asin() } Error in asin() : 0 arguments passed to 'asin' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asin.testTrigExp# #{ asin(0.4) } [1] 0.4115168 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asin.testTrigExp# #{ asin(2+0i) } [1] 1.570796-1.316958i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asin.testTrigExp# #{ asin(c(0.3,0.6,0.9)) } [1] 0.3046927 0.6435011 1.1197695 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asin.testasin1# #argv <- list(c(0.185157057377868, 0.15968866445196, 0.190428414477965, 0.0799378829516562, 0.043979457119882, 0.0348843282121068, 0.0484793103572122, 0.109221220908651, 0.264364324223884, 0.211999913632203, 0.141157385938914, 0.143099951254224, 0.193270515700824, 0.217573738375349, 0.216954681783302, 0.291716047319384, 0.387858840434923, 0.461666520261029, 0.49992310387409, 0.421641232345205, 0.419256648241403, 0.442116045838704, 0.375354272383531, 0.416333612927645, 0.506835005179142, 0.408511923588378, 0.442160540547329, 0.59649385178332, 0.729919018318794, 0.811421169963513, 0.896290688103034, 0.752346465072037, 0.654905104838795, 0.821242494513718, 0.91715624670646, 0.885960209053628));asin(argv[[1]]); [1] 0.18623168 0.16037526 0.19159853 0.08002326 0.04399365 0.03489141 [7] 0.04849832 0.10943955 0.26754474 0.21362094 0.14163041 0.14359290 [13] 0.19449442 0.21932797 0.21869376 0.29602043 0.39830745 0.47987300 [19] 0.52350999 0.43525455 0.43262638 0.45795644 0.38477896 0.42940909 [25] 0.53150931 0.42082315 0.45800605 0.63912559 0.81820347 0.94657961 [31] 1.11133315 0.85161677 0.71405704 0.96358522 1.16088520 1.08856042 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asin.testasin2# #argv <- list(c(2+0i, 2-0.0001i, -2+0i, -2+0.0001i));asin(argv[[1]]); [1] 1.570796-1.316958i 1.570739-1.316958i -1.570796+1.316958i [4] -1.570739+1.316958i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asin.testasin3# #argv <- list(logical(0));asin(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asin.testasin4# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));asin(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_asin.testasin5# #argv <- list(c(0.34345+233i,-0.34345+0.3334i));asin(argv[[1]]); [1] 0.0014740+6.1441913i -0.3298752+0.3454864i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinh.testasinh1# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));asinh(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinh.testasinh2# #argv <- list(FALSE);asinh(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinh.testasinh3# #argv <- list(c(-10.0178749274099, -9.71883514604503, -9.428631115578, -9.14699900083883, -8.87368275970178, -8.60843391030797, -8.35101130516145, -8.10118091189307, -7.85871560049306, -7.62339493681878, -7.39500498218993, -7.17333809888897, -6.95819276139009, -6.74937337314489, -6.54669008875839, -6.34995864139355, -6.15900017524753, -5.9736410829473, -5.79371284771676, -5.61905189017195, -5.44949941960501, -5.28490128962169, -5.12510785800119, -4.96997385065093, -4.81935822953248, -4.67312406443873, -4.53113840850555, -4.39327217734495, -4.25940003168967, -4.12940026344266, -4.00315468502777, -3.88054852194104, -3.76147030840502, -3.64581178603109, -3.53346780539777, -3.42433623045557, -3.31831784567124, -3.21531626582739, -3.11523784839505, -3.01799160839986, -2.92348913570423, -2.83164451463048, -2.74237424585168, -2.65559717047939, -2.57123439627907, -2.48920922594631, -2.40944708737842, -2.33187546587824, -2.25642383822831, -2.18302360857567, -2.1116080460688, -2.04211222419016, -1.97447296172911, -1.90862876534153, -1.84451977364398, -1.78208770279149, -1.72127579348957, -1.66202875939226, -1.60429273683927, -1.54801523588655, -1.49314509258573, -1.43963242246912, -1.38742857519786, -1.33648609033215, -1.2867586541832, -1.23820105770775, -1.19076915540686, -1.1444198251916, -1.0991109291792, -1.05480127538394, -1.01145058026799, -0.969019432118151, -0.927469255215247, -0.886762274763496, -0.84686148254806, -0.807730603289509, -0.769334061664634, -0.731636949963607, -0.6946049963541, -0.658204533723497, -0.622402469070884, -0.587166253420983, -0.55246385223268, -0.518263716275245, -0.484534752945762, -0.451246298001703, -0.41836808768293, -0.385870231197804, -0.353723183548358, -0.321897718669858, -0.290364902860306, -0.25909606847575, -0.22806278786747, -0.19723684753736, -0.166590222487993, -0.13609505074407, -0.105723608022064, -0.0754482825250618, -0.0452415498398571, -0.0150759479134945, 0.015075947913494, 0.0452415498398571, 0.0754482825250618, 0.105723608022064, 0.136095050744069, 0.166590222487993, 0.19723684753736, 0.22806278786747, 0.259096068475749, 0.290364902860306, 0.321897718669858, 0.353723183548358, 0.385870231197804, 0.41836808768293, 0.451246298001702, 0.484534752945762, 0.518263716275245, 0.55246385223268, 0.587166253420983, 0.622402469070883, 0.658204533723497, 0.6946049963541, 0.731636949963607, 0.769334061664634, 0.807730603289509, 0.84686148254806, 0.886762274763496, 0.927469255215247, 0.96901943211815, 1.01145058026799, 1.05480127538394, 1.0991109291792, 1.1444198251916, 1.19076915540686, 1.23820105770775, 1.2867586541832, 1.33648609033215, 1.38742857519786, 1.43963242246912, 1.49314509258573, 1.54801523588655, 1.60429273683927, 1.66202875939226, 1.72127579348957, 1.78208770279149, 1.84451977364398, 1.90862876534153, 1.97447296172911, 2.04211222419016, 2.1116080460688, 2.18302360857567, 2.25642383822831, 2.33187546587824, 2.40944708737842, 2.48920922594631, 2.57123439627907, 2.65559717047939, 2.74237424585168, 2.83164451463048, 2.92348913570423, 3.01799160839985, 3.11523784839505, 3.21531626582738, 3.31831784567124, 3.42433623045557, 3.53346780539777, 3.64581178603109, 3.76147030840502, 3.88054852194104, 4.00315468502777, 4.12940026344266, 4.25940003168967, 4.39327217734494, 4.53113840850555, 4.67312406443873, 4.81935822953248, 4.96997385065093, 5.12510785800119, 5.28490128962168, 5.44949941960501, 5.61905189017195, 5.79371284771676, 5.9736410829473, 6.15900017524753, 6.34995864139355, 6.54669008875838, 6.74937337314489, 6.95819276139008, 7.17333809888896, 7.39500498218993, 7.62339493681878, 7.85871560049306, 8.10118091189307, 8.35101130516145, 8.60843391030797, 8.87368275970177, 9.14699900083883, 9.428631115578, 9.71883514604503, 10.0178749274099));asinh(argv[[1]]); [1] -3.00000000 -2.96984925 -2.93969849 -2.90954774 -2.87939698 -2.84924623 [7] -2.81909548 -2.78894472 -2.75879397 -2.72864322 -2.69849246 -2.66834171 [13] -2.63819095 -2.60804020 -2.57788945 -2.54773869 -2.51758794 -2.48743719 [19] -2.45728643 -2.42713568 -2.39698492 -2.36683417 -2.33668342 -2.30653266 [25] -2.27638191 -2.24623116 -2.21608040 -2.18592965 -2.15577889 -2.12562814 [31] -2.09547739 -2.06532663 -2.03517588 -2.00502513 -1.97487437 -1.94472362 [37] -1.91457286 -1.88442211 -1.85427136 -1.82412060 -1.79396985 -1.76381910 [43] -1.73366834 -1.70351759 -1.67336683 -1.64321608 -1.61306533 -1.58291457 [49] -1.55276382 -1.52261307 -1.49246231 -1.46231156 -1.43216080 -1.40201005 [55] -1.37185930 -1.34170854 -1.31155779 -1.28140704 -1.25125628 -1.22110553 [61] -1.19095477 -1.16080402 -1.13065327 -1.10050251 -1.07035176 -1.04020101 [67] -1.01005025 -0.97989950 -0.94974874 -0.91959799 -0.88944724 -0.85929648 [73] -0.82914573 -0.79899497 -0.76884422 -0.73869347 -0.70854271 -0.67839196 [79] -0.64824121 -0.61809045 -0.58793970 -0.55778894 -0.52763819 -0.49748744 [85] -0.46733668 -0.43718593 -0.40703518 -0.37688442 -0.34673367 -0.31658291 [91] -0.28643216 -0.25628141 -0.22613065 -0.19597990 -0.16582915 -0.13567839 [97] -0.10552764 -0.07537688 -0.04522613 -0.01507538 0.01507538 0.04522613 [103] 0.07537688 0.10552764 0.13567839 0.16582915 0.19597990 0.22613065 [109] 0.25628141 0.28643216 0.31658291 0.34673367 0.37688442 0.40703518 [115] 0.43718593 0.46733668 0.49748744 0.52763819 0.55778894 0.58793970 [121] 0.61809045 0.64824121 0.67839196 0.70854271 0.73869347 0.76884422 [127] 0.79899497 0.82914573 0.85929648 0.88944724 0.91959799 0.94974874 [133] 0.97989950 1.01005025 1.04020101 1.07035176 1.10050251 1.13065327 [139] 1.16080402 1.19095477 1.22110553 1.25125628 1.28140704 1.31155779 [145] 1.34170854 1.37185930 1.40201005 1.43216080 1.46231156 1.49246231 [151] 1.52261307 1.55276382 1.58291457 1.61306533 1.64321608 1.67336683 [157] 1.70351759 1.73366834 1.76381910 1.79396985 1.82412060 1.85427136 [163] 1.88442211 1.91457286 1.94472362 1.97487437 2.00502513 2.03517588 [169] 2.06532663 2.09547739 2.12562814 2.15577889 2.18592965 2.21608040 [175] 2.24623116 2.27638191 2.30653266 2.33668342 2.36683417 2.39698492 [181] 2.42713568 2.45728643 2.48743719 2.51758794 2.54773869 2.57788945 [187] 2.60804020 2.63819095 2.66834171 2.69849246 2.72864322 2.75879397 [193] 2.78894472 2.81909548 2.84924623 2.87939698 2.90954774 2.93969849 [199] 2.96984925 3.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinh.testasinh4# #argv <- list(c(0+2i, 0.0001+2i, 0-2i, 0-2.0001i));asinh(argv[[1]]); [1] 1.316958+1.570796i 1.316958+1.570739i -1.316958-1.570796i [4] -1.317016-1.570796i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinh.testasinh5# #argv <- list(c(0.34345+233i,-0.34345+0.3334i));asinh(argv[[1]]); [1] 6.1441821+1.5693223i -0.3542312+0.3189009i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.noCopyCheck# #if (!any(R.version$engine == "FastR")) { [1] TRUE } else { { x <- 1:10; .fastr.identity(x) == .fastr.identity(as.integer(x)); } } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.noCopyCheck# #if (!any(R.version$engine == "FastR")) { [1] TRUE } else { { x <- c(1L, 3L); .fastr.identity(x) == .fastr.identity(as.integer(x)); } } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer("") } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer("1") } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer("1", as.character(NA)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer("TRUE") } [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer('1.1') } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer('2147483648') } [1] NA Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer('NaN') } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer() } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(-0/0) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(-10000000000) } [1] NA Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(0/0) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(1.1:5.1) } [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(10+2i) } [1] 10 Warning message: imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(10000000000) } [1] NA Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(10000000000000) } [1] NA Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(NULL) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(as.character(NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(as.raw(1)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(as.raw(c(1,2,3,4))) } [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(c("1","2")) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(c("1","hello")) } [1] 1 NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(c('1.1', '1')) } [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(c('1.1', 'NaN')) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(c('2147483648', '1.1')) } [1] NA 1 Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(c(1, 10000000000)) } [1] 1 NA Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(c(1,2,3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(c(1.0,2.5,3.9)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(c(100, -1e-13, Inf, -Inf, NaN, 3.14159265358979, NA)) } [1] 100 0 NA NA NA 3 NA Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(c(3+3i, 4+4i)) } [1] 3 4 Warning message: imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(list(1,2,3,list())) } [1] 1 2 3 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(list(c(1),2,3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger#Output.IgnoreErrorContext# #{ as.integer(list(c(1L, 2L))) } Error: 'list' object cannot be coerced to type 'integer' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(list(integer(),2,3)) } [1] NA 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer(list(list(1),2,3)) } [1] NA 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ as.integer.cls <- function(x) 42; as.integer(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ f <- function() as.integer('aaa'); f() } [1] NA Warning message: In f() : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ f1 <- function() {f<- function() as.integer('aaa'); f()}; f1() } [1] NA Warning message: In f() : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ x<-c(a=1.1, b=2.2); dim(x)<-c(1,2); attr(x, "foo")<-"foo"; y<-as.integer(x); attributes(y) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ x<-c(a=1L, b=2L); dim(x)<-c(1,2); attr(x, "foo")<-"foo"; y<-as.integer(x); attributes(y) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testAsInteger# #{ y <- c(3L, 4L); attr(y, 'someAttr') <- 'someValue'; x <- as.integer(y); x[[1]] <- 42L; y } [1] 3 4 attr(,"someAttr") [1] "someValue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger1# #argv <- list(structure(c(4L, 5L, 3L, 2L, 2L, 1L, 6L), .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables', 'R Core'), class = 'factor'));as.integer(argv[[1]]); [1] 4 5 3 2 2 1 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger10# #argv <- list(c('1', NA, '0'));as.integer(argv[[1]]); [1] 1 NA 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger11#Ignored.ImplementationError# #argv <- list(c('3', '14159265358979'));as.integer(argv[[1]]); [1] 3 NA Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger12# #argv <- list(TRUE);as.integer(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger13# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 0, 0, 1, 0, 0, 0, 0), .Dim = c(13L, 1L), .Dimnames = list(c('59', '115', '156', '268', '329', '431', '448', '477', '638', '803', '855', '1040', '1106'), NULL)));as.integer(argv[[1]]); [1] 1 1 1 1 1 1 0 0 1 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger14# #argv <- list(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE));as.integer(argv[[1]]); [1] 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger15# #argv <- list(character(0));as.integer(argv[[1]]); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger16# #argv <- list(4999.0000000001);as.integer(argv[[1]]); [1] 4999 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger17# #argv <- list(structure(c(100, -1e-13, Inf, -Inf, NaN, 3.14159265358979, NA), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')));as.integer(argv[[1]]); [1] 100 0 NA NA NA 3 NA Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger18# #argv <- list(structure(c(1L, 2L, 3L, 2L), .Label = c('1', '2', NA), class = 'factor'));as.integer(argv[[1]]); [1] 1 2 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger19# #argv <- list(structure(c(NA, 1L, NA, 2L, 1L, NA, NA, 1L, 4L, 1L, NA, 4L, 1L, 3L, NA, 4L, 2L, 2L, NA, 4L, 4L, 2L, 4L, 4L, 2L, 1L, 4L, 4L, 3L, 1L, 1L, 4L, 1L, 4L, NA, 1L, 4L, 4L, 2L, 2L, 4L, 4L, 3L, 4L, 2L, 2L, 3L, 3L, 4L, 1L, 1L, 1L, 4L, 1L, 4L, 4L, 4L, 4L, NA, 4L, 4L, 4L, NA, 1L, 2L, 3L, 4L, 3L, 4L, 2L, 4L, 4L, 1L, 4L, 1L, 4L, NA, 4L, 2L, 1L, 4L, 1L, 1L, 1L, 4L, 4L, 2L, 4L, 1L, 1L, 1L, 4L, 1L, 1L, 1L, 4L, 3L, 1L, 4L, 3L, 2L, 4L, 3L, 1L, 4L, 2L, 4L, NA, 4L, 4L, 4L, 2L, 1L, 4L, 4L, NA, 2L, 4L, 4L, 1L, 1L, 1L, 1L, 4L, 1L, 2L, 3L, 2L, 1L, 4L, 4L, 4L, 1L, NA, 4L, 2L, 2L, 2L, 4L, 4L, 3L, 3L, 4L, 2L, 4L, 3L, 1L, 1L, 4L, 2L, 4L, 3L, 1L, 4L, 3L, 4L, 4L, 1L, 1L, 4L, 4L, 3L, 1L, 1L, 2L, 1L, 3L, 4L, 2L, 2L, 2L, 4L, 4L, 3L, 2L, 1L, 1L, 4L, 1L, 1L, 2L, NA, 2L, 3L, 3L, 2L, 1L, 1L, 1L, 1L, 4L, 4L, 4L, 4L, 4L, 4L, 2L, 2L, 1L, 4L, 1L, 4L, 3L, 4L, 2L, 3L, 1L, 3L, 1L, 4L, 1L, 4L, 1L, 4L, 3L, 3L, 4L, 4L, 1L, NA, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 3L, 4L, 3L, 4L, 2L, 4L, 4L, 1L, 2L, NA, 4L, 4L, 4L, 4L, 1L, 2L, 1L, 1L, 2L, 1L, 4L, 2L, 3L, 1L, 4L, 4L, 4L, 1L, 2L, 1L, 4L, 2L, 1L, 3L, 1L, 2L, 2L, 1L, 2L, 1L, NA, 3L, 2L, 2L, 4L, 1L, 4L, 4L, 2L, 4L, 4L, 4L, 2L, 1L, 4L, 2L, 4L, 4L, 4L, 4L, 4L, 1L, 3L, 4L, 3L, 4L, 1L, NA, 4L, NA, 1L, 1L, 1L, 4L, 4L, 4L, 4L, 2L, 4L, 3L, 2L, NA, 1L, 4L, 4L, 3L, 4L, 4L, 4L, 2L, 4L, 2L, 1L, 4L, 4L, NA, 4L, 4L, 3L, 3L, 4L, 2L, 2L, 4L, 1L, 4L, 4L, 4L, 3L, 4L, 4L, 4L, 3L, 2L, 1L, 3L, 1L, 4L, 1L, 4L, 2L, NA, 1L, 4L, 4L, 3L, 1L, 4L, 1L, 4L, 1L, 4L, 4L, 1L, 2L, 2L, 1L, 4L, 1L, 1L, 4L, NA, 4L, NA, 4L, 4L, 4L, 1L, 4L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 1L, 2L, 1L, 4L, 2L, 3L, 3L, 1L, 3L, 1L, 4L, 1L, 3L, 2L, 2L, 4L, 1L, NA, 3L, 4L, 2L, 4L, 4L, 4L, 4L, 4L, 4L, 3L, 4L, 4L, 3L, 2L, 1L, 4L, 4L, 2L, 4L, 2L, 1L, 2L, 1L, 1L, 1L, 1L, 4L, 4L, 1L, 1L, 4L, 1L, 4L, 4L, 4L, 1L, 1L, NA, 3L, 2L, 4L, 4L, 4L, 4L, 2L, 3L, 3L, 2L, NA, 4L, 2L, 4L, 4L, 1L, 1L, 4L, 4L, 1L, 1L, 4L, 1L, 2L, 2L, 2L, 2L, 1L, 4L, 4L, 1L, 2L, 2L, 2L, 3L, 4L, 4L, 3L, 4L, 1L, 1L, 4L, 4L, NA, 4L, 1L, 4L, 4L, 4L, 1L, 4L, 4L, 1L, 2L, 4L, 4L, 4L, 4L, 1L, 2L, 4L, 4L, 2L, 1L, 4L, 2L, 4L, 2L, 2L, 4L, 1L, 3L, 3L, 2L, 4L, 1L, 4L, 4L, 4L, 1L, NA, 4L, 4L, 2L, 4L, 4L, 4L, 4L, 4L, 2L, NA, 4L, 2L, 4L, 3L, 1L, 4L, 4L, 3L, 4L, 2L, 4L, 4L, 1L, 2L, 1L, 4L, 1L, 3L, 3L, 1L, 4L, 4L, 2L, 4L, 4L, 4L, 4L, 3L, 2L, 3L, 3L, 2L, NA, 3L, 4L, 4L, 3L, 3L, 4L, 4L, 4L, 1L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 2L, 4L, 2L, 3L, 4L, 1L, 3L, 1L, NA, 4L, 1L, 2L, 2L, 1L, 4L, 3L, 3L, 4L, 1L, 1L, 3L), .Label = c('(1) Approve STRONGLY', '(2) Approve SOMEWHAT', '(3) Disapprove SOMEWHAT', '(4) Disapprove STRONGLY'), class = 'factor'));as.integer(argv[[1]]); [1] NA 1 NA 2 1 NA NA 1 4 1 NA 4 1 3 NA 4 2 2 NA 4 4 2 4 4 2 [26] 1 4 4 3 1 1 4 1 4 NA 1 4 4 2 2 4 4 3 4 2 2 3 3 4 1 [51] 1 1 4 1 4 4 4 4 NA 4 4 4 NA 1 2 3 4 3 4 2 4 4 1 4 1 [76] 4 NA 4 2 1 4 1 1 1 4 4 2 4 1 1 1 4 1 1 1 4 3 1 4 3 [101] 2 4 3 1 4 2 4 NA 4 4 4 2 1 4 4 NA 2 4 4 1 1 1 1 4 1 [126] 2 3 2 1 4 4 4 1 NA 4 2 2 2 4 4 3 3 4 2 4 3 1 1 4 2 [151] 4 3 1 4 3 4 4 1 1 4 4 3 1 1 2 1 3 4 2 2 2 4 4 3 2 [176] 1 1 4 1 1 2 NA 2 3 3 2 1 1 1 1 4 4 4 4 4 4 2 2 1 4 [201] 1 4 3 4 2 3 1 3 1 4 1 4 1 4 3 3 4 4 1 NA 3 4 4 4 4 [226] 4 4 3 4 3 4 2 4 4 1 2 NA 4 4 4 4 1 2 1 1 2 1 4 2 3 [251] 1 4 4 4 1 2 1 4 2 1 3 1 2 2 1 2 1 NA 3 2 2 4 1 4 4 [276] 2 4 4 4 2 1 4 2 4 4 4 4 4 1 3 4 3 4 1 NA 4 NA 1 1 1 [301] 4 4 4 4 2 4 3 2 NA 1 4 4 3 4 4 4 2 4 2 1 4 4 NA 4 4 [326] 3 3 4 2 2 4 1 4 4 4 3 4 4 4 3 2 1 3 1 4 1 4 2 NA 1 [351] 4 4 3 1 4 1 4 1 4 4 1 2 2 1 4 1 1 4 NA 4 NA 4 4 4 1 [376] 4 2 1 2 2 2 2 1 1 2 1 4 2 3 3 1 3 1 4 1 3 2 2 4 1 [401] NA 3 4 2 4 4 4 4 4 4 3 4 4 3 2 1 4 4 2 4 2 1 2 1 1 [426] 1 1 4 4 1 1 4 1 4 4 4 1 1 NA 3 2 4 4 4 4 2 3 3 2 NA [451] 4 2 4 4 1 1 4 4 1 1 4 1 2 2 2 2 1 4 4 1 2 2 2 3 4 [476] 4 3 4 1 1 4 4 NA 4 1 4 4 4 1 4 4 1 2 4 4 4 4 1 2 4 [501] 4 2 1 4 2 4 2 2 4 1 3 3 2 4 1 4 4 4 1 NA 4 4 2 4 4 [526] 4 4 4 2 NA 4 2 4 3 1 4 4 3 4 2 4 4 1 2 1 4 1 3 3 1 [551] 4 4 2 4 4 4 4 3 2 3 3 2 NA 3 4 4 3 3 4 4 4 1 4 4 4 [576] 4 4 4 4 2 4 2 3 4 1 3 1 NA 4 1 2 2 1 4 3 3 4 1 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger2# #argv <- list(c(' 33', ' 34', ' 35', ' 36', ' 37', ' 38', ' 18', ' 19', ' 20', ' 21', ' 22', ' 23', ' 36', ' 37', ' 38', ' 39'));as.integer(argv[[1]]); [1] 33 34 35 36 37 38 18 19 20 21 22 23 36 37 38 39 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger20# #argv <- list(39);as.integer(argv[[1]]); [1] 39 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger3# #argv <- list(c(-Inf, -8.5, -2.83333333333333, -1.41666666666667, -0.85, -0.566666666666666, -0.404761904761905, -0.303571428571428, -0.236111111111111, -0.188888888888889));as.integer(argv[[1]]); [1] NA -8 -2 -1 0 0 0 0 0 0 Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger4# #argv <- list(c(0, 1, NA, NA, 1, 1, -1, 1, 3, -2, -2, 7, -1, -1, -1, -1, -1, -1, -1, -1, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0));as.integer(argv[[1]]); [1] 0 1 NA NA 1 1 -1 1 3 -2 -2 7 -1 -1 -1 -1 -1 -1 -1 -1 17 0 0 0 0 [26] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [51] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [76] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger6# #argv <- list(2e+05);as.integer(argv[[1]]); [1] 200000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger7# #argv <- list(NULL);as.integer(argv[[1]]); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger8# #argv <- list(list(7L, 20, 0L, 1));as.integer(argv[[1]]); [1] 7 20 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asinteger.testasinteger9# #argv <- list('-1');as.integer(argv[[1]]); [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslist.noCopyCheck# #if (!any(R.version$engine == "FastR")) { [1] TRUE } else { { x <- list(1, 'abc', list(32)); .fastr.identity(x) == .fastr.identity(as.list(x)); } } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslist.testaslist1# #argv <- structure(list(x = structure(c(9.83610941897737, 1.76740501065812, 3.23822416444495, -2.66666666666667, -10, 28), .Names = c('X', 'Y', 'Z', 'a', 'b', 'c'))), .Names = 'x');do.call('as.list', argv) $X [1] 9.836109 $Y [1] 1.767405 $Z [1] 3.238224 $a [1] -2.666667 $b [1] -10 $c [1] 28 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.noCopyCheck# #if (!any(R.version$engine == "FastR")) { [1] TRUE } else { { x <- c(T, F, T, T); .fastr.identity(x) == .fastr.identity(as.logical(x)); } } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ as.logical("TRUE") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ as.logical("dummy") } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ as.logical("false") } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ as.logical(1) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ as.logical(10+2i) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ as.logical(NULL) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ as.logical(c("1","hello")) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ as.logical(c(3+3i, 4+4i)) } [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ as.logical.cls <- function(x) 42; as.logical(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ f <- function() as.logical('aaa'); f() } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ f1 <- function() {f<- function() as.logical('aaa'); f()}; f1() } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ x<-c(a=1.1, b=2.2); dim(x)<-c(1,2); attr(x, "foo")<-"foo"; y<-as.logical(x); attributes(y) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ x<-c(a=1L, b=2L); dim(x)<-c(1,2); attr(x, "foo")<-"foo"; y<-as.logical(x); attributes(y) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testAsLogical# #{ y <- c(T, F); attr(y, 'someAttr') <- 'someValue'; x <- as.logical(y); x[[1]] <- F; y } [1] TRUE FALSE attr(,"someAttr") [1] "someValue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical1# #argv <- list(structure(c(0L, 0L, 0L, 1L), .Names = c('Y', 'B', 'V', 'N')));as.logical(argv[[1]]); [1] FALSE FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical10# #argv <- list(NULL);as.logical(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical11# #argv <- list(structure('TRUE', .Names = '.registration'));as.logical(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical12# #argv <- list(structure(c(0, 1, 2, 2), .Dim = c(4L, 1L), .Dimnames = list(c('Y', 'B', 'V', 'N'), NULL)));as.logical(argv[[1]]); [1] FALSE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical13# #argv <- list(c(TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE));as.logical(argv[[1]]); [1] TRUE FALSE FALSE FALSE TRUE FALSE TRUE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical14# #argv <- list(structure(list(a = 1), .Names = 'a'));as.logical(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical15# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));as.logical(argv[[1]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical17# #argv <- list(c(1, 2, 3, 4, 5, NA, NA, 2, 3, 4, 5, 6));as.logical(argv[[1]]); [1] TRUE TRUE TRUE TRUE TRUE NA NA TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical2# #argv <- list(structure(c(-4, 1), .Names = c('', '')));as.logical(argv[[1]]); [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical3# #argv <- list(structure(c(1L, 0L, 0L, 0L, 0L), .Names = c('bibtype', NA, NA, NA, NA)));as.logical(argv[[1]]); [1] TRUE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical4# #argv <- list(c(1L, NA, 0L));as.logical(argv[[1]]); [1] TRUE NA FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical7# #argv <- list('FALSE');as.logical(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical8# #argv <- list(structure(logical(0), .Dim = c(0L, 0L), .Dimnames = list(NULL, NULL)));as.logical(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogical.testaslogical9# #argv <- list(c(3.74165738677394, 0, 8.55235974119758, 1.96396101212393));as.logical(argv[[1]]); [1] TRUE FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_aslogicalfactor.testaslogicalfactor1# #argv <- structure(list(x = structure(1:2, .Label = c('FALSE', 'TRUE'), class = 'factor')), .Names = 'x');do.call('as.logical.factor', argv) [1] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix("a",10,10) } [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [2,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [3,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [4,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [5,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [6,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [7,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [8,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [9,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [10,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(1.1:16.1,2,2)} [,1] [,2] [1,] 1.1 3.1 [2,] 2.1 4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(1:16,2,2)} [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(1:4, nrow=2) } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(1:4,2,2) } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix#Output.MissingWarning# #{ matrix(1:4,3,2) } [,1] [,2] [1,] 1 4 [2,] 2 1 [3,] 3 2 Warning message: In matrix(1:4, 3, 2) : data length [4] is not a sub-multiple or multiple of the number of rows [3] ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(1:6)} [,1] [1,] 1 [2,] 2 [3,] 3 [4,] 4 [5,] 5 [6,] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(1:6, ncol=3:5,byrow=TRUE)} [,1] [,2] [,3] [1,] 1 2 3 [2,] 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(1:6, nrow=3,byrow=1)} [,1] [,2] [1,] 1 2 [2,] 3 4 [3,] 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(1:6, nrow=3,byrow=TRUE)} [,1] [,2] [1,] 1 2 [2,] 3 4 [3,] 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(1:6, nrow=c(3,4,5),byrow=TRUE)} [,1] [,2] [1,] 1 2 [2,] 3 4 [3,] 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(1i,10,10) } [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [2,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [3,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [4,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [5,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [6,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [7,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [8,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [9,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [10,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(TRUE,FALSE,FALSE,TRUE)} <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(as.double(NA),2,2) } [,1] [,2] [1,] NA NA [2,] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(c("a",NA),10,10) } [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [2,] NA NA NA NA NA NA NA NA NA NA [3,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [4,] NA NA NA NA NA NA NA NA NA NA [5,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [6,] NA NA NA NA NA NA NA NA NA NA [7,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [8,] NA NA NA NA NA NA NA NA NA NA [9,] "a" "a" "a" "a" "a" "a" "a" "a" "a" "a" [10,] NA NA NA NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(c(1+1i,2+2i,3+3i,4+4i),2) } [,1] [,2] [1,] 1+1i 3+3i [2,] 2+2i 4+4i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(c(1,2,3,4), nrow=2) } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(c(1,2,3,4),2,2) } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix#Output.MissingWarning# #{ matrix(c(1,2,3,4),3,2) } [,1] [,2] [1,] 1 4 [2,] 2 1 [3,] 3 2 Warning message: In matrix(c(1, 2, 3, 4), 3, 2) : data length [4] is not a sub-multiple or multiple of the number of rows [3] ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(c(10+10i,5+5i,6+6i,20-20i),2) } [,1] [,2] [1,] 10+10i 6+ 6i [2,] 5+ 5i 20-20i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(c(1i,100i),10,10) } [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i [2,] 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i [3,] 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i [4,] 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i [5,] 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i [6,] 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i [7,] 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i [8,] 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i [9,] 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i 0+ 1i [10,] 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i 0+100i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(c(1i,NA),10,10) } [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [2,] NA NA NA NA NA NA NA NA NA NA [3,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [4,] NA NA NA NA NA NA NA NA NA NA [5,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [6,] NA NA NA NA NA NA NA NA NA NA [7,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [8,] NA NA NA NA NA NA NA NA NA NA [9,] 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i 0+1i [10,] NA NA NA NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(c(NaN,4+5i,2+0i,5+10i)) } [,1] [1,] NaN+ 0i [2,] 4+ 5i [3,] 2+ 0i [4,] 5+10i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ matrix(nrow=2,ncol=2) } [,1] [,2] [1,] NA NA [2,] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ x<-matrix(integer()) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ x<-matrix(integer(), ncol=2) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ x<-matrix(integer(), ncol=2, nrow=3) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ x<-matrix(integer(), nrow=2) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ x<-matrix(list(), nrow=2, ncol=2); x } [,1] [,2] [1,] NULL NULL [2,] NULL NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testMatrix# #{ x<-matrix(list(), nrow=2, ncol=2, dimnames=list(c("a", "b"), c("c", "d"))); x } c d a NULL NULL b NULL NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asmatrix.testasmatrix1# #argv <- structure(list(x = structure(c(9L, 27L, 27L, 27L, 27L, 3L, 3L, 3L, 3L, 9L, 9L, 9L, 9L, 9L, 9L), .Names = c('Blocks', 'A', 'B', 'C', 'D', 'Blocks:A', 'Blocks:B', 'Blocks:C', 'Blocks:D', 'A:B', 'A:C', 'A:D', 'B:C', 'B:D', 'C:D'))), .Names = 'x');do.call('as.matrix', argv) [,1] Blocks 9 A 27 B 27 C 27 D 27 Blocks:A 3 Blocks:B 3 Blocks:C 3 Blocks:D 3 A:B 9 A:C 9 A:D 9 B:C 9 B:D 9 C:D 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asoctmode.testasoctmode1# #argv <- structure(list(x = 1:255), .Names = 'x');do.call('as.octmode', argv) [1] "001" "002" "003" "004" "005" "006" "007" "010" "011" "012" "013" "014" [13] "015" "016" "017" "020" "021" "022" "023" "024" "025" "026" "027" "030" [25] "031" "032" "033" "034" "035" "036" "037" "040" "041" "042" "043" "044" [37] "045" "046" "047" "050" "051" "052" "053" "054" "055" "056" "057" "060" [49] "061" "062" "063" "064" "065" "066" "067" "070" "071" "072" "073" "074" [61] "075" "076" "077" "100" "101" "102" "103" "104" "105" "106" "107" "110" [73] "111" "112" "113" "114" "115" "116" "117" "120" "121" "122" "123" "124" [85] "125" "126" "127" "130" "131" "132" "133" "134" "135" "136" "137" "140" [97] "141" "142" "143" "144" "145" "146" "147" "150" "151" "152" "153" "154" [109] "155" "156" "157" "160" "161" "162" "163" "164" "165" "166" "167" "170" [121] "171" "172" "173" "174" "175" "176" "177" "200" "201" "202" "203" "204" [133] "205" "206" "207" "210" "211" "212" "213" "214" "215" "216" "217" "220" [145] "221" "222" "223" "224" "225" "226" "227" "230" "231" "232" "233" "234" [157] "235" "236" "237" "240" "241" "242" "243" "244" "245" "246" "247" "250" [169] "251" "252" "253" "254" "255" "256" "257" "260" "261" "262" "263" "264" [181] "265" "266" "267" "270" "271" "272" "273" "274" "275" "276" "277" "300" [193] "301" "302" "303" "304" "305" "306" "307" "310" "311" "312" "313" "314" [205] "315" "316" "317" "320" "321" "322" "323" "324" "325" "326" "327" "330" [217] "331" "332" "333" "334" "335" "336" "337" "340" "341" "342" "343" "344" [229] "345" "346" "347" "350" "351" "352" "353" "354" "355" "356" "357" "360" [241] "361" "362" "363" "364" "365" "366" "367" "370" "371" "372" "373" "374" [253] "375" "376" "377" ##com.oracle.truffle.r.test.builtins.TestBuiltin_aspairlist.testAsPairList#Output.IgnoreErrorMessage# #{ as.pairlist(quote(a + b)) } Error in as.pairlist(quote(a + b)) : 'language' object cannot be coerced to type 'pairlist' ##com.oracle.truffle.r.test.builtins.TestBuiltin_aspairlist.testAsPairList#Output.IgnoreErrorContext# #{ as.pairlist(quote(x)) } Error in as.vector(x, "pairlist") : cannot coerce type 'symbol' to vector of type 'pairlist' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.noCopyCheck# #if (!any(R.version$engine == "FastR")) { [1] TRUE } else { { x <- as.raw(c(1, 3)); .fastr.identity(x) == .fastr.identity(as.raw(x)); } } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw('1') } [1] 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw('1.1') } [1] 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw('1000') } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWhitespace# #{ as.raw('10000000000000000') } [1] 00 Warning messages: 1: NAs introduced by coercion to integer range 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw('NaN') } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWhitespace# #{ as.raw('test') } [1] 00 Warning messages: 1: NAs introduced by coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw() } Error in as.raw() : 0 arguments passed to 'as.raw' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(-1) } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(-1L) } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(1) } [1] 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(1+1i) } [1] 01 Warning message: imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(1.1) } [1] 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(1000) } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWhitespace# #{ as.raw(1000+1i) } [1] 00 Warning messages: 1: imaginary parts discarded in coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWhitespace# #{ as.raw(10000000000000000) } [1] 00 Warning messages: 1: NAs introduced by coercion to integer range 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWarningMessage# #{ as.raw(10000000000000000+1i) } [1] 00 Warning messages: 1: NAs introduced by coercion to integer range 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(1000L) } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(1L) } [1] 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(NA) } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(NA_complex_) } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(NA_integer_) } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(NULL) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(TRUE) } [1] 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(as.raw(list(1, 1+1i)) } Error: unexpected '}' in "{ as.raw(as.raw(list(1, 1+1i)) }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(as.raw(list(1, 10000000000000)) } Error: unexpected '}' in "{ as.raw(as.raw(list(1, 10000000000000)) }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(as.raw(list(1, 10000000000000, 1+1i)) } Error: unexpected '}' in "{ as.raw(as.raw(list(1, 10000000000000, 1+1i)) }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(as.raw(list(1, 2, c(1, 2, 3))) } Error: unexpected '}' in "{ as.raw(as.raw(list(1, 2, c(1, 2, 3))) }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(as.raw(list(1, 2, new.env())) } Error: unexpected '}' in "{ as.raw(as.raw(list(1, 2, new.env())) }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(as.raw(list(1, NA)) } Error: unexpected '}' in "{ as.raw(as.raw(list(1, NA)) }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(as.raw(list(1, NA, list(1))) } Error: unexpected '}' in "{ as.raw(as.raw(list(1, NA, list(1))) }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(as.raw(list(1, NA, list(1, 2, 3))) } Error: unexpected '}' in "{ as.raw(as.raw(list(1, NA, list(1, 2, 3))) }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c('1', '1000')) } [1] 01 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c('1', '2')) } [1] 01 02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c('1.1', '1')) } [1] 01 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c('1.1', 'NaN')) } [1] 01 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWhitespace# #{ as.raw(c('10000000000000000', '1')) } [1] 00 01 Warning messages: 1: NAs introduced by coercion to integer range 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWhitespace# #{ as.raw(c('10000000000000000', '1.1')) } [1] 00 01 Warning messages: 1: NAs introduced by coercion to integer range 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWhitespace# #{ as.raw(c('10000000000000000', '1000')) } [1] 00 00 Warning messages: 1: NAs introduced by coercion to integer range 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWarningContext# #{ as.raw(c(1+3i, -2-1i, NA)) } [1] 01 00 00 Warning messages: 1: imaginary parts discarded in coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c(1, -2, 3)) } [1] 01 00 03 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c(1, 2, 3)) } [1] 01 02 03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c(1,1000,NA)) } [1] 01 00 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWarningMessage# #{ as.raw(c(1000, 1+1i)) } [1] 00 01 Warning messages: 1: imaginary parts discarded in coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWhitespace# #{ as.raw(c(10000000000000000+1i, 1+1i)) } [1] 00 01 Warning messages: 1: NAs introduced by coercion to integer range 2: imaginary parts discarded in coercion 3: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWhitespace# #{ as.raw(c(10000000000000000+1i, 1000+1i, NA_complex_, 1+1i)) } [1] 00 00 00 01 Warning messages: 1: NAs introduced by coercion to integer range 2: imaginary parts discarded in coercion 3: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWarningMessage# #{ as.raw(c(10000000000000000+1i, 10000000000000000+1i)) } [1] 00 00 Warning messages: 1: NAs introduced by coercion to integer range 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWarningMessage# #{ as.raw(c(1000L, 1+1i)) } [1] 00 01 Warning messages: 1: imaginary parts discarded in coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c(1L, -2L, 3L)) } [1] 01 00 03 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c(1L, -2L, NA)) } [1] 01 00 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c(1L, 2L, 3L)) } [1] 01 02 03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c(1L, 2L, NA_integer_)) } [1] 01 02 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw#Output.IgnoreWhitespace# #{ as.raw(c(NA_complex_, 1+1i)) } [1] 00 01 Warning messages: 1: imaginary parts discarded in coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(c(TRUE, FALSE)) } [1] 01 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(list("1", 2L, 3.4)) } [1] 01 02 03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw(list(1,2,3)) } [1] 01 02 03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ as.raw.cls <- function(x) 42; as.raw(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ f <- function() as.raw('aaa'); f() } [1] 00 Warning messages: 1: In f() : NAs introduced by coercion 2: In f() : out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ f1 <- function() {f<- function() as.raw('aaa'); f()}; f1() } [1] 00 Warning messages: 1: In f() : NAs introduced by coercion 2: In f() : out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testAsRaw# #{ y <- as.raw(c(5L, 6L)); attr(y, 'someAttr') <- 'someValue'; x <- as.raw(y); x[[1]] <- as.raw(42); y } [1] 05 06 attr(,"someAttr") [1] "someValue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testasraw1# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));as.raw(argv[[1]]); raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testasraw2# #argv <- list(integer(0));as.raw(argv[[1]]); raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testasraw3# #argv <- list(logical(0));as.raw(argv[[1]]); raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testasraw4# #argv <- list(character(0));as.raw(argv[[1]]); raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testasraw5# #argv <- list(NULL);as.raw(argv[[1]]); raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asraw.testasraw6# #argv <- list(list());as.raw(argv[[1]]); raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_assign.testassign# #x <- c(1,2,4); e <- new.env(); assign('foo', x, e); x[[1]] <- 5; x; get('foo', e) [1] 5 2 4 [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_assign.testassign# #x <- c(1,2,4); e <- new.env(); assign('foo', x, e, inherits=0); x[[1]] <- 5; x; get('foo', e) [1] 5 2 4 [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_assign.testassign1# #argv <- structure(list(x = '`', value = TRUE), .Names = c('x', 'value'));do.call('assign', argv) ##com.oracle.truffle.r.test.builtins.TestBuiltin_assingle.testassingle1# #argv <- structure(list(x = 1), .Names = 'x');do.call('as.single', argv) [1] 1 attr(,"Csingle") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_astype_dispatch.testAsFunctionInternalDispatch# #{ as.character.myclass <- function(x) 42L; as.character(structure(TRUE, class='myclass')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_astype_dispatch.testAsFunctionInternalDispatch# #{ as.complex.myclass <- function(x) 42L; as.complex(structure(TRUE, class='myclass')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_astype_dispatch.testAsFunctionInternalDispatch# #{ as.double.myclass <- function(x) 42L; as.double(structure(TRUE, class='myclass')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_astype_dispatch.testAsFunctionInternalDispatch# #{ as.integer.myclass <- function(x) 42L; as.integer(structure(TRUE, class='myclass')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_astype_dispatch.testAsFunctionInternalDispatch# #{ as.logical.myclass <- function(x) 42L; as.logical(structure(TRUE, class='myclass')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_astype_dispatch.testAsFunctionInternalDispatch# #{ as.raw.myclass <- function(x) 42L; as.raw(structure(TRUE, class='myclass')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_astype_dispatch.testExtraArgumentsArePassedToOverload# #as.integer.myclass <- function(x, extra, ...) list(x=x, extra=extra, varargs=list(...)); as.integer(structure(TRUE, class='myclass'), my=TRUE, extra=42L, args='hello'); $x [1] TRUE attr(,"class") [1] "myclass" $extra [1] 42 $varargs $varargs$my [1] TRUE $varargs$args [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_astype_dispatch.testWithBuiltinFunction# #as.numeric(diff(structure(c(-154401120, 1503191520), class = c('POSIXct', 'POSIXt'), tzone = 'GMT')), units='secs') [1] 1657592640 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='any'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'any' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='character'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'character' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='complex'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'complex' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='double'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'double' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='integer'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'integer' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='list'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'list' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='logical'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'logical' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='name'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'symbol' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='numeric'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'double' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='pairlist'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'pairlist' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='raw'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'raw' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.environment(list(a=3,b=4,x=5)); attr(x,'myattr') <- 42; as.vector(x, mode='symbol'); } Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'symbol' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='any'); } $a [1] 1 $b [1] 2 $c [1] 3 attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='character'); } [1] "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='complex'); } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='double'); } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='integer'); } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='list'); } $a [1] 1 $b [1] 2 $c [1] 3 attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='logical'); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='name'); } Error in as.vector(x, mode = "name") : invalid type/length (symbol/3) in vector allocation ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='numeric'); } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='pairlist'); } $a [1] 1 $b [1] 2 $c [1] 3 attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='raw'); } [1] 01 02 03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.pairlist(c(1,2,3)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='symbol'); } Error in as.vector(x, mode = "symbol") : invalid type/length (symbol/3) in vector allocation ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='any'); } [1] 01 02 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='character'); } [1] "01" "02" "04" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='complex'); } [1] 1+0i 2+0i 4+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='double'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='integer'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='list'); } $a [1] 01 $b [1] 02 $c [1] 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='logical'); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='name'); } `01` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='numeric'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='pairlist'); } $a [1] 01 $b [1] 02 $c [1] 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='raw'); } [1] 01 02 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- as.raw(c(1, 2, 4)); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='symbol'); } `01` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='any'); } [1] "1" "2" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='character'); } [1] "1" "2" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='complex'); } [1] 1+0i 2+0i 4+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='double'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='integer'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='list'); } $a [1] "1" $b [1] "2" $c [1] "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='logical'); } [1] NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='name'); } `1` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='numeric'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='pairlist'); } $a [1] "1" $b [1] "2" $c [1] "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='raw'); } [1] 01 02 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c('1', '2', '4'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='symbol'); } `1` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='any'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='character'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='complex'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='double'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='integer'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='list'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='logical'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='name'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='numeric'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='pairlist'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='raw'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1+i, 2+i, 4+i); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='symbol'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='any'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='character'); } [1] "1" "2" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='complex'); } [1] 1+0i 2+0i 4+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='double'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='integer'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='list'); } $a [1] 1 $b [1] 2 $c [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='logical'); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='name'); } `1` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='numeric'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='pairlist'); } $a [1] 1 $b [1] 2 $c [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='raw'); } [1] 01 02 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1, 2, 4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='symbol'); } `1` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='any'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='character'); } [1] "1" "2" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='complex'); } [1] 1+0i 2+0i 4+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='double'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='integer'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='list'); } $a [1] 1 $b [1] 2 $c [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='logical'); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='name'); } `1` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='numeric'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='pairlist'); } $a [1] 1 $b [1] 2 $c [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='raw'); } [1] 01 02 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(1L, 2L, 4L); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='symbol'); } `1` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='any'); } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='character'); } [1] "TRUE" "FALSE" "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='complex'); } [1] 1+0i 0+0i 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='double'); } [1] 1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='integer'); } [1] 1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='list'); } $a [1] TRUE $b [1] FALSE $c [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='logical'); } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='name'); } `TRUE` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='numeric'); } [1] 1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='pairlist'); } $a [1] TRUE $b [1] FALSE $c [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='raw'); } [1] 01 00 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- c(T, F, T); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='symbol'); } `TRUE` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='any'); } $a [1] 1 $b [1] 2 $c [1] 4 attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='character'); } [1] "1" "2" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='complex'); } [1] 1+0i 2+0i 4+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='double'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='integer'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='list'); } $a [1] 1 $b [1] 2 $c [1] 4 attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='logical'); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='name'); } Error in as.vector(x, mode = "name") : invalid type/length (symbol/3) in vector allocation ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='numeric'); } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='pairlist'); } $a [1] 1 $b [1] 2 $c [1] 4 attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='raw'); } [1] 01 02 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- list(1,2,4); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='symbol'); } Error in as.vector(x, mode = "symbol") : invalid type/length (symbol/3) in vector allocation ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='any'); } expression(a = x, b = y, c = z) attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='character'); } [1] "x" "y" "z" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='complex'); } Error in as.vector(x, mode = "complex") : 'list' object cannot be coerced to type 'complex' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='double'); } Error in as.vector(x, mode = "double") : 'list' object cannot be coerced to type 'double' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='integer'); } Error in as.vector(x, mode = "integer") : 'list' object cannot be coerced to type 'integer' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='list'); } $a x $b y $c z attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='logical'); } Error in as.vector(x, mode = "logical") : 'list' object cannot be coerced to type 'logical' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='name'); } Error in as.vector(x, mode = "name") : 'list' object cannot be coerced to type 'symbol' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='numeric'); } Error in as.vector(x, mode = "numeric") : 'list' object cannot be coerced to type 'double' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='pairlist'); } $a x $b y $c z attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='raw'); } Error in as.vector(x, mode = "raw") : 'list' object cannot be coerced to type 'raw' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.allCombinations#Output.IgnoreErrorMessage# #{ x <- parse(text='x; y; z'); names(x) <- c('a','b','c'); attr(x,'myattr') <- 42; as.vector(x, mode='symbol'); } Error in as.vector(x, mode = "symbol") : 'list' object cannot be coerced to type 'symbol' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.runRSourceTests# #{ source("tmptest/asvector/asvector.R") } list -> integer result: integer names: no attrs: no list -> numeric result: double names: no attrs: no list -> double result: double names: no attrs: no list -> raw result: raw names: no attrs: no list -> logical result: logical names: no attrs: no list -> complex result: complex names: no attrs: no list -> character result: character names: no attrs: no list -> list result: list names: yes attrs: yes list -> pairlist result: pairlist names: yes attrs: yes list -> symbol result: NULL E names: no attrs: no list -> name result: NULL E names: no attrs: no list -> any result: list names: yes attrs: yes pairlist -> integer result: integer names: no attrs: no pairlist -> numeric result: double names: no attrs: no pairlist -> double result: double names: no attrs: no pairlist -> raw result: raw names: no attrs: no pairlist -> logical result: logical names: no attrs: no pairlist -> complex result: complex names: no attrs: no pairlist -> character result: character names: no attrs: no pairlist -> list result: list names: yes attrs: yes pairlist -> pairlist result: pairlist names: yes attrs: yes pairlist -> symbol result: NULL E names: no attrs: no pairlist -> name result: NULL E names: no attrs: no pairlist -> any result: pairlist names: yes attrs: yes integer -> integer result: integer names: no attrs: no integer -> numeric result: double names: no attrs: no integer -> double result: double names: no attrs: no integer -> raw result: raw names: no attrs: no integer -> logical result: logical names: no attrs: no integer -> complex result: complex names: no attrs: no integer -> character result: character names: no attrs: no integer -> list result: list names: yes attrs: no integer -> pairlist result: pairlist names: yes attrs: no integer -> symbol result: symbol names: no attrs: no integer -> name result: symbol names: no attrs: no integer -> any result: integer names: no attrs: no double -> integer result: integer names: no attrs: no double -> numeric result: double names: no attrs: no double -> double result: double names: no attrs: no double -> raw result: raw names: no attrs: no double -> logical result: logical names: no attrs: no double -> complex result: complex names: no attrs: no double -> character result: character names: no attrs: no double -> list result: list names: yes attrs: no double -> pairlist result: pairlist names: yes attrs: no double -> symbol result: symbol names: no attrs: no double -> name result: symbol names: no attrs: no double -> any result: double names: no attrs: no raw -> integer result: integer names: no attrs: no raw -> numeric result: double names: no attrs: no raw -> double result: double names: no attrs: no raw -> raw result: raw names: no attrs: no raw -> logical result: logical names: no attrs: no raw -> complex result: complex names: no attrs: no raw -> character result: character names: no attrs: no raw -> list result: list names: yes attrs: no raw -> pairlist result: pairlist names: yes attrs: no raw -> symbol result: symbol names: no attrs: no raw -> name result: symbol names: no attrs: no raw -> any result: raw names: no attrs: no character -> integer result: integer names: no attrs: no character -> numeric result: double names: no attrs: no character -> double result: double names: no attrs: no character -> raw result: raw names: no attrs: no character -> logical result: logical names: no attrs: no character -> complex result: complex names: no attrs: no character -> character result: character names: no attrs: no character -> list result: list names: yes attrs: no character -> pairlist result: pairlist names: yes attrs: no character -> symbol result: symbol names: no attrs: no character -> name result: symbol names: no attrs: no character -> any result: character names: no attrs: no logical -> integer result: integer names: no attrs: no logical -> numeric result: double names: no attrs: no logical -> double result: double names: no attrs: no logical -> raw result: raw names: no attrs: no logical -> logical result: logical names: no attrs: no logical -> complex result: complex names: no attrs: no logical -> character result: character names: no attrs: no logical -> list result: list names: yes attrs: no logical -> pairlist result: pairlist names: yes attrs: no logical -> symbol result: symbol names: no attrs: no logical -> name result: symbol names: no attrs: no logical -> any result: logical names: no attrs: no complex -> integer result: NULL W names: no attrs: no complex -> numeric result: NULL W names: no attrs: no complex -> double result: NULL W names: no attrs: no complex -> raw result: NULL W names: no attrs: no complex -> logical result: logical names: no attrs: no complex -> complex result: complex names: no attrs: no complex -> character result: character names: no attrs: no complex -> list result: list names: yes attrs: no complex -> pairlist result: pairlist names: yes attrs: no complex -> symbol result: symbol names: no attrs: no complex -> name result: symbol names: no attrs: no complex -> any result: complex names: no attrs: no expression -> integer result: NULL E names: no attrs: no expression -> numeric result: NULL E names: no attrs: no expression -> double result: NULL E names: no attrs: no expression -> raw result: NULL E names: no attrs: no expression -> logical result: NULL E names: no attrs: no expression -> complex result: NULL E names: no attrs: no expression -> character result: character names: no attrs: no expression -> list result: list names: yes attrs: yes expression -> pairlist result: pairlist names: yes attrs: yes expression -> symbol result: NULL E names: no attrs: no expression -> name result: NULL E names: no attrs: no expression -> any result: expression names: yes attrs: yes ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsSymbol# #{ as.symbol("name") } name ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsSymbol# #{ as.symbol(123) } `123` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsSymbol# #{ as.symbol(3+2i) } `3+2i` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsSymbol# #{ as.symbol(as.raw(16)) } `10` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsSymbol# #{ as.symbol(as.symbol(123)) } `123` ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #as.pairlist(as.pairlist(c(1,2,3))) [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #as.pairlist(mtcars[,1:3]) mpg cyl disp Mazda RX4 21.0 6 160.0 Mazda RX4 Wag 21.0 6 160.0 Datsun 710 22.8 4 108.0 Hornet 4 Drive 21.4 6 258.0 Hornet Sportabout 18.7 8 360.0 Valiant 18.1 6 225.0 Duster 360 14.3 8 360.0 Merc 240D 24.4 4 146.7 Merc 230 22.8 4 140.8 Merc 280 19.2 6 167.6 Merc 280C 17.8 6 167.6 Merc 450SE 16.4 8 275.8 Merc 450SL 17.3 8 275.8 Merc 450SLC 15.2 8 275.8 Cadillac Fleetwood 10.4 8 472.0 Lincoln Continental 10.4 8 460.0 Chrysler Imperial 14.7 8 440.0 Fiat 128 32.4 4 78.7 Honda Civic 30.4 4 75.7 Toyota Corolla 33.9 4 71.1 Toyota Corona 21.5 4 120.1 Dodge Challenger 15.5 8 318.0 AMC Javelin 15.2 8 304.0 Camaro Z28 13.3 8 350.0 Pontiac Firebird 19.2 8 400.0 Fiat X1-9 27.3 4 79.0 Porsche 914-2 26.0 4 120.3 Lotus Europa 30.4 4 95.1 Ford Pantera L 15.8 8 351.0 Ferrari Dino 19.7 6 145.0 Maserati Bora 15.0 8 301.0 Volvo 142E 21.4 4 121.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #as.pairlist(structure(1:3, myattr=42)) [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #as.vector(NULL, mode='pairlist') NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #as.vector(as.pairlist(structure(list(1,2,3), myattr=42)), 'list') [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #as.vector(as.symbol('asdf'), 'symbol') asdf ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #as.vector(file('')) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #as.vector(x~z) x ~ z ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #names(as.pairlist(structure(list(3), .Names = c('')))) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #names(as.pairlist(structure(list(3, 4), .Names = c('', '')))) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #names(as.pairlist(structure(list(3, 4), .Names = c('', 'abc')))) [1] "" "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #x<-c(a=1.1, b=2.2); as.vector(x, "raw") [1] 01 02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #x<-c(a=1L, b=2L); as.vector(x, "complex") [1] 1+0i 2+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector("foo") } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector("foo", "bar") } Error in as.vector("foo", "bar") : invalid 'mode' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector("foo", "character") } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector("foo", "double") } [1] NA Warning message: In as.vector("foo", "double") : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector("foo", "integer") } [1] NA Warning message: In as.vector("foo", "integer") : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector("foo", "list") } [[1]] [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector("foo", "logical") } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector("foo", "numeric") } [1] NA Warning message: In as.vector("foo", "numeric") : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector("foo", "raw") } [1] 00 Warning messages: 1: In as.vector("foo", "raw") : NAs introduced by coercion 2: In as.vector("foo", "raw") : out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector(42, NULL) } Error in as.vector(42, NULL) : invalid 'mode' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector(42, c("character", "character")) } Error in as.vector(42, c("character", "character")) : invalid 'mode' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector(42, character()) } Error in as.vector(42, character()) : invalid 'mode' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector(NULL) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector(NULL, "list") } list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector(c("foo", "bar"), "raw") } [1] 00 00 Warning messages: 1: In as.vector(c("foo", "bar"), "raw") : NAs introduced by coercion 2: In as.vector(c("foo", "bar"), "raw") : out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ as.vector.cls <- function(x, mode) 42; as.vector(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ x<-1:4; dim(x)<-c(2, 2); dimnames(x)<-list(c("a", "b"), c("c", "d")); y<-as.vector(x, "list"); y } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 [[4]] [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ x<-c(a=1, b=2); as.vector(x, "list") } $a [1] 1 $b [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ x<-c(a=FALSE, b=TRUE); attr(x, "foo")<-"foo"; y<-as.vector(x); attributes(y) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ x<-c(a=FALSE, b=TRUE); attr(x, "foo")<-"foo"; y<-as.vector(x, "list"); attributes(y) } $names [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testAsVector# #{ x<-factor(c("a", "b", "a")); as.vector(x) } [1] "a" "b" "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testCannotCoerce#Output.IgnoreErrorContext# #as.vector(environment()) Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'any' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testCannotCoerce#Output.IgnoreErrorContext# #as.vector(environment(), 'integer') Error in as.vector(x, mode) : cannot coerce type 'environment' to vector of type 'integer' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testCannotCoerce#Output.IgnoreErrorContext# #as.vector(function(){}) Error in as.vector(x, mode) : cannot coerce type 'closure' to vector of type 'any' ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector1# #argv <- list('ylog', 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] [1] "ylog" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector10# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render', '#ifdef', '\\Sexpr', 'build', 'install', 'render')), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [37] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [49] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [61] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [109] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [121] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [133] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [145] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [157] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [169] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [181] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [193] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [205] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [217] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [229] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [241] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [253] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector11# #argv <- list(structure(c(0.00290239468554411, 0.00140705152597282, 0.00182415100508824, 0.000171517300342798, 0.0747454613066297, 0.00103234723292905, 0.000179983318697139, 0.035258608446556, 0.00336847595628205, 0.0640696486471418, 0.0132108002751951, 0.00194778778741288, 0.00351950115137134, 0.00070046832029645, 0.00252844357734999, 0.014372012195495, 0.00923422554274329, 7.64817786749709e-06, 0.00387339857745524, 0.00121246491006704, 0.00624917129689857, 0.00187753034805145, 0.000103002251547081, 0.0136703020254034, 0.000349542811339765, 0.00120367047056318, 0.00194205014408536, 0.00462815827742801, 0.000149291834133955, 0.00193441236645678, 9.00084520363788e-05, 0.0160915134527436, 0.00346675958538611, 0.00481936427422656, 3.13343033856204e-05, 0.0564685345533007, 0.00929771993193244, 0.0103876340982415, 0.0133005891226512, 0.0325989357511189, 0.00228122925969392, 0.0460976655088242, 0.00300363745967821, 0.000271060875811077, 0.0301696315261026, 4.72002631048228e-05, 0.0262321004865233, 0.00594174673473013, 0.00288915040856096, 0.00635277836091399, 0.00569342819072193, 0.0163907345734163, 0.000360581939026215, 0.00023772587191537, 0.0164062036225435, 0.0238391417439454, NaN, 0.0421542087325977, 0.00133954856768466, 0.0113421570571088, 0.0081824228772913, 0.000149291834133955, 0.00162069399881579, 0.0018026229128858, 0.0043164627226381, 0.000407784303899559, 0.00876301280354452, 0.00179253664026376, 0.000416739394150718, 0.014372012195495, 0.000179983318697139, 0.00115986529332945, 0.00377736311314377, 0.00219491136307178, 0.00070046832029645, 0.000522557531637993, 9.86336244510646e-05, 0.0216346027446621, 0.000659639144027202, 0.0137501462695058, 5.91425796335962e-08, 0.0279425064631674, 0.000170828237014775, 0.0042454690355613, 0.0114879015536739, 0.000173346990819198, 0.00138111062254461, 0.00772582941114727, 0.0277947034678616, 0.00892024547056825, 0.0618577709874562, 0.0125790610228498, 0.0277947034678616), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93')), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 2.902395e-03 1.407052e-03 1.824151e-03 1.715173e-04 7.474546e-02 [6] 1.032347e-03 1.799833e-04 3.525861e-02 3.368476e-03 6.406965e-02 [11] 1.321080e-02 1.947788e-03 3.519501e-03 7.004683e-04 2.528444e-03 [16] 1.437201e-02 9.234226e-03 7.648178e-06 3.873399e-03 1.212465e-03 [21] 6.249171e-03 1.877530e-03 1.030023e-04 1.367030e-02 3.495428e-04 [26] 1.203670e-03 1.942050e-03 4.628158e-03 1.492918e-04 1.934412e-03 [31] 9.000845e-05 1.609151e-02 3.466760e-03 4.819364e-03 3.133430e-05 [36] 5.646853e-02 9.297720e-03 1.038763e-02 1.330059e-02 3.259894e-02 [41] 2.281229e-03 4.609767e-02 3.003637e-03 2.710609e-04 3.016963e-02 [46] 4.720026e-05 2.623210e-02 5.941747e-03 2.889150e-03 6.352778e-03 [51] 5.693428e-03 1.639073e-02 3.605819e-04 2.377259e-04 1.640620e-02 [56] 2.383914e-02 NaN 4.215421e-02 1.339549e-03 1.134216e-02 [61] 8.182423e-03 1.492918e-04 1.620694e-03 1.802623e-03 4.316463e-03 [66] 4.077843e-04 8.763013e-03 1.792537e-03 4.167394e-04 1.437201e-02 [71] 1.799833e-04 1.159865e-03 3.777363e-03 2.194911e-03 7.004683e-04 [76] 5.225575e-04 9.863362e-05 2.163460e-02 6.596391e-04 1.375015e-02 [81] 5.914258e-08 2.794251e-02 1.708282e-04 4.245469e-03 1.148790e-02 [86] 1.733470e-04 1.381111e-03 7.725829e-03 2.779470e-02 8.920245e-03 [91] 6.185777e-02 1.257906e-02 2.779470e-02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector12# #argv <- list(structure(c(0.164593338447767, 0.182090654313858, NA, 0.484947927602608), .Names = c('(Intercept)', 'x1', 'x2', 'x3')), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 0.1645933 0.1820907 NA 0.4849479 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector13# #argv <- list('', 'double'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector14# #argv <- list(structure(c('myTst', 'Package', 'What the package does (short line)', '1.0', '2014-03-17', 'Who wrote it', 'Who to complain to ', 'More about what it does (maybe more than one line)', 'What license is it under?', 'methods'), .Names = c('Package', 'Type', 'Title', 'Version', 'Date', 'Author', 'Maintainer', 'Description', 'License', 'Depends')), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) $Package [1] "myTst" $Type [1] "Package" $Title [1] "What the package does (short line)" $Version [1] "1.0" $Date [1] "2014-03-17" $Author [1] "Who wrote it" $Maintainer [1] "Who to complain to " $Description [1] "More about what it does (maybe more than one line)" $License [1] "What license is it under?" $Depends [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector15#Ignored.ImplementationError# #argv <- list(quote(sqrt(abs(`Standardized residuals`))), 'expression'); .Internal(as.vector(argv[[1]], argv[[2]])) expression(sqrt(abs(`Standardized residuals`))) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector16# #argv <- list(1, 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector17# #argv <- list(quote(list(X[[2L]])), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list [[2]] X[[2L]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector18# #argv <- list(NA, 'logical'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector19#Ignored.ImplementationError# #argv <- list(NULL, 'double'); .Internal(as.vector(argv[[1]], argv[[2]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector2# #argv <- list(structure(character(0), package = character(0), class = structure('ObjectsWithPackage', package = 'methods')), 'character'); .Internal(as.vector(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector20# #argv <- list(quote(list(x = c(1, 1, 1, 1, 1, 2, 2, 3, 3, 3, 3, 3, 3, 4, 4, 4, 5, 5, 5, 5, 6, 6, 6, 6, 6, 6, 7, 7, 7, 7, 7, 7, 7, 7, 7, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 9, 9, 9, 9, 9, 11, 12), y = c(73, 73, 70, 74, 75, 115, 105, 107, 124, 107, 116, 125, 102, 144, 178, 149, 177, 124, 157, 128, 169, 165, 186, 152, 181, 139, 173, 151, 138, 181, 152, 188, 173, 196, 180, 171, 188, 174, 198, 172, 176, 162, 188, 182, 182, 141, 191, 190, 159, 170, 163, 197), weight = c(1, rep(0.1, 51)))), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list $x c(1, 1, 1, 1, 1, 2, 2, 3, 3, 3, 3, 3, 3, 4, 4, 4, 5, 5, 5, 5, 6, 6, 6, 6, 6, 6, 7, 7, 7, 7, 7, 7, 7, 7, 7, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 9, 9, 9, 9, 9, 11, 12) $y c(73, 73, 70, 74, 75, 115, 105, 107, 124, 107, 116, 125, 102, 144, 178, 149, 177, 124, 157, 128, 169, 165, 186, 152, 181, 139, 173, 151, 138, 181, 152, 188, 173, 196, 180, 171, 188, 174, 198, 172, 176, 162, 188, 182, 182, 141, 191, 190, 159, 170, 163, 197) $weight c(1, rep(0.1, 51)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector21#Ignored.ImplementationError# #argv <- list(NULL, 'integer'); .Internal(as.vector(argv[[1]], argv[[2]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector22# #argv <- list(quote(list(ff <- factor(c(1:2, NA, 2), exclude = NULL))), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list [[2]] ff <- factor(c(1:2, NA, 2), exclude = NULL) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector23# #argv <- list(c(-1, 3, 1, 1, 5, 1), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] -1 3 1 1 5 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector24# #argv <- list(quote(list(y, x1, x2)), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list [[2]] y [[3]] x1 [[4]] x2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector25# #argv <- list(structure(c(0.005, 50, 550), .Names = c('k', 'g1', 'g2')), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) $k [1] 0.005 $g1 [1] 50 $g2 [1] 550 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector26# #argv <- list(quote(list(V1 = c('a', 'd e', 'h'), V2 = c('b\'', 'f', 'i'), V3 = c('c', 'g', 'j\nk l m'))), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list $V1 c("a", "d e", "h") $V2 c("b'", "f", "i") $V3 c("c", "g", "j\nk l m") ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector27# #argv <- list(NA, 'integer'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector28# #argv <- list(c(NA, NaN), 'character'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] NA "NaN" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector29# #argv <- list(c(NA, NaN), 'integer'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector3# #argv <- list(quote(list(ya, x[rep.int(NA_integer_, nyy), nm.x, drop = FALSE])), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list [[2]] ya [[3]] x[rep.int(NA_integer_, nyy), nm.x, drop = FALSE] ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector30# #argv <- list(list('a', 'b', 'c'), 'pairlist'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] [1] "a" [[2]] [1] "b" [[3]] [1] "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector31# #argv <- list(structure(1:12, .Dim = 3:4, .Dimnames = list(c('A', 'B', 'C'), c('D', 'E', 'F', 'G'))), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 1 2 3 4 5 6 7 8 9 10 11 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector32# #argv <- list(quote(list(x = c(2:3, NA), y = c(3:4, NA))), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list $x c(2:3, NA) $y c(3:4, NA) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector33# #argv <- list(quote(list(cut(Dtimes, '3 months'))), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list [[2]] cut(Dtimes, "3 months") ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector34# #argv <- list(quote(list(a = I('abc'), b = I('def\'gh'))), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list $a I("abc") $b I("def'gh") ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector35# #argv <- list(structure(list(a = 1), .Names = 'a'), 'double'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector36# #argv <- list(structure(c(0, 0.0123079727211562, 0.00970882237374837, 0.62883302403078, 0.689843718945119, 0.689843718944881, 0.672453157851573, 0.534493702379921, 0.171039529097608, 0.17103952909345, 0.50219835346871, 0.530975095958163, 0.0050966004562048, 0.0106639382954144, 0.811192712625201, 0.0957932531337699), .Names = c('(Intercept)', 'M.userY', 'TempHigh', 'M.userY:TempHigh', 'SoftMedium', 'SoftSoft', 'M.userY:SoftMedium', 'M.userY:SoftSoft', 'TempHigh:SoftMedium', 'TempHigh:SoftSoft', 'M.userY:TempHigh:SoftMedium', 'M.userY:TempHigh:SoftSoft', 'BrandM', 'M.userY:BrandM', 'TempHigh:BrandM', 'M.userY:TempHigh:BrandM')), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 0.000000000 0.012307973 0.009708822 0.628833024 0.689843719 0.689843719 [7] 0.672453158 0.534493702 0.171039529 0.171039529 0.502198353 0.530975096 [13] 0.005096600 0.010663938 0.811192713 0.095793253 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector37# #argv <- list(c(-2, -1.95959595959596, -1.91919191919192, -1.87878787878788, -1.83838383838384, -1.7979797979798, -1.75757575757576, -1.71717171717172, -1.67676767676768, -1.63636363636364, -1.5959595959596, -1.55555555555556, -1.51515151515152, -1.47474747474747, -1.43434343434343, -1.39393939393939, -1.35353535353535, -1.31313131313131, -1.27272727272727, -1.23232323232323, -1.19191919191919, -1.15151515151515, -1.11111111111111, -1.07070707070707, -1.03030303030303, -0.98989898989899, -0.949494949494949, -0.909090909090909, -0.868686868686869, -0.828282828282828, -0.787878787878788, -0.747474747474747, -0.707070707070707, -0.666666666666667, -0.626262626262626, -0.585858585858586, -0.545454545454545, -0.505050505050505, -0.464646464646465, -0.424242424242424, -0.383838383838384, -0.343434343434343, -0.303030303030303, -0.262626262626263, -0.222222222222222, -0.181818181818182, -0.141414141414141, -0.101010101010101, -0.0606060606060606, -0.0202020202020201, 0.0202020202020203, 0.060606060606061, 0.101010101010101, 0.141414141414141, 0.181818181818182, 0.222222222222222, 0.262626262626263, 0.303030303030303, 0.343434343434343, 0.383838383838384, 0.424242424242424, 0.464646464646465, 0.505050505050505, 0.545454545454546, 0.585858585858586, 0.626262626262626, 0.666666666666667, 0.707070707070707, 0.747474747474748, 0.787878787878788, 0.828282828282829, 0.868686868686869, 0.909090909090909, 0.94949494949495, 0.98989898989899, 1.03030303030303, 1.07070707070707, 1.11111111111111, 1.15151515151515, 1.19191919191919, 1.23232323232323, 1.27272727272727, 1.31313131313131, 1.35353535353535, 1.39393939393939, 1.43434343434343, 1.47474747474747, 1.51515151515152, 1.55555555555556, 1.5959595959596, 1.63636363636364, 1.67676767676768, 1.71717171717172, 1.75757575757576, 1.7979797979798, 1.83838383838384, 1.87878787878788, 1.91919191919192, 1.95959595959596, 2), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] -2.00000000 -1.95959596 -1.91919192 -1.87878788 -1.83838384 -1.79797980 [7] -1.75757576 -1.71717172 -1.67676768 -1.63636364 -1.59595960 -1.55555556 [13] -1.51515152 -1.47474747 -1.43434343 -1.39393939 -1.35353535 -1.31313131 [19] -1.27272727 -1.23232323 -1.19191919 -1.15151515 -1.11111111 -1.07070707 [25] -1.03030303 -0.98989899 -0.94949495 -0.90909091 -0.86868687 -0.82828283 [31] -0.78787879 -0.74747475 -0.70707071 -0.66666667 -0.62626263 -0.58585859 [37] -0.54545455 -0.50505051 -0.46464646 -0.42424242 -0.38383838 -0.34343434 [43] -0.30303030 -0.26262626 -0.22222222 -0.18181818 -0.14141414 -0.10101010 [49] -0.06060606 -0.02020202 0.02020202 0.06060606 0.10101010 0.14141414 [55] 0.18181818 0.22222222 0.26262626 0.30303030 0.34343434 0.38383838 [61] 0.42424242 0.46464646 0.50505051 0.54545455 0.58585859 0.62626263 [67] 0.66666667 0.70707071 0.74747475 0.78787879 0.82828283 0.86868687 [73] 0.90909091 0.94949495 0.98989899 1.03030303 1.07070707 1.11111111 [79] 1.15151515 1.19191919 1.23232323 1.27272727 1.31313131 1.35353535 [85] 1.39393939 1.43434343 1.47474747 1.51515152 1.55555556 1.59595960 [91] 1.63636364 1.67676768 1.71717172 1.75757576 1.79797980 1.83838384 [97] 1.87878788 1.91919192 1.95959596 2.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector38# #argv <- list(integer(0), 'pairlist'); .Internal(as.vector(argv[[1]], argv[[2]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector39# #argv <- list(structure('lightblue', .Names = 'bg'), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) $bg [1] "lightblue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector4# #argv <- list(NA_character_, 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector40# #argv <- list(c(NA, NaN), 'logical'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector41# #argv <- list(structure(list(`character(0)` = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'character(0)', row.names = character(0), class = 'data.frame'), 'pairlist'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] character(0) <0 rows> (or 0-length row.names) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector42# #argv <- list(NA, 'double'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector43# #argv <- list(list('GRID.VP.12'), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] [1] "GRID.VP.12" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector44#Ignored.ImplementationError# #argv <- list(NULL, 'logical'); .Internal(as.vector(argv[[1]], argv[[2]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector45# #argv <- list(structure(1:20, .Tsp = c(1, 20, 1), class = 'ts'), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector47# #argv <- list(structure(c(0.1, 0.8, 1, 0.5, 0.8, 1, 0, 0.5, 1), .Dim = c(3L, 3L), .Dimnames = list(c('(3.59,4.5]', '(4.5,5.4]', '(5.4,6.31]'), c('ctrl', 'trt1', 'trt2'))), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 0.1 0.8 1.0 0.5 0.8 1.0 0.0 0.5 1.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector48# #argv <- list(integer(0), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector49# #argv <- list(structure(c(1L, 1L), .Label = 'registered S3method for $', class = 'factor'), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] "registered S3method for $" "registered S3method for $" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector5# #argv <- list(structure(NA_integer_, .Label = c('Australia', 'UK', 'US'), class = 'factor'), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector50# #argv <- list('1.3', 'double'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector51# #argv <- list(c(8L, 11L, 14L, 16L, 19L, 4L, 6L, 9L, 15L, NA, 7L, 10L, 20L), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 8 11 14 16 19 4 6 9 15 NA 7 10 20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector52# #argv <- list(structure(c(5.4278733372119e-07, 0.000257866433233453, NA), .Names = c('x', 'm', 'Residuals')), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 5.427873e-07 2.578664e-04 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector53# #argv <- list('1.3', 'pairlist'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] [1] "1.3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector54# #argv <- list(1L, 'pairlist'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector55# #argv <- list(NULL, 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector56# #argv <- list(quote(list(expand.grid(Hair = lab$Hair, Eye = lab$Eye, Sex = lab$Sex, stringsAsFactors = TRUE), Fr = as.vector(HairEyeColor))), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list [[2]] expand.grid(Hair = lab$Hair, Eye = lab$Eye, Sex = lab$Sex, stringsAsFactors = TRUE) $Fr as.vector(HairEyeColor) ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector57# #argv <- list(FALSE, 'pairlist'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector59# #argv <- list(structure(list(`character(0)` = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'character(0)', row.names = character(0), class = 'data.frame'), 'character'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] "integer(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector6# #argv <- list(structure(list(a1 = 1:3, a2 = 4:6, a3 = 3.14159265358979, a4 = c('a', 'b', 'c')), .Names = c('a1', 'a2', 'a3', 'a4')), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) $a1 [1] 1 2 3 $a2 [1] 4 5 6 $a3 [1] 3.141593 $a4 [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector60# #argv <- list(1L, 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector61# #argv <- list(c('The C and R code has been reformatted for legibility.', 'The old compatibility function rpconvert() has been removed.', 'The cross-validation functions allow for user interrupt at the end\nof evaluating each split.', 'Variable Reliability in data set car90 is corrected to be an\nordered factor, as documented.', 'Surrogate splits are now considered only if they send two or more\ncases _with non-zero weight_ each way. For numeric/ordinal\nvariables the restriction to non-zero weights is new: for\ncategorical variables this is a new restriction.', 'Surrogate splits which improve only by rounding error over the\ndefault split are no longer returned. Where weights and missing\nvalues are present, the splits component for some of these was not\nreturned correctly.', 'A fit of class \'rpart\' now contains a component for variable\n‘importance’, which is reported by the summary() method.', 'The text() method gains a minlength argument, like the labels()\nmethod. This adds finer control: the default remains pretty =\nNULL, minlength = 1L.', 'The handling of fits with zero and fractional weights has been\ncorrected: the results may be slightly different (or even\nsubstantially different when the proportion of zero weights is\nlarge).', 'Some memory leaks have been plugged.', 'There is a second vignette, longintro.Rnw, a version of the\noriginal Mayo Tecnical Report on rpart.', 'Added dataset car90, a corrected version of the S-PLUS dataset\ncar.all (used with permission).', 'This version does not use paste0{} and so works with R 2.14.x.', 'Merged in a set of Splus code changes that had accumulated at Mayo\nover the course of a decade. The primary one is a change in how\nindexing is done in the underlying C code, which leads to a major\nspeed increase for large data sets. Essentially, for the lower\nleaves all our time used to be eaten up by bookkeeping, and this\nwas replaced by a different approach. The primary routine also\nuses .Call{} so as to be more memory efficient.', 'The other major change was an error for asymmetric loss matrices,\nprompted by a user query. With L=loss asymmetric, the altered\npriors were computed incorrectly - they were using L\' instead of L.\nUpshot - the tree would not not necessarily choose optimal splits\nfor the given loss matrix. Once chosen, splits were evaluated\ncorrectly. The printed “improvement” values are of course the\nwrong ones as well. It is interesting that for my little test\ncase, with L quite asymmetric, the early splits in the tree are\nunchanged - a good split still looks good.', 'Add the return.all argument to xpred.rpart().', 'Added a set of formal tests, i.e., cases with known answers to\nwhich we can compare.', 'Add a usercode vignette, explaining how to add user defined\nsplitting functions.', 'The class method now also returns the node probability.', 'Add the stagec data set, used in some tests.', 'The plot.rpart routine needs to store a value that will be visible\nto the rpartco routine at a later time. This is now done in an\nenvironment in the namespace.', 'Force use of registered symbols in R >= 2.16.0', 'Update Polish translations.', 'Work on message formats.', 'Add Polish translations', 'rpart, rpart.matrix: allow backticks in formulae.', 'tests/backtick.R: regession test', 'src/xval.c: ensure unused code is not compiled in.', 'Change description of margin in ?plot.rpart as suggested by Bill\nVenables.'), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] "The C and R code has been reformatted for legibility." [2] "The old compatibility function rpconvert() has been removed." [3] "The cross-validation functions allow for user interrupt at the end\nof evaluating each split." [4] "Variable Reliability in data set car90 is corrected to be an\nordered factor, as documented." [5] "Surrogate splits are now considered only if they send two or more\ncases _with non-zero weight_ each way. For numeric/ordinal\nvariables the restriction to non-zero weights is new: for\ncategorical variables this is a new restriction." [6] "Surrogate splits which improve only by rounding error over the\ndefault split are no longer returned. Where weights and missing\nvalues are present, the splits component for some of these was not\nreturned correctly." [7] "A fit of class 'rpart' now contains a component for variable\n‘importance’, which is reported by the summary() method." [8] "The text() method gains a minlength argument, like the labels()\nmethod. This adds finer control: the default remains pretty =\nNULL, minlength = 1L." [9] "The handling of fits with zero and fractional weights has been\ncorrected: the results may be slightly different (or even\nsubstantially different when the proportion of zero weights is\nlarge)." [10] "Some memory leaks have been plugged." [11] "There is a second vignette, longintro.Rnw, a version of the\noriginal Mayo Tecnical Report on rpart." [12] "Added dataset car90, a corrected version of the S-PLUS dataset\ncar.all (used with permission)." [13] "This version does not use paste0{} and so works with R 2.14.x." [14] "Merged in a set of Splus code changes that had accumulated at Mayo\nover the course of a decade. The primary one is a change in how\nindexing is done in the underlying C code, which leads to a major\nspeed increase for large data sets. Essentially, for the lower\nleaves all our time used to be eaten up by bookkeeping, and this\nwas replaced by a different approach. The primary routine also\nuses .Call{} so as to be more memory efficient." [15] "The other major change was an error for asymmetric loss matrices,\nprompted by a user query. With L=loss asymmetric, the altered\npriors were computed incorrectly - they were using L' instead of L.\nUpshot - the tree would not not necessarily choose optimal splits\nfor the given loss matrix. Once chosen, splits were evaluated\ncorrectly. The printed “improvement” values are of course the\nwrong ones as well. It is interesting that for my little test\ncase, with L quite asymmetric, the early splits in the tree are\nunchanged - a good split still looks good." [16] "Add the return.all argument to xpred.rpart()." [17] "Added a set of formal tests, i.e., cases with known answers to\nwhich we can compare." [18] "Add a usercode vignette, explaining how to add user defined\nsplitting functions." [19] "The class method now also returns the node probability." [20] "Add the stagec data set, used in some tests." [21] "The plot.rpart routine needs to store a value that will be visible\nto the rpartco routine at a later time. This is now done in an\nenvironment in the namespace." [22] "Force use of registered symbols in R >= 2.16.0" [23] "Update Polish translations." [24] "Work on message formats." [25] "Add Polish translations" [26] "rpart, rpart.matrix: allow backticks in formulae." [27] "tests/backtick.R: regession test" [28] "src/xval.c: ensure unused code is not compiled in." [29] "Change description of margin in ?plot.rpart as suggested by Bill\nVenables." ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector63# #argv <- list(2, 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector64# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) $c0 factor(0) Levels: attr(,"row.names") character(0) attr(,"class") c0 "integer(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector66# #argv <- list(3.18309886183776e-301, 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 3.183099e-301 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector67# #argv <- list(quote(list(a = 1:3, b = letters[1:3])), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list $a 1:3 $b letters[1:3] ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector68# #argv <- list(NA, 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector69# #argv <- list(c(200, 500, 1000, 2000, 5000, 10000, 20000, 50000, 1e+05, 2e+05, 5e+05), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 2e+02 5e+02 1e+03 2e+03 5e+03 1e+04 2e+04 5e+04 1e+05 2e+05 5e+05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector7# #argv <- list(quote(list(ii = 1:10, xx = pi * -3:6)), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list $ii 1:10 $xx pi * -3:6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector70# #argv <- list(structure(c(-0.560475646552213+0i, 0.7424437487+0.205661411508856i, 1.39139505579429-0.26763356813179i, 0.928710764113827-0.221714979045717i, -0.46926798541295+1.18846175213664i, 0.7424437487-0.205661411508856i, 0.460916205989202+0i, -0.452623703774585+0.170604003753717i, -0.094501186832143+0.54302538277632i, -0.331818442379127+0.612232958468282i, 1.39139505579429+0.26763356813179i, -0.452623703774585-0.170604003753717i, 0.400771450594052+0i, -0.927967220342259+0.479716843914174i, -0.790922791530657+0.043092176305418i, 0.928710764113827+0.221714979045717i, -0.094501186832143-0.54302538277632i, -0.927967220342259-0.479716843914174i, 0.701355901563686+0i, -0.600841318509537+0.213998439984336i, -0.46926798541295-1.18846175213664i, -0.331818442379127-0.612232958468282i, -0.790922791530657-0.043092176305418i, -0.600841318509537-0.213998439984336i, -0.625039267849257+0i), .Dim = c(5L, 5L)), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] -0.5604756+0.0000000i 0.7424437+0.2056614i 1.3913951-0.2676336i [4] 0.9287108-0.2217150i -0.4692680+1.1884618i 0.7424437-0.2056614i [7] 0.4609162+0.0000000i -0.4526237+0.1706040i -0.0945012+0.5430254i [10] -0.3318184+0.6122330i 1.3913951+0.2676336i -0.4526237-0.1706040i [13] 0.4007715+0.0000000i -0.9279672+0.4797168i -0.7909228+0.0430922i [16] 0.9287108+0.2217150i -0.0945012-0.5430254i -0.9279672-0.4797168i [19] 0.7013559+0.0000000i -0.6008413+0.2139984i -0.4692680-1.1884618i [22] -0.3318184-0.6122330i -0.7909228-0.0430922i -0.6008413-0.2139984i [25] -0.6250393+0.0000000i ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector71# #argv <- list(structure(c(2.2250738585072e-308, 1.79769313486232e+308), .Names = c('double.xmin', 'double.xmax')), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] 2.225074e-308 Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector72# #argv <- list(structure(1.6, class = 'object_size'), 'character'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] "1.6" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector73# #argv <- list(structure(NA_integer_, .Label = c('no', 'yes'), class = 'factor'), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector74# #argv <- list(FALSE, 'character'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] "FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector75# #argv <- list(3.14159265358979, 'pairlist'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] [1] 3.141593 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector76# #argv <- list(structure(list(c0 = structure(character(0), class = 'AsIs')), .Names = 'c0', row.names = character(0), class = 'data.frame'), 'character'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] "character(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector77# #argv <- list(structure(list(), .Dim = 0L), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector8# #argv <- list(c(-1L, -2L), 'any'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] -1 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector80# #argv <- list(structure('1', .Tsp = c(1, 1, 1), class = 'ts'), 'character'); .Internal(as.vector(argv[[1]], argv[[2]])) [1] "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector81# #argv <- list('diff', 'symbol'); .Internal(as.vector(argv[[1]], argv[[2]])) diff ##com.oracle.truffle.r.test.builtins.TestBuiltin_asvector.testasvector9# #argv <- list(quote(list(x = 1:100, z = 1:100 + rnorm(100, 10))), 'list'); .Internal(as.vector(argv[[1]], argv[[2]])) [[1]] list $x 1:100 $z 1:100 + rnorm(100, 10) ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan.testTrigExp# #{ atan() } Error in atan() : 0 arguments passed to 'atan' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan.testTrigExp# #{ atan(0.4) } [1] 0.3805064 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan.testTrigExp# #{ atan(c(0.3,0.6,0.9)) } [1] 0.2914568 0.5404195 0.7328151 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan.testatan1# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100', '101', '102', '103', '104', '105', '106', '107', '108', '109', '110', '111', '112', '113', '114', '115', '116', '117', '118', '119', '120', '121', '122', '123', '124', '125', '126', '127', '128', '129', '130', '131', '132', '133', '134', '135', '136', '137', '138', '139', '140', '141', '142', '143', '144', '145', '146', '147', '148', '149', '150', '151', '152', '153', '154', '155', '156', '157', '158', '159', '160', '161', '162', '163', '164', '165', '166', '167', '168', '169', '170', '171', '172', '173', '174', '175', '176', '177', '178', '179', '180', '181', '182', '183', '184', '185', '186', '187', '188', '189', '190', '191', '192', '193', '194', '195', '196', '197', '198', '199', '200', '201', '202', '203', '204', '205', '206', '207', '208', '209', '210', '211', '212', '213', '214', '215', '216', '217', '218', '219', '220', '221', '222', '223', '224', '225', '226', '227', '228')));atan(argv[[1]]); 1 2 3 4 5 6 7 8 9 10 11 12 13 15 16 17 18 19 20 21 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 42 43 44 45 46 47 48 49 50 51 52 53 54 55 56 57 58 59 60 61 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 62 63 64 65 66 67 68 69 70 71 72 73 74 75 76 77 78 79 80 81 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 82 83 84 85 86 87 88 89 90 91 92 93 94 95 96 97 98 99 100 101 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 102 103 104 105 106 107 108 109 110 111 112 113 114 115 116 117 118 119 120 121 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 122 123 124 125 126 127 128 129 130 131 132 133 134 135 136 137 138 139 140 141 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 142 143 144 145 146 147 148 149 150 151 152 153 154 155 156 157 158 159 160 161 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 162 163 164 165 166 167 168 169 170 171 172 173 174 175 176 177 178 179 180 181 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 182 183 184 185 186 187 188 189 190 191 192 193 194 195 196 197 198 199 200 201 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 202 203 204 205 206 207 208 209 210 211 212 213 214 215 216 217 218 219 220 221 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 222 223 224 225 226 227 228 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan.testatan2# #argv <- list(c(-Inf, Inf));atan(argv[[1]]); [1] -1.570796 1.570796 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan.testatan3# #argv <- list(c(0+2i, 0.0001+2i, 0-2i, 0-2.0001i));atan(argv[[1]]); [1] 1.570796+0.549306i 1.570763+0.549306i -1.570796-0.549306i [4] -1.570796-0.549273i ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan.testatan4# #argv <- list(c(1.24374261655622, 0.0991858914142951, -2.20142053912221, 2.32991997369528, -1.81371893641746, -2.23549697963848, 1.2062731926336, 0.766855355229013, 2.22205301460314, 3.00826513920171, 2.93956891545304, -0.947558891656842, -1.25682397176386, -0.535715772527751, 3.41845348048775, -0.760770219081429, -1.17237584279591, 5.89658401779422, 4.83929989447739, 1.29127425323328, 5.07843950370286, -0.812083060727, 0.688022442899665, 0.51448669913956, -0.286066209156396, -0.571116279122374, 3.99296063466557, 0.543926802451157, 10.5876703046153, -0.012750328000196, 8.35693622233428, -0.357306991432726, 4.27528487251696, 6.30217771913028, 3.89678155886045, -1.57897283794064, -2.06992463735805, 4.67986125893053, -1.26868871126894, 0.0676543743900469, 3.24354507548999, 0.242170808041476, 3.39848727561001, -0.616002138333813, 4.61847372836275, 1.27216752717472, -0.280512588403515, -0.898619929521427, -1.39985243813315, -1.28443284360156, 2.63389613373223, 6.30217771913028, 1.87342709084826, -1.09797072834446, 5.71334116764491, 13.1134896151196, 3.66949044715118, -1.08958378903637, 0.8976473859976, 0.169792654329705, 2.15662832698598, 2.85593682526588, 5.94427279099212, 3.06088249587567, 5.71334116764491, 2.35752884553298, -1.60367725265451, 0.275679954649422, 2.06745683332381, -1.66968494417226, 1.25318650417107, 10.8387072712787, 3.66949044715118, 2.11807401040277, 0.289193352142719, -1.16420273509137, 0.750915507554624, 10.8387072712787, 2.83949743554363, -1.49627880689407, 4.61847372836275, 2.52897165841403, 2.99093712861336, -1.55047774121799, 1.45900279946893, -0.889632055927773, 3.35896467002158, -1.30399295303346, 3.06088249587567, -0.951966998076272, 1.9567142584347, 4.83929989447739, 1.88517906265842, -0.640640247845954, 7.94407524992589, 2.7907339351624, 1.2062731926336, -0.037046093389687, 3.00826513920171, -0.49471891801084, 0.131065830042764, 0.742978487169905, 4.27528487251696, 2.82315118733936, 3.18752185714054, -0.335573516981329, 10.8387072712787, 0.26894691754398, 0.847902962488109, 9.94387770885966, 2.75867688212949, 1.46917954755241, 2.4562951432938, -0.308174402320662, 10.3567386812681, 2.30257280126274, -0.308174402320662, 1.41865102155398, 0.750915507554624, 0.182817981601453, 2.48514643462545, -0.447890214901362, 6.24824895102907, -0.489553106263216, 2.37143299336077, 4.71105188801319, 5.94427279099212, -0.453131097523732, -0.410935024130492, 1.36899222090483, 2.44197697450093, 0.831510275829206, -0.235694520704707, 1.6370875838366, -0.235694520704707, 0.688022442899665, 0.56620571694393, 0.0865319014350673, 0.965336240640277, 2.4562951432938, 0.442174515567164, 2.16959511326347, 5.84967070625675, 0.0802256582898436, 0.807094572229046, 0.831510275829206, 3.06088249587567, 7.84947316519051, 0.939766456519272, 2.08002811722361, 0.169792654329705, 1.16011052636907, 2.74278094610367, 3.18752185714054, 1.03465140856114, 0.742978487169905, 1.38875329192844, 2.7907339351624, 0.649399307990452, 0.588658009946432, 1.62630213168625, 1.37885583765837, 3.4588052584027, 0.378607817368726, 1.64791350682152, 2.55856273925465, 1.11467486151704, 2.75867688212949, 1.44886182210277, 1.29127425323328, 0.872667965105639, 2.51428915807333, 0.603723867107512, 1.27216752717472, 1.33960210165592, 2.77466088473214, 2.68005879999676, 3.39848727561001, 1.61555684891069, 1.30087527736898, 1.45900279946893, 0.856134366332116, 1.58355905227488, 1.37885583765837, 1.00846268026794, 1.44886182210277, 1.72485420222661, 4.19550729872178, 1.43875636487019, 1.60485143740593, 5.07843950370286, 3.69143051554687, 2.13086828897653, 1.61555684891069, 2.13086828897653, 1.90882759744288, 1.51024935267055, 1.54143998175321, 3.6046538963397, 5.15057088795887, 5.99276309359934, 1.94466787312459, 2.44197697450093, 2.00540917116861, 4.32972243262905, 2.14371955784334, 1.9567142584347, 1.98095898169889, 2.88909931785647, 1.80390312212468, 2.18262044053522, 2.69561196483408, 4.71105188801319, 10.3567386812681, 2.16959511326347, 2.5884604688802, 2.72697211153424, 2.31621398549464, 2.85593682526588, 2.51428915807333, 2.42772951300254, 4.04227987136562, 2.64920176692422, 2.60352632604128, 4.32972243262905, 2.87247042403941, 2.82315118733936));atan(argv[[1]]); [1] 0.89360601 0.09886254 -1.14441195 1.16537423 -1.06691467 -1.15016680 [7] 0.87862112 0.65420155 1.14791390 1.24987024 1.24289116 -0.75847808 [13] -0.89870956 -0.49181033 1.28620681 -0.65035849 -0.86458125 1.40280496 [19] 1.36702298 0.91184320 1.37637283 -0.68206536 0.60264202 0.47516969 [25] -0.27862499 -0.51891066 1.32540290 0.49816853 1.47662620 -0.01274964 [31] 1.45170152 -0.34316950 1.34102464 1.41343296 1.31959494 -1.00623422 [37] -1.12075229 1.36028071 -0.90328253 0.06755144 1.27173812 0.23759655 [43] 1.28462440 -0.55210276 1.35756611 0.90461337 -0.27348396 -0.73205211 [49] -0.95049699 -0.90926985 1.20794147 1.41343296 1.08049045 -0.83206212 [55] 1.39752259 1.49468628 1.30473963 -0.82824352 0.73151379 0.16818863 [61] 1.13661896 1.23398984 1.40412777 1.25502475 1.39752259 1.16962639 [67] -1.01322824 0.26899825 1.12028486 -1.03117472 0.89729697 1.47879486 [73] 1.30473963 1.12969468 0.28151319 -0.86112524 0.64408678 1.47879486 [79] 1.23218519 -0.98164677 1.35756611 1.19424649 1.24813701 -0.99797056 [85] 0.96993662 -0.72705734 1.28144105 -0.91658221 1.25502475 -0.76079564 [91] 1.09833926 1.36702298 1.08308370 -0.56976726 1.44557499 1.22672110 [97] 0.87862112 -0.03702916 1.24987024 -0.45941383 0.13032298 0.63899217 [103] 1.34102464 1.23037223 1.26679735 -0.32376536 1.47879486 0.26273005 [109] 0.70327537 1.47056890 1.22303587 0.97317396 1.18416953 -0.29893927 [115] 1.47453923 1.16107763 -0.29893927 0.95679268 0.64408678 0.18082114 [121] 1.18823064 -0.42109804 1.41209734 -0.45525522 1.17173605 1.36163405 [127] 1.40412777 -0.42545470 -0.38989743 0.93991572 1.18212356 0.69366141 [133] -0.23147003 1.02244371 -0.23147003 0.60264202 0.51520003 0.08631689 [139] 0.76776242 1.18416953 0.41632723 1.13890224 1.40148320 0.08005420 [145] 0.67905195 0.69366141 1.25502475 1.44408183 0.75435618 1.12265663 [151] 0.16818863 0.85938432 1.22118026 1.26679735 0.80242715 0.63899217 [157] 0.94672698 1.22672110 0.57595283 0.53203806 1.01949880 0.94333151 [163] 1.28935344 0.36192993 1.02537138 1.19820751 0.83957323 1.22303587 [169] 0.96667994 0.91184320 0.71750767 1.19225120 0.54315314 0.90461337 [175] 0.92954520 1.22488279 1.21366950 1.28462440 1.01653654 0.91542594 [181] 0.96993662 0.70804462 1.00754442 0.94333151 0.78961165 0.96667994 [187] 1.04539278 1.33681188 0.96340381 1.01355681 1.37637283 1.30624799 [193] 1.13201528 1.01653654 1.13201528 1.08822633 0.98593251 0.99530454 [199] 1.30018245 1.37902893 1.40545183 1.09583230 1.18212356 1.10822822 [205] 1.34381476 1.13432334 1.09833926 1.10331131 1.23757454 1.06461685 [211] 1.14117328 1.21556060 1.36163405 1.47453923 1.13890224 1.20212967 [217] 1.21931590 1.16323153 1.23398984 1.19225120 1.18006719 1.32828021 [223] 1.20986002 1.20407638 1.34381476 1.23578627 1.23037223 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan.testatan5# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));atan(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan.testatan6# #argv <- list(-1.46941282670977e-16);atan(argv[[1]]); [1] -1.469413e-16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testTrigExp# #{ atan2() } Error in atan2() : argument "y" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testTrigExp# #{ atan2(0.4, 0.8) } [1] 0.4636476 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testTrigExp# #{ atan2(0.4, c(0.3,0.6,0.9)) } [1] 0.9272952 0.5880026 0.4182243 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testTrigExp# #{ atan2(0.7) } Error in atan2(0.7) : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testTrigExp# #{ atan2(2, as.symbol('45')) } Error in atan2(2, as.symbol("45")) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testTrigExp# #{ atan2(2, new.env()) } Error in atan2(2, new.env()) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testTrigExp# #{ atan2(NULL, 1) } Error in atan2(NULL, 1) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testTrigExp# #{ atan2(c(0.3,0.6,0.9), 0.4) } [1] 0.6435011 0.9827937 1.1525720 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testTrigExp# #{ atan2(c(0.3,0.6,0.9), c(0.4, 0.3)) } [1] 0.6435011 1.1071487 1.1525720 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan21# #.Internal(atan2(structure(1:2, .Names = c('a','b')), 1)); a b 0.7853982 1.1071487 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan21# #.Internal(atan2(structure(1:6, dim = c(2,3)), 1)); [,1] [,2] [,3] [1,] 0.7853982 1.249046 1.373401 [2,] 1.1071487 1.325818 1.405648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan21# #.Internal(atan2(structure(c(1,2), .Names = c('a','b')), 1)); a b 0.7853982 1.1071487 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan21# #argv <- list(structure(0.142857142857143, .Names = 'Var2'), 1.75510204081633); .Internal(atan2(argv[[1]], argv[[2]])) Var2 0.08121631 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan21# #argv <- list(structure(0.142857142857143, .Names = 'Var2'), structure(1.75510204081633, .Names = 'Var1')); .Internal(atan2(argv[[1]], argv[[2]])) Var2 0.08121631 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan21# #x <- 1:4; class(x) <- 'asdfasdf'; attr(x, 'f') <- 'fff'; names(x) <- c('a','b','c','d'); y <- 1:2; class(y) <- 'fds'; attr(y, 'a') <- 'Asdf'; names(y) <- c('v','y'); .Internal(atan2(x,1)); .Internal(atan2(x,x)); .Internal(atan2(x,y)); .Internal(atan2(y,x)); .Internal(atan2(y,1)) a b c d 0.7853982 1.1071487 1.2490458 1.3258177 attr(,"class") [1] "asdfasdf" attr(,"f") [1] "fff" a b c d 0.7853982 0.7853982 0.7853982 0.7853982 attr(,"class") [1] "asdfasdf" attr(,"f") [1] "fff" a b c d 0.7853982 0.7853982 1.2490458 1.1071487 attr(,"class") [1] "asdfasdf" attr(,"f") [1] "fff" a b c d 0.7853982 0.7853982 0.3217506 0.4636476 attr(,"class") [1] "asdfasdf" attr(,"f") [1] "fff" v y 0.7853982 1.1071487 attr(,"class") [1] "fds" attr(,"a") [1] "Asdf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan22# #argv <- list(structure(-0.224489795918367, .Names = 'Var2'), structure(-0.816326530612245, .Names = 'Var1')); .Internal(atan2(argv[[1]], argv[[2]])) Var2 -2.873226 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan23# #argv <- list(c(-1.95681154249341, -2.88854075894443, -2.84850921846233, -2.14635417317387, -1.72790445779804, -0.92649412488672, -0.261537463816701, 0.948205247045638, 1.0990096500205, 2.09024037060933, 2.90928417418961, 4.00425294069879, 1.70515935701163), c(-3.2406391957027, -2.61163262017643, -0.21977838696678, 1.24931893031091, 1.6032898858835, 2.16902716372255, 2.15792786802985, 2.10075226013806, 2.04989923648162, 1.49269068253165, 0.515893014329757, -2.61745072267338, -4.64929811590859)); .Internal(atan2(argv[[1]], argv[[2]])) [1] -2.5983580 -2.3058916 -1.6477994 -1.0436683 -0.8227891 -0.4036880 [7] -0.1206102 0.4239882 0.4921311 0.9506540 1.3952942 2.1497456 [13] 2.7900689 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan24#Ignored.Unimplemented# #argv <- list(0+1i, 0+0i); .Internal(atan2(argv[[1]], argv[[2]])) [1] 1.570796+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan25# #argv <- list(2.43782895752771e-05, 0.999996523206508); .Internal(atan2(argv[[1]], argv[[2]])) [1] 2.437837e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atan2.testatan26# #argv <- list(logical(0), logical(0)); .Internal(atan2(argv[[1]], argv[[2]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_atanh.testatanh1# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));atanh(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_atanh.testatanh2# #argv <- list(c(0.667355731370168, 0.757545006911892, 0.835315653735585, 0.984260691393257, 0.997724361757832, 0.998320334761744, 0.995857200407461, 0.978447456936914, 0.924289918318784, 0.794303899816803, 0.772144244057747, 0.886598050753707, 0.927287003572071, 0.862971883028345, 0.864426227271356, 0.927240697865085, 0.892356439729065, 0.753876685479294, 0.834371238466667, 0.856663357154979, 0.836217049107607, 0.820080611345367, 0.881122397467922, 0.964328668319385, 0.870112695225674, 0.897689370465451, 0.872889563044137, 0.716354206299899, 0.634385015212608, 0.77586178284932, 0.639202570327528, 0.710504816816848, 0.825388608284517, 0.812993921221196, 0.705406278672692, 0.577944207218662));atanh(argv[[1]]); [1] 0.8059603 0.9904286 1.2054706 2.4184202 3.3887517 3.5407339 3.0887286 [8] 2.2597869 1.6177005 1.0829863 1.0256164 1.4057960 1.6386742 1.3048711 [15] 1.3105963 1.6383439 1.4333764 0.9818756 1.2023541 1.2806701 1.2084604 [22] 1.1570636 1.3807647 2.0042792 1.3335434 1.4601894 1.3450907 0.9001157 [29] 0.7487205 1.0348891 0.7568243 0.8882026 1.1734926 1.1357969 0.8779807 [36] 0.6593703 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atanh.testatanh3# #argv <- list(-0.133190890463189);atanh(argv[[1]]); [1] -0.133987 ##com.oracle.truffle.r.test.builtins.TestBuiltin_atanh.testatanh4# #argv <- list(c(2+0i, 2-0.0001i, -2+0i, -2+0.0001i));atanh(argv[[1]]); [1] 0.549306-1.570796i 0.549306-1.570763i -0.549306+1.570796i [4] -0.549306+1.570763i ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.basicTests# #attach(list()) ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.basicTests# #d <- data.frame(colNameX=c(1,2,3)); attach(d); colNameX [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.basicTests# #d <- list(col=c(1,2,3)); e <- attach(d, name='hello'); attr(e, 'name') [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.basicTests# #d <- list(colNameX=c(1,2,3)); attach(d); colNameX [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.basicTests# #e <- attach(NULL); attr(e, 'name') [1] "NULL" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.detach# #d <- list(colNameX=c(1,2,3)); attach(d); detach(d); colNameX Error: object 'colNameX' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.sharingTests# #d <- data.frame(colNameX=c(1,2,3)); attach(d); d$colNameX[1] <- 42; colNameX [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.testArguments# #attach('string') Error in attach("string") : file 'string' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.testArguments# #attach(list(), name=42) Error in attach(list(), name = 42) : invalid 'name' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.testArguments#Output.IgnoreErrorMessage# #attach(list(x=42), pos='string') Error in attach(list(x = 42), pos = "string") : 'pos' must be an integer In addition: Warning message: In attach(list(x = 42), pos = "string") : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_attach.testArguments# #detach('string') Error in detach("string") : invalid 'name' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testExactMatch# #x <- c(1, 3); attr(x, 'abc') <- 42; attr(x, 'ab', exact=TRUE) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testExactMatch# #x <- c(1,2); attr(x, 'row.namess') <- 42; attr(x, 'row.names') [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testModOfCopied# #a<-1; attr(a,'myattr')<-42; b<-choose(a,1); attr(b,'myattr')[1]<-'z'; a [1] 1 attr(,"myattr") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testModOfCopied# #a<-1; attr(a,'myattr')<-c('x','y'); b<-choose(a,1); attr(b,'myattr')[1]<-'z'; a [1] 1 attr(,"myattr") [1] "x" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testNamesAttrSpecialization# #{ get_names_attr <- function(x) attr(x, 'names'); f <- function() 42; attr(f, 'myattr') <- 'a'; l <- as.pairlist(list(a=1)); attr(l, 'myattr') <- 'myattr'; attr(l, 'names') <- 'a'; get_names_attr(f); get_names_attr(l) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testNamesAttrSpecialization# #{ get_names_attr <- function(x) attr(x, 'names'); f <- function() 42; attr(f, 'myattr') <- 'a'; l <- as.pairlist(list(a=1)); attr(l, 'myattr') <- 'myattr'; attr(l, 'names') <- 'a'; get_names_attr(l); get_names_attr(f) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testNamesAttrSpecialization# #{ get_names_attr <- function(x) attr(x, 'names'); f <- function() 42; attr(f, 'myattr') <- 'a'; l <- as.pairlist(list(a=1)); get_names_attr(f); get_names_attr(l) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testNamesAttrSpecialization# #{ get_names_attr <- function(x) attr(x, 'names'); f <- function() 42; attr(f, 'myattr') <- 'a'; l <- as.pairlist(list(a=1)); get_names_attr(l); get_names_attr(f) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(1); attr(l, 'foo') <- 'bar'; attr(l, 'fo', exact=FALSE) } [1] "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(1); attr(l, 'foo') <- 'bar'; attr(l, 'foo', exact=TRUE) } [1] "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(1); attr(l, 'foo') <- 'bar'; attr(l, 'name', exact=FALSE) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(1); attr(l, 'foo') <- 'bar'; attr(l, 'names', exact=TRUE) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(1); attr(l, 'foo', exact=FALSE) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(1); attr(l, 'foo', exact=TRUE) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(1); attr(l, 'name', exact=FALSE) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(1); attr(l, 'names', exact=TRUE) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'foo') <- 42; attr(l, 'bar') } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'foo') <- 42; attr(l, 'bar'); attr(l, 'foo', exact=FALSE) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'foo') <- 42; attr(l, 'bar'); attr(l, 'foo', exact=TRUE) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'foo') <- 42; attr(l, 'foo') } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'foo') <- NA; attr(l, 'name', exact=FALSE) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'foo') } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'n', exact=FALSE) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'na', exact=FALSE) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'nam', exact=FALSE) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'name', exact=FALSE) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'names') <- 'a'; attr(l, 'names') } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'names') } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'names'); attr(l, 'names') <- 'foo'; attr(l, 'names') } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'names'); attr(l, 'someAttribute') <- 'foo'; attr(l, 'names') } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testPairList# #{ l <- pairlist(a=1); attr(l, 'someAttribute') <- 'foo'; attr(l, 'names') } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testSideEffect# #{ a <- c(1, 2, 4); foo <- function() { attr(a,'mya') <<- 42; TRUE; }; attr(a, 'mya', foo()) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr1# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1), .Dim = c(32L, 23L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32'), c('(Intercept)', 'HairBrown', 'HairRed', 'HairBlond', 'EyeBlue', 'EyeHazel', 'EyeGreen', 'SexFemale', 'HairBrown:EyeBlue', 'HairRed:EyeBlue', 'HairBlond:EyeBlue', 'HairBrown:EyeHazel', 'HairRed:EyeHazel', 'HairBlond:EyeHazel', 'HairBrown:EyeGreen', 'HairRed:EyeGreen', 'HairBlond:EyeGreen', 'HairBrown:SexFemale', 'HairRed:SexFemale', 'HairBlond:SexFemale', 'EyeBlue:SexFemale', 'EyeHazel:SexFemale', 'EyeGreen:SexFemale')), assign = c(0L, 1L, 1L, 1L, 2L, 2L, 2L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 6L, 6L, 6L), contrasts = structure(list(Hair = 'contr.treatment', Eye = 'contr.treatment', Sex = 'contr.treatment'), .Names = c('Hair', 'Eye', 'Sex'))), 'assign');attr(argv[[1]],argv[[2]]); [1] 0 1 1 1 2 2 2 3 4 4 4 4 4 4 4 4 4 5 5 5 6 6 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr10#Output.IgnoreWhitespace# #argv <- list(structure(list(Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551), GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962), .Names = c('Employed', 'GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year'), terms = quote(Employed ~ GNP.deflator + GNP + Unemployed + Armed.Forces + Population + Year), row.names = 1947:1962, class = 'data.frame'), 'terms');attr(argv[[1]],argv[[2]]); Employed ~ GNP.deflator + GNP + Unemployed + Armed.Forces + Population + Year ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr11# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0), .Dim = c(12L, 3L), .Dimnames = list(c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), c('(Intercept)', 'M.userY', 'TempLow')), assign = 0:2, contrasts = structure(list(M.user = 'contr.treatment', Temp = 'contr.treatment'), .Names = c('M.user', 'Temp'))), 'contrasts');attr(argv[[1]],argv[[2]]); $M.user [1] "contr.treatment" $Temp [1] "contr.treatment" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr12# #argv <- list(structure(list(`1000/MPG.city` = c(40, 55.5555555555556, 50, 52.6315789473684, 45.4545454545455, 45.4545454545455, 52.6315789473684, 62.5, 52.6315789473684, 62.5, 62.5, 40, 40, 52.6315789473684, 47.6190476190476, 55.5555555555556, 66.6666666666667, 58.8235294117647, 58.8235294117647, 50, 43.4782608695652, 50, 34.4827586206897, 43.4782608695652, 45.4545454545455, 58.8235294117647, 47.6190476190476, 55.5555555555556, 34.4827586206897, 50, 32.258064516129, 43.4782608695652, 45.4545454545455, 45.4545454545455, 41.6666666666667, 66.6666666666667, 47.6190476190476, 55.5555555555556, 21.7391304347826, 33.3333333333333, 41.6666666666667, 23.8095238095238, 41.6666666666667, 34.4827586206897, 45.4545454545455, 38.4615384615385, 50, 58.8235294117647, 55.5555555555556, 55.5555555555556, 58.8235294117647, 55.5555555555556, 34.4827586206897, 35.7142857142857, 38.4615384615385, 55.5555555555556, 58.8235294117647, 50, 52.6315789473684, 43.4782608695652, 52.6315789473684, 34.4827586206897, 55.5555555555556, 34.4827586206897, 41.6666666666667, 58.8235294117647, 47.6190476190476, 41.6666666666667, 43.4782608695652, 55.5555555555556, 52.6315789473684, 43.4782608695652, 32.258064516129, 43.4782608695652, 52.6315789473684, 52.6315789473684, 52.6315789473684, 50, 35.7142857142857, 30.3030303030303, 40, 43.4782608695652, 25.6410256410256, 31.25, 40, 45.4545454545455, 55.5555555555556, 40, 58.8235294117647, 47.6190476190476, 55.5555555555556, 47.6190476190476, 50), Weight = c(2705L, 3560L, 3375L, 3405L, 3640L, 2880L, 3470L, 4105L, 3495L, 3620L, 3935L, 2490L, 2785L, 3240L, 3195L, 3715L, 4025L, 3910L, 3380L, 3515L, 3085L, 3570L, 2270L, 2670L, 2970L, 3705L, 3080L, 3805L, 2295L, 3490L, 1845L, 2530L, 2690L, 2850L, 2710L, 3735L, 3325L, 3950L, 1695L, 2475L, 2865L, 2350L, 3040L, 2345L, 2620L, 2285L, 2885L, 4000L, 3510L, 3515L, 3695L, 4055L, 2325L, 2440L, 2970L, 3735L, 2895L, 2920L, 3525L, 2450L, 3610L, 2295L, 3730L, 2545L, 3050L, 4100L, 3200L, 2910L, 2890L, 3715L, 3470L, 2640L, 2350L, 2575L, 3240L, 3450L, 3495L, 2775L, 2495L, 2045L, 2490L, 3085L, 1965L, 2055L, 2950L, 3030L, 3785L, 2240L, 3960L, 2985L, 2810L, 2985L, 3245L), Cylinders = structure(c(2L, 4L, 4L, 4L, 2L, 2L, 4L, 4L, 4L, 5L, 5L, 2L, 2L, 4L, 2L, 4L, 4L, 5L, 5L, 4L, 2L, 4L, 2L, 2L, 2L, 4L, 2L, 4L, 2L, 4L, 2L, 2L, 2L, 2L, 2L, 4L, 4L, 5L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 5L, 4L, 4L, 4L, 5L, 2L, 2L, 2L, 4L, 6L, 2L, 4L, 2L, 4L, 2L, 4L, 2L, 2L, 4L, 4L, 2L, 2L, 4L, 4L, 2L, 2L, 2L, 4L, 4L, 4L, 2L, 2L, 1L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 3L, 2L, 4L, 2L, 3L), .Label = c('3', '4', '5', '6', '8', 'rotary'), class = 'factor'), Type = structure(c(4L, 3L, 1L, 3L, 3L, 3L, 2L, 2L, 3L, 2L, 3L, 1L, 1L, 5L, 3L, 6L, 6L, 2L, 5L, 2L, 1L, 2L, 4L, 4L, 1L, 6L, 3L, 5L, 4L, 2L, 4L, 4L, 1L, 5L, 5L, 6L, 3L, 2L, 4L, 5L, 5L, 4L, 1L, 4L, 4L, 5L, 3L, 3L, 3L, 3L, 3L, 2L, 4L, 4L, 1L, 6L, 5L, 1L, 3L, 5L, 3L, 4L, 3L, 4L, 1L, 6L, 3L, 1L, 3L, 6L, 2L, 5L, 4L, 1L, 5L, 3L, 2L, 1L, 4L, 4L, 4L, 1L, 4L, 4L, 5L, 3L, 6L, 4L, 6L, 1L, 5L, 1L, 3L), .Label = c('Compact', 'Large', 'Midsize', 'Small', 'Sporty', 'Van'), class = 'factor'), EngineSize = c(1.8, 3.2, 2.8, 2.8, 3.5, 2.2, 3.8, 5.7, 3.8, 4.9, 4.6, 2.2, 2.2, 3.4, 2.2, 3.8, 4.3, 5, 5.7, 3.3, 3, 3.3, 1.5, 2.2, 2.5, 3, 2.5, 3, 1.5, 3.5, 1.3, 1.8, 2.3, 2.3, 2, 3, 3, 4.6, 1, 1.6, 2.3, 1.5, 2.2, 1.5, 1.8, 1.5, 2, 4.5, 3, 3, 3.8, 4.6, 1.6, 1.8, 2.5, 3, 1.3, 2.3, 3.2, 1.6, 3.8, 1.5, 3, 1.6, 2.4, 3, 3, 2.3, 2.2, 3.8, 3.8, 1.8, 1.6, 2, 3.4, 3.4, 3.8, 2.1, 1.9, 1.2, 1.8, 2.2, 1.3, 1.5, 2.2, 2.2, 2.4, 1.8, 2.5, 2, 2.8, 2.3, 2.4), DriveTrain = structure(c(2L, 2L, 2L, 2L, 3L, 2L, 2L, 3L, 2L, 2L, 2L, 2L, 2L, 3L, 2L, 2L, 1L, 3L, 3L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 3L, 2L, 1L, 2L, 3L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 2L, 3L, 2L, 3L, 2L, 2L, 2L, 1L, 3L, 3L, 3L, 2L, 3L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 3L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 3L, 2L), .Label = c('4WD', 'Front', 'Rear'), class = 'factor')), .Names = c('1000/MPG.city', 'Weight', 'Cylinders', 'Type', 'EngineSize', 'DriveTrain'), terms = quote(1000/MPG.city ~ Weight + Cylinders + Type + EngineSize + DriveTrain), row.names = c(NA, 93L), class = 'data.frame'), 'row.names');attr(argv[[1]],argv[[2]]); [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 [51] 51 52 53 54 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 73 74 75 [76] 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 91 92 93 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr13# #argv <- list(quote(cbind(X, M) ~ 1), 'term.labels');attr(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr14# #argv <- list(structure(c(1L, 1L, 1L, 2L, 1L), .Label = c('no', 'yes'), class = 'factor'), 'levels');attr(argv[[1]],argv[[2]]); [1] "no" "yes" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr15# #argv <- list(structure(list(Df = c(NA, 1), Deviance = c(5.65604443125997, 8.44399377410362), AIC = c(71.3540021461976, 72.1419514890413)), .Names = c('Df', 'Deviance', 'AIC'), row.names = c('', '- M.user:Temp'), class = c('anova', 'data.frame'), heading = c('Single term deletions', '\nModel:', 'cbind(X, M) ~ M.user + Temp + M.user:Temp')), 'row.names');attr(argv[[1]],argv[[2]]); [1] "" "- M.user:Temp" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr16# #argv <- list(structure(list(`1000/MPG.city` = c(40, 55.5555555555556, 50, 52.6315789473684, 45.4545454545455, 45.4545454545455, 52.6315789473684, 62.5, 52.6315789473684, 62.5, 62.5, 40, 40, 52.6315789473684, 47.6190476190476, 55.5555555555556, 66.6666666666667, 58.8235294117647, 58.8235294117647, 50, 43.4782608695652, 50, 34.4827586206897, 43.4782608695652, 45.4545454545455, 58.8235294117647, 47.6190476190476, 55.5555555555556, 34.4827586206897, 50, 32.258064516129, 43.4782608695652, 45.4545454545455, 45.4545454545455, 41.6666666666667, 66.6666666666667, 47.6190476190476, 55.5555555555556, 21.7391304347826, 33.3333333333333, 41.6666666666667, 23.8095238095238, 41.6666666666667, 34.4827586206897, 45.4545454545455, 38.4615384615385, 50, 58.8235294117647, 55.5555555555556, 55.5555555555556, 58.8235294117647, 55.5555555555556, 34.4827586206897, 35.7142857142857, 38.4615384615385, 55.5555555555556, 58.8235294117647, 50, 52.6315789473684, 43.4782608695652, 52.6315789473684, 34.4827586206897, 55.5555555555556, 34.4827586206897, 41.6666666666667, 58.8235294117647, 47.6190476190476, 41.6666666666667, 43.4782608695652, 55.5555555555556, 52.6315789473684, 43.4782608695652, 32.258064516129, 43.4782608695652, 52.6315789473684, 52.6315789473684, 52.6315789473684, 50, 35.7142857142857, 30.3030303030303, 40, 43.4782608695652, 25.6410256410256, 31.25, 40, 45.4545454545455, 55.5555555555556, 40, 58.8235294117647, 47.6190476190476, 55.5555555555556, 47.6190476190476, 50), Weight = c(2705L, 3560L, 3375L, 3405L, 3640L, 2880L, 3470L, 4105L, 3495L, 3620L, 3935L, 2490L, 2785L, 3240L, 3195L, 3715L, 4025L, 3910L, 3380L, 3515L, 3085L, 3570L, 2270L, 2670L, 2970L, 3705L, 3080L, 3805L, 2295L, 3490L, 1845L, 2530L, 2690L, 2850L, 2710L, 3735L, 3325L, 3950L, 1695L, 2475L, 2865L, 2350L, 3040L, 2345L, 2620L, 2285L, 2885L, 4000L, 3510L, 3515L, 3695L, 4055L, 2325L, 2440L, 2970L, 3735L, 2895L, 2920L, 3525L, 2450L, 3610L, 2295L, 3730L, 2545L, 3050L, 4100L, 3200L, 2910L, 2890L, 3715L, 3470L, 2640L, 2350L, 2575L, 3240L, 3450L, 3495L, 2775L, 2495L, 2045L, 2490L, 3085L, 1965L, 2055L, 2950L, 3030L, 3785L, 2240L, 3960L, 2985L, 2810L, 2985L, 3245L), Cylinders = structure(c(2L, 4L, 4L, 4L, 2L, 2L, 4L, 4L, 4L, 5L, 5L, 2L, 2L, 4L, 2L, 4L, 4L, 5L, 5L, 4L, 2L, 4L, 2L, 2L, 2L, 4L, 2L, 4L, 2L, 4L, 2L, 2L, 2L, 2L, 2L, 4L, 4L, 5L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 5L, 4L, 4L, 4L, 5L, 2L, 2L, 2L, 4L, 6L, 2L, 4L, 2L, 4L, 2L, 4L, 2L, 2L, 4L, 4L, 2L, 2L, 4L, 4L, 2L, 2L, 2L, 4L, 4L, 4L, 2L, 2L, 1L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 3L, 2L, 4L, 2L, 3L), .Label = c('3', '4', '5', '6', '8', 'rotary'), class = 'factor'), Type = structure(c(4L, 3L, 1L, 3L, 3L, 3L, 2L, 2L, 3L, 2L, 3L, 1L, 1L, 5L, 3L, 6L, 6L, 2L, 5L, 2L, 1L, 2L, 4L, 4L, 1L, 6L, 3L, 5L, 4L, 2L, 4L, 4L, 1L, 5L, 5L, 6L, 3L, 2L, 4L, 5L, 5L, 4L, 1L, 4L, 4L, 5L, 3L, 3L, 3L, 3L, 3L, 2L, 4L, 4L, 1L, 6L, 5L, 1L, 3L, 5L, 3L, 4L, 3L, 4L, 1L, 6L, 3L, 1L, 3L, 6L, 2L, 5L, 4L, 1L, 5L, 3L, 2L, 1L, 4L, 4L, 4L, 1L, 4L, 4L, 5L, 3L, 6L, 4L, 6L, 1L, 5L, 1L, 3L), .Label = c('Compact', 'Large', 'Midsize', 'Small', 'Sporty', 'Van'), class = 'factor'), EngineSize = c(1.8, 3.2, 2.8, 2.8, 3.5, 2.2, 3.8, 5.7, 3.8, 4.9, 4.6, 2.2, 2.2, 3.4, 2.2, 3.8, 4.3, 5, 5.7, 3.3, 3, 3.3, 1.5, 2.2, 2.5, 3, 2.5, 3, 1.5, 3.5, 1.3, 1.8, 2.3, 2.3, 2, 3, 3, 4.6, 1, 1.6, 2.3, 1.5, 2.2, 1.5, 1.8, 1.5, 2, 4.5, 3, 3, 3.8, 4.6, 1.6, 1.8, 2.5, 3, 1.3, 2.3, 3.2, 1.6, 3.8, 1.5, 3, 1.6, 2.4, 3, 3, 2.3, 2.2, 3.8, 3.8, 1.8, 1.6, 2, 3.4, 3.4, 3.8, 2.1, 1.9, 1.2, 1.8, 2.2, 1.3, 1.5, 2.2, 2.2, 2.4, 1.8, 2.5, 2, 2.8, 2.3, 2.4), DriveTrain = structure(c(2L, 2L, 2L, 2L, 3L, 2L, 2L, 3L, 2L, 2L, 2L, 2L, 2L, 3L, 2L, 2L, 1L, 3L, 3L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 3L, 2L, 1L, 2L, 3L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 2L, 3L, 2L, 3L, 2L, 2L, 2L, 1L, 3L, 3L, 3L, 2L, 3L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 3L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 3L, 2L), .Label = c('4WD', 'Front', 'Rear'), class = 'factor')), .Names = c('1000/MPG.city', 'Weight', 'Cylinders', 'Type', 'EngineSize', 'DriveTrain'), terms = quote(1000/MPG.city ~ Weight + Cylinders + Type + EngineSize + DriveTrain), row.names = c(NA, 93L), class = 'data.frame'), 'na.action');attr(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr17# #argv <- list(structure(c(0.5, 0.5, 0.5, 0.5), gradient = structure(c(NaN, NaN, NaN, NaN), .Dim = c(4L, 1L), .Dimnames = list(NULL, 'L75'))), 'gradient');attr(argv[[1]],argv[[2]]); L75 [1,] NaN [2,] NaN [3,] NaN [4,] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr18# #argv <- list(c(NA, NA, '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/histogram.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/histogram.R'), 'levels');attr(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr19# #argv <- list(structure(list(srcfile = c('/home/lzhao/hg/r-instrumented/library/stats/R/stats', '/home/lzhao/hg/r-instrumented/library/stats/R/stats', '/home/lzhao/hg/r-instrumented/library/stats/R/stats', '/home/lzhao/hg/r-instrumented/library/stats/R/stats', '/home/lzhao/hg/r-instrumented/library/stats/R/stats', '/home/lzhao/hg/r-instrumented/library/stats/R/stats'), frow = c(2418L, 2418L, 2418L, 2421L, 2422L, 2424L), lrow = c(2418L, 2418L, 2418L, 2421L, 2426L, 2424L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 6L), class = 'data.frame'), 'row.names');attr(argv[[1]],argv[[2]]); [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr2# #argv <- list(structure(list(`cbind(X, M)` = structure(c(68, 42, 37, 24, 66, 33, 47, 23, 63, 29, 57, 19, 42, 30, 52, 43, 50, 23, 55, 47, 53, 27, 49, 29), .Dim = c(12L, 2L), .Dimnames = list(NULL, c('X', 'M'))), M.user = structure(c(1L, 1L, 2L, 2L, 1L, 1L, 2L, 2L, 1L, 1L, 2L, 2L), .Label = c('N', 'Y'), class = 'factor'), Temp = structure(c(2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L), .Label = c('High', 'Low'), class = 'factor'), Soft = structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L), .Label = c('Hard', 'Medium', 'Soft'), class = 'factor')), .Names = c('cbind(X, M)', 'M.user', 'Temp', 'Soft'), terms = quote(cbind(X, M) ~ M.user + Temp + Soft), row.names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), class = 'data.frame'), 'terms');attr(argv[[1]],argv[[2]]); cbind(X, M) ~ M.user + Temp + Soft ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr20# #argv <- list(structure(c('[[.bibentry', '[[.data.frame', '[[.Date', '[[.dendrogram', '[[.factor', '[[.numeric_version', '[[.pdf_doc', '[[.person', '[[.POSIXct'), class = 'MethodsFunction', info = structure(list(visible = c(FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE), from = structure(c(9L, 2L, 2L, 9L, 2L, 2L, 9L, 9L, 2L), .Label = c('CheckExEnv', 'package:base', 'package:datasets', 'package:graphics', 'package:grDevices', 'package:methods', 'package:stats', 'package:utils', 'registered S3method for [['), class = 'factor')), .Names = c('visible', 'from'), row.names = c('[[.bibentry', '[[.data.frame', '[[.Date', '[[.dendrogram', '[[.factor', '[[.numeric_version', '[[.pdf_doc', '[[.person', '[[.POSIXct'), class = 'data.frame')), 'info');attr(argv[[1]],argv[[2]]); visible from [[.bibentry FALSE registered S3method for [[ [[.data.frame TRUE package:base [[.Date TRUE package:base [[.dendrogram FALSE registered S3method for [[ [[.factor TRUE package:base [[.numeric_version TRUE package:base [[.pdf_doc FALSE registered S3method for [[ [[.person FALSE registered S3method for [[ [[.POSIXct TRUE package:base ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr21# #argv <- list(structure(list(ID = c(63L, 63L, 63L, 63L, 63L), Age = c(30L, 30L, 30L, 30L, 30L), OME = structure(c(3L, 3L, 3L, 3L, 3L), .Label = c('N/A', 'high', 'low'), class = 'factor'), Loud = c(35L, 40L, 45L, 50L, 55L), Noise = structure(c(2L, 2L, 2L, 2L, 2L), .Label = c('coherent', 'incoherent'), class = 'factor'), Correct = c(1L, 1L, 1L, 3L, 1L), Trials = c(2L, 1L, 1L, 3L, 1L), UID = c(67L, 67L, 67L, 67L, 67L), UIDn = c(67.1, 67.1, 67.1, 67.1, 67.1)), .Names = c('ID', 'Age', 'OME', 'Loud', 'Noise', 'Correct', 'Trials', 'UID', 'UIDn'), row.names = c(635L, 639L, 643L, 647L, 651L), class = 'data.frame'), 'na.action');attr(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr22# #argv <- list(structure(c(0, 3, 3, 0), .Dim = c(2L, 2L), counts = structure(c(0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 2L, 2L, 0L), .Dim = c(2L, 2L, 3L), .Dimnames = list(NULL, NULL, c('ins', 'del', 'sub'))), trafos = structure(c('MMMMMM', 'SMMMSMD', 'SMMMSMI', 'MMMMMMM'), .Dim = c(2L, 2L))), 'trafos');attr(argv[[1]],argv[[2]]); [,1] [,2] [1,] "MMMMMM" "SMMMSMI" [2,] "SMMMSMD" "MMMMMMM" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr23# #argv <- list(structure(list(y = c(73, 73, 70, 74, 75, 115, 105, 107, 124, 107, 116, 125, 102, 144, 178, 149, 177, 124, 157, 128, 169, 165, 186, 152, 181, 139, 173, 151, 138, 181, 152, 188, 173, 196, 180, 171, 188, 174, 198, 172, 176, 162, 188, 182, 182, 141, 191, 190, 159, 170, 163, 197), x = c(1, 1, 1, 1, 1, 2, 2, 3, 3, 3, 3, 3, 3, 4, 4, 4, 5, 5, 5, 5, 6, 6, 6, 6, 6, 6, 7, 7, 7, 7, 7, 7, 7, 7, 7, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 9, 9, 9, 9, 9, 11, 12), Ta = 1, Tb = 12), .Names = c('y', 'x', 'Ta', 'Tb'), terms = quote(~y + x)), 'terms');attr(argv[[1]],argv[[2]]); ~y + x ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr24# #argv <- list(structure(c(804.851443135267, 3.3994157758076, 28.3699038266834, 1.84375046462573), .Dim = c(2L, 2L), .Dimnames = list(c('(Intercept)', 'day'), c('Variance', 'StdDev')), formStr = 'pdLogChol(day)', corr = structure(c('(Intr)', '-0.555'), .Dim = c(2L, 1L), .Dimnames = list(c('(Intercept)', 'day'), 'Corr'))), which = 'corr');attr(argv[[1]],argv[[2]]); Corr (Intercept) "(Intr)" day "-0.555" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr25# #argv <- list(structure(c(0.0319339476375948, 0.0319339476375948, 0.114405269727263, 0.114405269727263, 0.211060625790557, 0.211060625790557, 0.375868556643391, 0.375868556643391, 0.631987388405009, 0.631987388405009, 0.977771587733117, 0.977771587733117, 1.3655287091085, 1.3655287091085, 1.71941659701549, 1.71941659701549), gradient = structure(c(0.013379193963099, 0.013379193963099, 0.0479317593757097, 0.0479317593757097, 0.0884269330704518, 0.0884269330704518, 0.157475623779182, 0.157475623779182, 0.264780350605592, 0.264780350605592, 0.409651693312349, 0.409651693312349, 0.572108204994814, 0.572108204994814, 0.720374706438093, 0.720374706438093, -0.0298119721009501, -0.0298119721009501, -0.103062799493893, -0.103062799493893, -0.182048260790464, -0.182048260790464, -0.299644491810901, -0.299644491810901, -0.439656344689613, -0.439656344689613, -0.546177195068236, -0.546177195068236, -0.552869486814534, -0.552869486814534, -0.454930857067767, -0.454930857067767), .Dim = c(16L, 2L), .Dimnames = list(NULL, c('Asym', 'xmid')))), 'gradient');attr(argv[[1]],argv[[2]]); Asym xmid [1,] 0.01337919 -0.02981197 [2,] 0.01337919 -0.02981197 [3,] 0.04793176 -0.10306280 [4,] 0.04793176 -0.10306280 [5,] 0.08842693 -0.18204826 [6,] 0.08842693 -0.18204826 [7,] 0.15747562 -0.29964449 [8,] 0.15747562 -0.29964449 [9,] 0.26478035 -0.43965634 [10,] 0.26478035 -0.43965634 [11,] 0.40965169 -0.54617720 [12,] 0.40965169 -0.54617720 [13,] 0.57210820 -0.55286949 [14,] 0.57210820 -0.55286949 [15,] 0.72037471 -0.45493086 [16,] 0.72037471 -0.45493086 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr26# #argv <- list(structure(list(structure(list(structure('Update varFunc Object', Rd_tag = 'TEXT')), Rd_tag = '\\title'), structure(list(structure('update.varFunc', Rd_tag = 'VERB')), Rd_tag = '\\name'), structure(list(structure('update.varExp', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('update.varFunc', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('update.varComb', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('update.varConstPower', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('update.varExpon', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('update.varPower', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('models', Rd_tag = 'TEXT')), Rd_tag = '\\keyword'), structure(list(structure('\n', Rd_tag = 'TEXT'), structure(' If the ', Rd_tag = 'TEXT'), structure(list(structure('formula(object)', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' includes a ', Rd_tag = 'TEXT'), structure(list(structure('\'.\'', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' term, representing\n', Rd_tag = 'TEXT'), structure(' a fitted object, the variance covariate needs to be updated upon\n', Rd_tag = 'TEXT'), structure(' completion of an optimization cycle (in which the variance function\n', Rd_tag = 'TEXT'), structure(' weights are kept fixed). This method function allows a reevaluation of\n', Rd_tag = 'TEXT'), structure(' the variance covariate using the current fitted object and,\n', Rd_tag = 'TEXT'), structure(' optionally, other variables in the original data.\n', Rd_tag = 'TEXT')), Rd_tag = '\\description'), structure(list(structure('\n', Rd_tag = 'RCODE'), structure(list(list(structure('update', Rd_tag = 'TEXT')), list(structure('varFunc', Rd_tag = 'TEXT'))), Rd_tag = '\\method'), structure('(object, data, ', Rd_tag = 'RCODE'), structure(list(), Rd_tag = '\\dots'), structure(')\n', Rd_tag = 'RCODE')), Rd_tag = '\\usage'), structure(list(structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(list(structure('object', Rd_tag = 'TEXT')), list(structure('an object inheriting from class ', Rd_tag = 'TEXT'), structure(list(structure('varFunc', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(',\n', Rd_tag = 'TEXT'), structure(' representing a variance function structure.', Rd_tag = 'TEXT'))), Rd_tag = '\\item'), structure(' \n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(list(structure('data', Rd_tag = 'TEXT')), list(structure('a list with a component named ', Rd_tag = 'TEXT'), structure(list(structure('\'.\'', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' with the current\n', Rd_tag = 'TEXT'), structure(' version of the fitted object (from which fitted values, coefficients,\n', Rd_tag = 'TEXT'), structure(' and residuals can be extracted) and, if necessary, other variables\n', Rd_tag = 'TEXT'), structure(' used to evaluate the variance covariate(s).', Rd_tag = 'TEXT'))), Rd_tag = '\\item'), structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(list(structure(list(), Rd_tag = '\\dots')), list(structure('some methods for this generic require additional\n', Rd_tag = 'TEXT'), structure(' arguments. None are used in this method.', Rd_tag = 'TEXT'))), Rd_tag = '\\item'), structure(' \n', Rd_tag = 'TEXT')), Rd_tag = '\\arguments'), structure(list(structure('\n', Rd_tag = 'TEXT'), structure(' if ', Rd_tag = 'TEXT'), structure(list(structure('formula(object)', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' includes a ', Rd_tag = 'TEXT'), structure(list(structure('\'.\'', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' term, an\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(structure('varFunc', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' object similar to ', Rd_tag = 'TEXT'), structure(list(structure('object', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(', but with the \n', Rd_tag = 'TEXT'), structure(' variance covariate reevaluated at the current fitted object value;\n', Rd_tag = 'TEXT'), structure(' else ', Rd_tag = 'TEXT'), structure(list(structure('object', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' is returned unchanged.\n', Rd_tag = 'TEXT')), Rd_tag = '\\value'), structure(list(structure('José Pinheiro and Douglas Bates ', Rd_tag = 'TEXT'), structure(list(structure('bates@stat.wisc.edu', Rd_tag = 'TEXT')), Rd_tag = '\\email')), Rd_tag = '\\author'), structure(list(structure(list(structure(list(structure('needUpdate', Rd_tag = 'TEXT')), Rd_tag = '\\link')), Rd_tag = '\\code'), structure(',\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(structure(list(structure('covariate<-.varFunc', Rd_tag = 'TEXT')), Rd_tag = '\\link')), Rd_tag = '\\code'), structure('\n', Rd_tag = 'TEXT')), Rd_tag = '\\seealso')), Rdfile = '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/man/update.varFunc.Rd', class = 'Rd', meta = structure(list(docType = character(0)), .Names = 'docType'), prepared = 3L), 'prepared');attr(argv[[1]],argv[[2]]); [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr27# #argv <- list(structure(list(structure(list(structure('Print a varFunc Object', Rd_tag = 'TEXT')), Rd_tag = '\\title'), structure(list(structure('print.varFunc', Rd_tag = 'VERB')), Rd_tag = '\\name'), structure(list(structure('print.varFunc', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('print.varComb', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('models', Rd_tag = 'TEXT')), Rd_tag = '\\keyword'), structure(list(structure('\n', Rd_tag = 'TEXT'), structure(' The class and the coefficients associated with ', Rd_tag = 'TEXT'), structure(list(structure('x', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(' are printed.\n', Rd_tag = 'TEXT')), Rd_tag = '\\description'), structure(list(structure('\n', Rd_tag = 'RCODE'), structure(list(list(structure('print', Rd_tag = 'TEXT')), list(structure('varFunc', Rd_tag = 'TEXT'))), Rd_tag = '\\method'), structure('(x, ', Rd_tag = 'RCODE'), structure(list(), Rd_tag = '\\dots'), structure(')\n', Rd_tag = 'RCODE')), Rd_tag = '\\usage'), structure(list(structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(list(structure('x', Rd_tag = 'TEXT')), list(structure('an object inheriting from class ', Rd_tag = 'TEXT'), structure(list(structure('varFunc', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure(', representing a\n', Rd_tag = 'TEXT'), structure(' variance function structure.', Rd_tag = 'TEXT'))), Rd_tag = '\\item'), structure('\n', Rd_tag = 'TEXT'), structure(' ', Rd_tag = 'TEXT'), structure(list(list(structure(list(), Rd_tag = '\\dots')), list(structure('optional arguments passed to ', Rd_tag = 'TEXT'), structure(list(structure('print.default', Rd_tag = 'RCODE')), Rd_tag = '\\code'), structure('; see\n', Rd_tag = 'TEXT'), structure(' the documentation on that method function.', Rd_tag = 'TEXT'))), Rd_tag = '\\item'), structure('\n', Rd_tag = 'TEXT')), Rd_tag = '\\arguments'), structure(list(structure('Jos Pinheiro and Douglas Bates ', Rd_tag = 'TEXT'), structure(list(structure('bates@stat.wisc.edu', Rd_tag = 'TEXT')), Rd_tag = '\\email')), Rd_tag = '\\author'), structure(list(structure(list( structure(list(structure('summary.varFunc', Rd_tag = 'TEXT')), Rd_tag = '\\link')), Rd_tag = '\\code')), Rd_tag = '\\seealso'), structure(list(structure('\n', Rd_tag = 'RCODE'), structure('vf1 <- varPower(0.3, form = ~age)\n', Rd_tag = 'RCODE'), structure('vf1 <- Initialize(vf1, Orthodont)\n', Rd_tag = 'RCODE'), structure('print(vf1)\n', Rd_tag = 'RCODE')), Rd_tag = '\\examples')), Rdfile = '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/man/print.varFunc.Rd', class = 'Rd', meta = structure(list( docType = character(0)), .Names = 'docType'), prepared = 3L), 'meta');attr(argv[[1]],argv[[2]]); $docType character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr28# #argv <- list(structure(list(variable1 = c(1, 2, 2), variable2 = c(1, 1, 3)), .Names = c('variable1', 'variable2'), row.names = c(NA, -3L), class = 'data.frame', variable.labels = structure(c('variable1', 'variable2'), .Names = c('variable1', 'variable2')), codepage = 20127L), 'variable.labels');attr(argv[[1]],argv[[2]]); variable1 variable2 "variable1" "variable2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr29# #argv <- list(structure(list(A = c(1L, NA, 1L), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA, NA, NA), E = c(FALSE, NA, TRUE), F = structure(c(1L, NA, 2L), .Label = c('abc', 'def'), class = 'factor')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')), 'row.names');attr(argv[[1]],argv[[2]]); [1] "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr30# #argv <- list(structure(list(srcfile = c('/home/lzhao/hg/r-instrumented/library/graphics/R/graphics', '/home/lzhao/hg/r-instrumented/library/graphics/R/graphics'), frow = 4262:4263, lrow = 4262:4263), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2, class = 'data.frame'), 'row.names');attr(argv[[1]],argv[[2]]); [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr31# #argv <- list(structure(c(2L, 1L, 3L), .Label = c('1', '2', NA), class = c('ordered', 'factor')), 'levels');attr(argv[[1]],argv[[2]]); [1] "1" "2" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr32# #argv <- list(structure(1:10, date = structure(200171400, class = c('POSIXct', 'POSIXt'), tzone = ''), class = 'stamped'), 'date');attr(argv[[1]],argv[[2]]); [1] "1976-05-05 19:10:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr33# #argv <- list(structure(c(49.9, 52.3, 49.4, 51.1, 49.4, 47.9, 49.8, 50.9, 49.3, 51.9, 50.8, 49.6, 49.3, 50.6, 48.4, 50.7, 50.9, 50.6, 51.5, 52.8, 51.8, 51.1, 49.8, 50.2, 50.4, 51.6, 51.8, 50.9, 48.8, 51.7, 51, 50.6, 51.7, 51.5, 52.1, 51.3, 51, 54, 51.4, 52.7, 53.1, 54.6, 52, 52, 50.9, 52.6, 50.2, 52.6, 51.6, 51.9, 50.5, 50.9, 51.7), .Tsp = c(1, 53, 1)), 'tsp');attr(argv[[1]],argv[[2]]); [1] 1 53 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr34# #argv <- list(structure(list(y = c(-0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861), x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE), z = 1:10), .Names = c('y', 'x', 'z'), class = 'data.frame', row.names = c(NA, 10L), terms = quote(y ~ x * z)), 'row.names');attr(argv[[1]],argv[[2]]); [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr35# #argv <- list(structure(c(123.48457192908, 239.059434652297, 290.055338401838, 18.397281603467, 6.57585722655537, 0.670931786731845, 0.178466148156965, 0.245410750178149, 0.363167328274208, 0.194808268742596, 2172.67583033103, 8.91763605923317e+38), .Dim = c(1L, 12L), .Dimnames = list(NULL, c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'))), 'class');attr(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr36# #argv <- list(structure(c(8.85169533448293e-238, 2.77884205079773e-237, 8.5330427463164e-242, 7.89244209468013e-215, 6.74732964729372e-231, 1.30818670504849e-217, 1.39113376416096e-208, 1.35683278955814e-215, 7.74002099666521e-219, 3.64254537730231e-220, 6.75916981442421e-296, 0), .Dim = c(1L, 12L), .Dimnames = list(NULL, c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'))), 'class');attr(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr37# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 1.90299264808673e-318, 0, 0, 0, 0, 0), .Dim = c(1L, 12L), .Dimnames = list(NULL, c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'))), 'class');attr(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr38# #argv <- list(list(c(57, 95, 8, 69, 92, 90, 15, 2, 84, 6, 127, 36, 51, 2, 69, 71, 87, 72, 5, 39, 22, 16, 72, 4, 130, 4, 114, 9, 20, 24, 10, 51, 43, 28, 60, 5, 17, 7, 81, 71, 12, 29, 44, 77, 4, 27, 47, 76, 8, 72, 13, 57, 4, 81, 20, 61, 80, 114, 39, 14, 86, 55, 3, 19)), 'names');attr(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr39# #argv <- list(structure(list(coef = c(0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099, 0.0099009900990099), m = 50L), .Names = c('coef', 'm'), name = 'Daniell(50)', class = 'tskernel'), 'name');attr(argv[[1]],argv[[2]]); [1] "Daniell(50)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr4# #argv <- list(structure(list(`cbind(w = weight, w2 = weight^2)` = structure(c(4.17, 5.58, 5.18, 6.11, 4.5, 4.61, 5.17, 4.53, 5.33, 5.14, 4.81, 4.17, 4.41, 3.59, 5.87, 3.83, 6.03, 4.89, 4.32, 4.69, 17.3889, 31.1364, 26.8324, 37.3321, 20.25, 21.2521, 26.7289, 20.5209, 28.4089, 26.4196, 23.1361, 17.3889, 19.4481, 12.8881, 34.4569, 14.6689, 36.3609, 23.9121, 18.6624, 21.9961), .Dim = c(20L, 2L), .Dimnames = list(NULL, c('w', 'w2'))), group = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Ctl', 'Trt'), class = 'factor')), .Names = c('cbind(w = weight, w2 = weight^2)', 'group'), terms = quote(cbind(w = weight, w2 = weight^2) ~ group), row.names = c(NA, 20L), class = 'data.frame'), 'terms');attr(argv[[1]],argv[[2]]); cbind(w = weight, w2 = weight^2) ~ group ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr40# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0.0519265581680438, 0.0688412118115477, 0.0907383424760159, 0.11871257874736, 0.153851867351129, 0.197066627437879, 0.248849916275927, 0.309003712276245, 0.376411716520019, 0.448970177554117, 0.523767544415284, 0.560977234455458), .Dim = c(12L, 2L), gradient = structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.00738389705040961, -0.00961449255414965, -0.0123746759217436, -0.0156916432890164, -0.0195255505224529, -0.0237326760503604, -0.0280361473696848, -0.032025323792521, -0.035205879677649, -0.0371062207595128, -0.0374120660881388, -0.0369391076611127, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0.142994094104604, 0.166962078687643, 0.190145150639427, 0.209729276540067, 0.221920901693929, 0.222272332097609, 0.206504915766748, 0.17183720786829, 0.11849125053358, 0.0506747206505475, -0.0237317230350864, -0.0603708169587119), .Dim = c(12L, 2L, 2L))), 'gradient');attr(argv[[1]],argv[[2]]); , , 1 [,1] [,2] [1,] 0 -0.007383897 [2,] 0 -0.009614493 [3,] 0 -0.012374676 [4,] 0 -0.015691643 [5,] 0 -0.019525551 [6,] 0 -0.023732676 [7,] 0 -0.028036147 [8,] 0 -0.032025324 [9,] 0 -0.035205880 [10,] 0 -0.037106221 [11,] 0 -0.037412066 [12,] 0 -0.036939108 , , 2 [,1] [,2] [1,] 0 0.14299409 [2,] 0 0.16696208 [3,] 0 0.19014515 [4,] 0 0.20972928 [5,] 0 0.22192090 [6,] 0 0.22227233 [7,] 0 0.20650492 [8,] 0 0.17183721 [9,] 0 0.11849125 [10,] 0 0.05067472 [11,] 0 -0.02373172 [12,] 0 -0.06037082 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr41# #argv <- list(structure(list(A = 0:10, B = 10:20, `NA` = 20:30), .Names = c('A', 'B', NA), row.names = c(NA, -11L), class = 'data.frame'), 'row.names');attr(argv[[1]],argv[[2]]); [1] 1 2 3 4 5 6 7 8 9 10 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr42# #argv <- list(structure(list(coef = c(0.1, 0.1, 0.1, 0.1, 0.1, 0.05), m = 5L), .Names = c('coef', 'm'), name = 'mDaniell(5)', class = 'tskernel'), 'name');attr(argv[[1]],argv[[2]]); [1] "mDaniell(5)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr43# #argv <- list(structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11), .Dim = c(10L, 2L), .Dimnames = list(NULL, c('tt', 'tt + 1')), .Tsp = c(1920.5, 1921.25, 12), class = c('mts', 'ts', 'matrix')), 'tsp');attr(argv[[1]],argv[[2]]); [1] 1920.50 1921.25 12.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr44# #argv <- list(structure(c(2L, NA, NA, 4L, 3L, 2L, 1L, 5L, 5L, 6L), .Label = c('NA', 'a', 'b', 'c', 'd', NA), class = 'factor'), 'levels');attr(argv[[1]],argv[[2]]); [1] "NA" "a" "b" "c" "d" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr45# #argv <- list(c(35.2589338684655, 59.5005803666983, 12.4529321610302, 2.53579570262684, 10.370198579714, 42.0067149618146, 8.14319638132861, 34.0508943233725, 7.78517191057496, 26.9998965458032, 6.70435391953205, 3.62502215105156, 2.59277105754344, 14.4998960151485, 6.70435391953205, 5.8000097831969, 32.741875696675, 59.5015090627504, 13.5512565366133, 4.46460764999704, 9.62989278443572, 42.0073706103832, 8.86141045052292, 59.9511558158597, 7.22940551532861, 27.0003179651772, 7.29566488446303, 6.38233656214029, 2.40767880256155, 14.5001223322046, 7.29566488446303, 10.2116933242272), 'dim');attr(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr5# #argv <- list(structure(list(title = structure(1L, .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(2L, .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('title', 'other.author'), row.names = 1L, class = 'data.frame'), 'row.names');attr(argv[[1]],argv[[2]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr6# #argv <- list(structure(list(Y = c(130L, 157L, 174L, 117L, 114L, 161L, 141L, 105L, 140L, 118L, 156L, 61L, 91L, 97L, 100L, 70L, 108L, 126L, 149L, 96L, 124L, 121L, 144L, 68L, 64L, 112L, 86L, 60L, 102L, 89L, 96L, 89L, 129L, 132L, 124L, 74L, 89L, 81L, 122L, 64L, 103L, 132L, 133L, 70L, 89L, 104L, 117L, 62L, 90L, 100L, 116L, 80L, 82L, 94L, 126L, 63L, 70L, 109L, 99L, 53L, 74L, 118L, 113L, 89L, 82L, 86L, 104L, 97L, 99L, 119L, 121L), B = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L), .Label = c('I', 'II', 'III', 'IV', 'V', 'VI'), class = 'factor'), V = structure(c(3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L), .Label = c('Golden.rain', 'Marvellous', 'Victory'), class = 'factor'), N = structure(c(2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt'), class = 'factor')), .Names = c('Y', 'B', 'V', 'N'), terms = quote(Y ~ B + V + N + V:N), row.names = 2:72, class = 'data.frame'), 'na.action');attr(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr7# #argv <- list(structure('mtext(\'«Latin-1 accented chars»: éè øØ å<Å æ<Æ\', side = 3)\n', Rd_tag = 'RCODE'), 'Rd_tag');attr(argv[[1]],argv[[2]]); [1] "RCODE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr8# #argv <- list(structure(c(72.8922646699554, 72.8922646699554, 72.8922646699554, 72.8922646699554, 72.8922646699554, 99.6344113579063, 99.6344113579063, 122.561298550713, 122.561298550713, 122.561298550713, 122.561298550713, 122.561298550713, 122.561298550713, 140.590935258431, 140.590935258431, 140.590935258431, 153.976908924618, 153.976908924618, 153.976908924618, 153.976908924618, 163.542360717164, 163.542360717164, 163.542360717164, 163.542360717164, 163.542360717164, 163.542360717164, 170.206309375934, 170.206309375934, 170.206309375934, 170.206309375934, 170.206309375934, 170.206309375934, 170.206309375934, 170.206309375934, 170.206309375934, 174.771283819687, 174.771283819687, 174.771283819687, 174.771283819687, 174.771283819687, 174.771283819687, 174.771283819687, 174.771283819687, 174.771283819687, 174.771283819687, 177.863643456281, 177.863643456281, 177.863643456281, 177.863643456281, 177.863643456281, 181.334266157228, 182.262171017221), gradient = structure(c(0, 0, 0, 0, 0, 57.4245712142609, 57.4245712142609, 92.0663000396056, 92.0663000396056, 92.0663000396056, 92.0663000396056, 92.0663000396056, 92.0663000396056, 102.603355837019, 102.603355837019, 102.603355837019, 96.1864486469068, 96.1864486469068, 96.1864486469068, 96.1864486469068, 80.9127637202515, 80.9127637202515, 80.9127637202515, 80.9127637202515, 80.9127637202515, 80.9127637202515, 62.7567863240641, 62.7567863240641, 62.7567863240641, 62.7567863240641, 62.7567863240641, 62.7567863240641, 62.7567863240641, 62.7567863240641, 62.7567863240641, 45.2165616754423, 45.2165616754423, 45.2165616754423, 45.2165616754423, 45.2165616754423, 45.2165616754423, 45.2165616754423, 45.2165616754423, 45.2165616754423, 45.2165616754423, 29.9327435335998, 29.9327435335998, 29.9327435335998, 29.9327435335998, 29.9327435335998, 7.54853144661603, 0, 0.999999995832131, 0.999999995832131, 0.999999995832131, 0.999999995832131, 0.999999995832131, 0.900752404767751, 0.900752404767751, 0.72805882604922, 0.72805882604922, 0.72805882604922, 0.72805882604922, 0.72805882604922, 0.72805882604922, 0.546325339398677, 0.546325339398677, 0.546325339398677, 0.388712482407919, 0.388712482407919, 0.388712482407919, 0.388712482407919, 0.265313345750221, 0.265313345750221, 0.265313345750221, 0.265313345750221, 0.265313345750221, 0.265313345750221, 0.174363797963106, 0.174363797963106, 0.174363797963106, 0.174363797963106, 0.174363797963106, 0.174363797963106, 0.174363797963106, 0.174363797963106, 0.174363797963106, 0.109797198736723, 0.109797198736723, 0.109797198736723, 0.109797198736723, 0.109797198736723, 0.109797198736723, 0.109797198736723, 0.109797198736723, 0.109797198736723, 0.109797198736723, 0.0650421524858363, 0.0650421524858363, 0.0650421524858363, 0.0650421524858363, 0.0650421524858363, 0.0138547080588812, -2.61666809427403e-08, 0, 0, 0, 0, 0, 0.186415683651876, 0.186415683651876, 0.381271875735367, 0.381271875735367, 0.381271875735367, 0.381271875735367, 0.381271875735367, 0.381271875735367, 0.552874143045278, 0.552874143045278, 0.552874143045278, 0.689351882872836, 0.689351882872836, 0.689351882872836, 0.689351882872836, 0.791184856858009, 0.791184856858009, 0.791184856858009, 0.791184856858009, 0.791184856858009, 0.791184856858009, 0.864120807233518, 0.864120807233518, 0.864120807233518, 0.864120807233518, 0.864120807233518, 0.864120807233518, 0.864120807233518, 0.864120807233518, 0.864120807233518, 0.914989166321596, 0.914989166321596, 0.914989166321596, 0.914989166321596, 0.914989166321596, 0.914989166321596, 0.914989166321596, 0.914989166321596, 0.914989166321596, 0.914989166321596, 0.949854646587551, 0.949854646587551, 0.949854646587551, 0.949854646587551, 0.949854646587551, 0.989368022459573, 0.999999988297389), .Dim = c(52L, 3L))), 'gradient');attr(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] 0.000000 1.000000e+00 0.0000000 [2,] 0.000000 1.000000e+00 0.0000000 [3,] 0.000000 1.000000e+00 0.0000000 [4,] 0.000000 1.000000e+00 0.0000000 [5,] 0.000000 1.000000e+00 0.0000000 [6,] 57.424571 9.007524e-01 0.1864157 [7,] 57.424571 9.007524e-01 0.1864157 [8,] 92.066300 7.280588e-01 0.3812719 [9,] 92.066300 7.280588e-01 0.3812719 [10,] 92.066300 7.280588e-01 0.3812719 [11,] 92.066300 7.280588e-01 0.3812719 [12,] 92.066300 7.280588e-01 0.3812719 [13,] 92.066300 7.280588e-01 0.3812719 [14,] 102.603356 5.463253e-01 0.5528741 [15,] 102.603356 5.463253e-01 0.5528741 [16,] 102.603356 5.463253e-01 0.5528741 [17,] 96.186449 3.887125e-01 0.6893519 [18,] 96.186449 3.887125e-01 0.6893519 [19,] 96.186449 3.887125e-01 0.6893519 [20,] 96.186449 3.887125e-01 0.6893519 [21,] 80.912764 2.653133e-01 0.7911849 [22,] 80.912764 2.653133e-01 0.7911849 [23,] 80.912764 2.653133e-01 0.7911849 [24,] 80.912764 2.653133e-01 0.7911849 [25,] 80.912764 2.653133e-01 0.7911849 [26,] 80.912764 2.653133e-01 0.7911849 [27,] 62.756786 1.743638e-01 0.8641208 [28,] 62.756786 1.743638e-01 0.8641208 [29,] 62.756786 1.743638e-01 0.8641208 [30,] 62.756786 1.743638e-01 0.8641208 [31,] 62.756786 1.743638e-01 0.8641208 [32,] 62.756786 1.743638e-01 0.8641208 [33,] 62.756786 1.743638e-01 0.8641208 [34,] 62.756786 1.743638e-01 0.8641208 [35,] 62.756786 1.743638e-01 0.8641208 [36,] 45.216562 1.097972e-01 0.9149892 [37,] 45.216562 1.097972e-01 0.9149892 [38,] 45.216562 1.097972e-01 0.9149892 [39,] 45.216562 1.097972e-01 0.9149892 [40,] 45.216562 1.097972e-01 0.9149892 [41,] 45.216562 1.097972e-01 0.9149892 [42,] 45.216562 1.097972e-01 0.9149892 [43,] 45.216562 1.097972e-01 0.9149892 [44,] 45.216562 1.097972e-01 0.9149892 [45,] 45.216562 1.097972e-01 0.9149892 [46,] 29.932744 6.504215e-02 0.9498546 [47,] 29.932744 6.504215e-02 0.9498546 [48,] 29.932744 6.504215e-02 0.9498546 [49,] 29.932744 6.504215e-02 0.9498546 [50,] 29.932744 6.504215e-02 0.9498546 [51,] 7.548531 1.385471e-02 0.9893680 [52,] 0.000000 -2.616668e-08 1.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attr.testattr9# #argv <- list(structure(list(Fr = c(32, 53, 10, 3, 11, 50, 10, 30, 10, 25, 7, 5, 3, 15, 7, 8, 36, 66, 16, 4, 9, 34, 7, 64, 5, 29, 7, 5, 2, 14, 7, 8), Hair = structure(c(1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('Black', 'Brown', 'Red', 'Blond'), class = 'factor'), Eye = structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L), .Label = c('Brown', 'Blue', 'Hazel', 'Green'), class = 'factor'), Sex = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Male', 'Female'), class = 'factor')), .Names = c('Fr', 'Hair', 'Eye', 'Sex'), terms = quote(Fr ~ (Hair + Eye + Sex)^2), row.names = c(NA, 32L), class = 'data.frame'), 'terms');attr(argv[[1]],argv[[2]]); Fr ~ (Hair + Eye + Sex)^2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testArgsCasts# #x<-42; attr(x, 42) <- NULL Error in attr(x, 42) <- NULL : 'name' must be non-null character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testArgsCasts# #x<-42; attr(x, NULL) <- NULL Error in attr(x, NULL) <- NULL : 'name' must be non-null character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign# #{ as.character.namesAssignCls <- function(x) x+1; x <- 1; attr(x, 'names') <- structure(2, class='namesAssignCls'); names(x) } [1] "2" attr(,"class") [1] "namesAssignCls" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign# #{ x <- 1:2; attr(x, 'names') <- 1; names(x) } [1] "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign#Ignored.Unimplemented# #{ x <- 1:2; attr(x, 'names') <- structure(1, names=c('q'), abc=3); names(x) } q "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign# #{ x <- 1:2; attr(x, 'names') <- structure(c(1,2), names=c('q','r'), abc=3); names(x) } q r "1" "2" attr(,"abc") [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign# #{ x <- as.pairlist(list(1,2)); attr(x, 'names') <- 1; names(x) } [1] "1" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign#Ignored.Unimplemented# #{ x <- as.pairlist(list(1,2)); attr(x, 'names') <- structure(1, names=c('q'), abc=3); names(x) } [1] "1" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign# #{ x <- as.pairlist(list(1,2)); attr(x, 'names') <- structure(c(1,2), names=c('q','r'), abc=3); names(x) } [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign# #{ x <- c(3,9); attr(x, 'names') <- 1; names(x) } [1] "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign#Ignored.Unimplemented# #{ x <- c(3,9); attr(x, 'names') <- structure(1, names=c('q'), abc=3); names(x) } q "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign# #{ x <- c(3,9); attr(x, 'names') <- structure(c(1,2), names=c('q','r'), abc=3); names(x) } q r "1" "2" attr(,"abc") [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign# #{ x <- quote(foo(3)); attr(x, 'names') <- 1; names(x) } [1] "1" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign#Ignored.Unimplemented# #{ x <- quote(foo(3)); attr(x, 'names') <- structure(1, names=c('q'), abc=3); names(x) } [1] "1" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testNamesAssign# #{ x <- quote(foo(3)); attr(x, 'names') <- structure(c(1,2), names=c('q','r'), abc=3); names(x) } [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testRefCount# #x <- c(1,2); attr(x, "foo") <- c("a","b"); y <- x; attr(x,"foo")[[1]] <- "c"; y [1] 1 2 attr(,"foo") [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testRefCount# #x <- c(1,2,3); y <- 42; attr(y, 'at') <- x; x[[1]] <- 2; attr(y, 'at') [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testSetAttrOnNull# #x<-NULL; attr(x, 'a') <- 42 Error in attr(x, "a") <- 42 : attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testSetAttrOnNull# #x<-NULL; attr(x, 'a') <- NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign1# #argv <- list(structure(1, foo = structure(list(a = 'a'), .Names = 'a')), 'foo', value = structure(list(a = 'a'), .Names = 'a'));`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [1] 1 attr(,"foo") attr(,"foo")$a [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign10# #argv <- list(structure(list(a = 1:3, b = structure(1:3, .Label = c('a', 'b', 'c'), class = 'factor')), .Names = c('a', 'b'), row.names = c(NA, -3L), class = 'data.frame', foo = 10), 'foo', value = 10);`attr<-`(argv[[1]],argv[[2]],argv[[3]]); a b 1 1 a 2 2 b 3 3 c ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign11# #argv <- list(structure(c(50.566057038188, 50.566057038188, 102.811023011144, 102.811023011144, 134.361651733496, 134.361651733496, 164.684698598908, 164.684698598908, 190.832887571642, 190.832887571642, 200.968775266774, 200.968775266774), gradient = structure(c(0.237752464043283, 0.237752464043283, 0.483398854556726, 0.483398854556726, 0.631744210319564, 0.631744210319564, 0.774317697987532, 0.774317697987532, 0.897261758147131, 0.897261758147131, 0.944918870762493, 0.944918870762493, -601.11023288912, -601.11023288912, -828.312179323201, -828.312179323201, -771.656323378267, -771.656323378267, -579.628530513078, -579.628530513078, -305.762593240759, -305.762593240759, -172.635625621456, -172.635625621456), .Dim = c(12L, 2L), .Dimnames = list(NULL, c('Vm', 'K')))), 'gradient', value = structure(c(0.237752464043283, 0.237752464043283, 0.483398854556726, 0.483398854556726, 0.631744210319564, 0.631744210319564, 0.774317697987532, 0.774317697987532, 0.897261758147131, 0.897261758147131, 0.944918870762493, 0.944918870762493, -601.11023288912, -601.11023288912, -828.312179323201, -828.312179323201, -771.656323378267, -771.656323378267, -579.628530513078, -579.628530513078, -305.762593240759, -305.762593240759, -172.635625621456, -172.635625621456), .Dim = c(12L, 2L), .Dimnames = list(NULL, c('Vm', 'K'))));`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [1] 50.56606 50.56606 102.81102 102.81102 134.36165 134.36165 164.68470 [8] 164.68470 190.83289 190.83289 200.96878 200.96878 attr(,"gradient") Vm K [1,] 0.2377525 -601.1102 [2,] 0.2377525 -601.1102 [3,] 0.4833989 -828.3122 [4,] 0.4833989 -828.3122 [5,] 0.6317442 -771.6563 [6,] 0.6317442 -771.6563 [7,] 0.7743177 -579.6285 [8,] 0.7743177 -579.6285 [9,] 0.8972618 -305.7626 [10,] 0.8972618 -305.7626 [11,] 0.9449189 -172.6356 [12,] 0.9449189 -172.6356 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign12# #argv <- list(structure(numeric(0), .Dim = c(0L, 20L)), 'dimnames', value = NULL);`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [,14] [,15] [,16] [,17] [,18] [,19] [,20] ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign13# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(19L, 22L)), 'dimnames', value = NULL);`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [1,] FALSE TRUE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [2,] FALSE FALSE TRUE FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE [3,] FALSE TRUE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [4,] FALSE TRUE TRUE TRUE TRUE TRUE TRUE FALSE FALSE FALSE FALSE FALSE [5,] FALSE FALSE TRUE FALSE TRUE TRUE TRUE FALSE FALSE FALSE TRUE FALSE [6,] FALSE TRUE TRUE TRUE TRUE TRUE TRUE FALSE FALSE FALSE FALSE FALSE [7,] FALSE TRUE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [8,] FALSE FALSE TRUE FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE [9,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [10,] FALSE FALSE TRUE FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE [11,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [12,] FALSE FALSE TRUE FALSE TRUE TRUE TRUE FALSE FALSE FALSE TRUE FALSE [13,] FALSE FALSE TRUE FALSE TRUE TRUE TRUE FALSE FALSE FALSE TRUE FALSE [14,] FALSE TRUE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [15,] FALSE TRUE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [16,] FALSE TRUE TRUE TRUE TRUE TRUE TRUE FALSE FALSE FALSE FALSE FALSE [17,] FALSE FALSE TRUE FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE [18,] FALSE TRUE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [19,] FALSE TRUE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [,13] [,14] [,15] [,16] [,17] [,18] [,19] [,20] [,21] [,22] [1,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [2,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [3,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [4,] FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE [5,] TRUE FALSE TRUE TRUE TRUE FALSE FALSE FALSE TRUE FALSE [6,] FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE [7,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [8,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [9,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [10,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [11,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [12,] TRUE FALSE TRUE TRUE TRUE FALSE FALSE FALSE TRUE FALSE [13,] TRUE FALSE TRUE TRUE TRUE FALSE FALSE FALSE TRUE FALSE [14,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [15,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [16,] FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE [17,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [18,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [19,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign14# #argv <- list(structure(logical(0), .Dim = c(0L, 20L)), 'dimnames', value = NULL);`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [,14] [,15] [,16] [,17] [,18] [,19] [,20] ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign15# #argv <- list(structure(c('8189464 kB', '52252 kB', '237240 kB', '6704452 kB', '5868 kB', '3947300 kB', '3641700 kB', '521488 kB', '126264 kB', '3425812 kB', '3515436 kB', '0 kB', '0 kB', '20603324 kB', '20546156 kB', '1964 kB', '0 kB', '645292 kB', '12420 kB', '76 kB', '343696 kB', '303404 kB', '40292 kB', '2344 kB', '8464 kB', '0 kB', '0 kB', '0 kB', '24698056 kB', '1053308 kB', '34359738367 kB', '301080 kB', '34359386948 kB', '0 kB', '0', '0', '0', '0', '2048 kB', '7488 kB', '8376320 kB'), .Names = c('MemTotal', 'MemFree', 'Buffers', 'Cached', 'SwapCached', 'Active', 'Inactive', 'Active(anon)', 'Inactive(anon)', 'Active(file)', 'Inactive(file)', 'Unevictable', 'Mlocked', 'SwapTotal', 'SwapFree', 'Dirty', 'Writeback', 'AnonPages', 'Mapped', 'Shmem', 'Slab', 'SReclaimable', 'SUnreclaim', 'KernelStack', 'PageTables', 'NFS_Unstable', 'Bounce', 'WritebackTmp', 'CommitLimit', 'Committed_AS', 'VmallocTotal', 'VmallocUsed', 'VmallocChunk', 'HardwareCorrupted', 'HugePages_Total', 'HugePages_Free', 'HugePages_Rsvd', 'HugePages_Surp', 'Hugepagesize', 'DirectMap4k', 'DirectMap2M'), Name = '/proc/meminfo'), 'Name', value = '/proc/meminfo');`attr<-`(argv[[1]],argv[[2]],argv[[3]]); MemTotal MemFree Buffers Cached "8189464 kB" "52252 kB" "237240 kB" "6704452 kB" SwapCached Active Inactive Active(anon) "5868 kB" "3947300 kB" "3641700 kB" "521488 kB" Inactive(anon) Active(file) Inactive(file) Unevictable "126264 kB" "3425812 kB" "3515436 kB" "0 kB" Mlocked SwapTotal SwapFree Dirty "0 kB" "20603324 kB" "20546156 kB" "1964 kB" Writeback AnonPages Mapped Shmem "0 kB" "645292 kB" "12420 kB" "76 kB" Slab SReclaimable SUnreclaim KernelStack "343696 kB" "303404 kB" "40292 kB" "2344 kB" PageTables NFS_Unstable Bounce WritebackTmp "8464 kB" "0 kB" "0 kB" "0 kB" CommitLimit Committed_AS VmallocTotal VmallocUsed "24698056 kB" "1053308 kB" "34359738367 kB" "301080 kB" VmallocChunk HardwareCorrupted HugePages_Total HugePages_Free "34359386948 kB" "0 kB" "0" "0" HugePages_Rsvd HugePages_Surp Hugepagesize DirectMap4k "0" "0" "2048 kB" "7488 kB" DirectMap2M "8376320 kB" attr(,"Name") [1] "/proc/meminfo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign16# #argv <- list(structure(c(0, -187, -34, 0, 165, 0, -95, 121, 107, 0, 41, 0, 0, 93, 0), .Dim = c(5L, 3L)), 'dimnames', value = NULL);`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [,1] [,2] [,3] [1,] 0 0 41 [2,] -187 -95 0 [3,] -34 121 0 [4,] 0 107 93 [5,] 165 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign2# #argv <- list(structure(c(-99, 123, 0, -27, 0, 136, 3.5527136788005e-14, 0, -89, -59, 54.9999999999999, -260, 30, 47, 0), .Dim = c(5L, 3L)), 'dimnames', value = NULL);`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [,1] [,2] [,3] [1,] -99 1.360000e+02 55 [2,] 123 3.552714e-14 -260 [3,] 0 0.000000e+00 30 [4,] -27 -8.900000e+01 47 [5,] 0 -5.900000e+01 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign3# #argv <- list(structure(c(1, 0, 0, 0, NA, 1, 0, 0, 0, 7, 1, 0, 3, 0, 0, 1), .Dim = c(4L, 4L)), 'dimnames', value = NULL);`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [,1] [,2] [,3] [,4] [1,] 1 NA 0 3 [2,] 0 1 7 0 [3,] 0 0 1 0 [4,] 0 0 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign4# #argv <- list(structure(c(51.4483279898675, 51.4483279898675, 103.874299440142, 103.874299440142, 135.181084465022, 135.181084465022, 165.022949241512, 165.022949241512, 190.564205234787, 190.564205234787, 200.417426252912, 200.417426252912), gradient = structure(c(0.242941154845256, 0.242941154845256, 0.490498782967253, 0.490498782967253, 0.638330730196604, 0.638330730196604, 0.779245262792577, 0.779245262792577, 0.899852140987463, 0.899852140987463, 0.946379462411014, 0.946379462411014, -624.945810835795, -624.945810835795, -849.17029094943, -849.17029094943, -784.456730502965, -784.456730502965, -584.515233856856, -584.515233856856, -306.213585850174, -306.213585850174, -172.428123740936, -172.428123740936), .Dim = c(12L, 2L), .Dimnames = list(NULL, c('Vm', 'K'))), hessian = structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -2.95102023587733, -2.95102023587733, -4.00981760153928, -4.00981760153928, -3.70423746466663, -3.70423746466663, -2.76010536174851, -2.76010536174851, -1.44595334935665, -1.44595334935665, -0.814212806248508, -0.814212806248508, -2.95102023587733, -2.95102023587733, -4.00981760153928, -4.00981760153928, -3.70423746466663, -3.70423746466663, -2.76010536174851, -2.76010536174851, -1.44595334935665, -1.44595334935665, -0.814212806248508, -0.814212806248508, 15182.5057000153, 15182.5057000153, 13883.8998080881, 13883.8998080881, 9104.41522890179, 9104.41522890179, 4140.73388193682, 4140.73388193682, 984.096252952598, 984.096252952598, 296.69533645543, 296.69533645543), .Dim = c(12L, 2L, 2L), .Dimnames = list(NULL, c('Vm', 'K'), c('Vm', 'K')))), 'hessian', value = structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -2.95102023587733, -2.95102023587733, -4.00981760153928, -4.00981760153928, -3.70423746466663, -3.70423746466663, -2.76010536174851, -2.76010536174851, -1.44595334935665, -1.44595334935665, -0.814212806248508, -0.814212806248508, -2.95102023587733, -2.95102023587733, -4.00981760153928, -4.00981760153928, -3.70423746466663, -3.70423746466663, -2.76010536174851, -2.76010536174851, -1.44595334935665, -1.44595334935665, -0.814212806248508, -0.814212806248508, 15182.5057000153, 15182.5057000153, 13883.8998080881, 13883.8998080881, 9104.41522890179, 9104.41522890179, 4140.73388193682, 4140.73388193682, 984.096252952598, 984.096252952598, 296.69533645543, 296.69533645543), .Dim = c(12L, 2L, 2L), .Dimnames = list(NULL, c('Vm', 'K'), c('Vm', 'K'))));`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [1] 51.44833 51.44833 103.87430 103.87430 135.18108 135.18108 165.02295 [8] 165.02295 190.56421 190.56421 200.41743 200.41743 attr(,"gradient") Vm K [1,] 0.2429412 -624.9458 [2,] 0.2429412 -624.9458 [3,] 0.4904988 -849.1703 [4,] 0.4904988 -849.1703 [5,] 0.6383307 -784.4567 [6,] 0.6383307 -784.4567 [7,] 0.7792453 -584.5152 [8,] 0.7792453 -584.5152 [9,] 0.8998521 -306.2136 [10,] 0.8998521 -306.2136 [11,] 0.9463795 -172.4281 [12,] 0.9463795 -172.4281 attr(,"hessian") , , Vm Vm K [1,] 0 -2.9510202 [2,] 0 -2.9510202 [3,] 0 -4.0098176 [4,] 0 -4.0098176 [5,] 0 -3.7042375 [6,] 0 -3.7042375 [7,] 0 -2.7601054 [8,] 0 -2.7601054 [9,] 0 -1.4459533 [10,] 0 -1.4459533 [11,] 0 -0.8142128 [12,] 0 -0.8142128 , , K Vm K [1,] -2.9510202 15182.5057 [2,] -2.9510202 15182.5057 [3,] -4.0098176 13883.8998 [4,] -4.0098176 13883.8998 [5,] -3.7042375 9104.4152 [6,] -3.7042375 9104.4152 [7,] -2.7601054 4140.7339 [8,] -2.7601054 4140.7339 [9,] -1.4459533 984.0963 [10,] -1.4459533 984.0963 [11,] -0.8142128 296.6953 [12,] -0.8142128 296.6953 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign5# #argv <- list(structure(c(NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), .Dim = 3:4), 'dimnames', value = NULL);`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [,1] [,2] [,3] [,4] [1,] NA NA NA NA [2,] NA NA NA NA [3,] NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign6#Output.IgnoreWhitespace# #argv <- list(structure(c('o', 'p', 'v', 'i', 'r', 'w', 'b', 'm', 'f', 's'), date = structure(1224086400, class = c('POSIXct', 'POSIXt'), tzone = '')), 'date', value = structure(1224086400, class = c('POSIXct', 'POSIXt'), tzone = ''));`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [1] "o" "p" "v" "i" "r" "w" "b" "m" "f" "s" attr(,"date") [1] "2008-10-15 16:00:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign7# #argv <- list(structure(list(structure(list(structure(13L, label = 'Illinois', members = 1L, height = 0, leaf = TRUE), structure(32L, label = 'New York', members = 1L, height = 0, leaf = TRUE)), members = 2L, midpoint = 0.5, height = 6.23698645180507), structure(list(structure(22L, label = 'Michigan', members = 1L, height = 0, leaf = TRUE), structure(28L, label = 'Nevada', members = 1L, height = 0, leaf = TRUE)), members = 2L, midpoint = 0.5, height = 13.2973681606549)), members = 4L, midpoint = 1.5, height = 18.4173313943456, class = 'dendrogram', edgePar = structure(list( p.col = 'plum'), .Names = 'p.col'), edgetext = '4 members'), 'edgetext', value = '4 members');`attr<-`(argv[[1]],argv[[2]],argv[[3]]); 'dendrogram' with 2 branches and 4 members total, at height 18.41733 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign8# #argv <- list(structure(4, '`Object created`' = 'Sat Dec 7 00:26:20 2013'), 'Object created', value = 'Sat Dec 7 00:26:20 2013');`attr<-`(argv[[1]],argv[[2]],argv[[3]]); [1] 4 attr(,"`Object created`") [1] "Sat Dec 7 00:26:20 2013" attr(,"Object created") [1] "Sat Dec 7 00:26:20 2013" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassign9# #argv <- list(structure(1:3, .Names = c('a', 'b', 'c')), 'names', value = list('a', 'b', 'c'));`attr<-`(argv[[1]],argv[[2]],argv[[3]]); a b c 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-42; attr(x, 'comment') <- 'a' ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-42; attr(x, 'comment') <- 1 Error in attr(x, "comment") <- 1 : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-42; attr(x, 'comment') <- NA Error in attr(x, "comment") <- NA : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-42; attr(x, 'comment') <- NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-42; attr(x, 'comment') <- c('a', 'b') ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-42; attr(x, 'comment') <- c('a', NA) ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-42; attr(x, 'comment') <- c(1, 2) Error in attr(x, "comment") <- c(1, 2) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-42; attr(x, 'comment') <- c(NA) Error in attr(x, "comment") <- c(NA) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-42; attr(x, 'comment') <- c(NA, 'a', NA) ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-42; attr(x, 'comment') <- c(NA, NA) Error in attr(x, "comment") <- c(NA, NA) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-NA; attr(x, 'comment') <- 'a' ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-NULL; attr(x, 'comment') <- 'a' Error in attr(x, "comment") <- "a" : attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignComment# #x<-c(); attr(x, 'comment') <- 'a' Error in attr(x, "comment") <- "a" : attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignTsp# #x<-42; attr(x, 'tsp') <- 1 Error in attr(x, "tsp") <- 1 : 'tsp' attribute must be numeric of length three ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignTsp# #x<-42; attr(x, 'tsp') <- NA Error in attr(x, "tsp") <- NA : 'tsp' attribute must be numeric of length three ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignTsp# #x<-42; attr(x, 'tsp') <- NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignTsp# #x<-42; attr(x, 'tsp') <- c(1, 1, 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignTsp# #x<-42; attr(x, 'tsp') <- c(1, 2) Error in attr(x, "tsp") <- c(1, 2) : 'tsp' attribute must be numeric of length three ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignTsp# #x<-NA; attr(x, 'tsp') <- c(1, 1, 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignTsp# #x<-NULL; attr(x, 'tsp') <- c(1, 1, 1) Error in attr(x, "tsp") <- c(1, 1, 1) : attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attrassign.testattrassignTsp# #x<-c(); attr(x, 'tsp') <- c(1, 1, 1) Error in attr(x, "tsp") <- c(1, 1, 1) : attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #attributes(pairlist(1,2,3)) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #attributes(pairlist(a=1, b=2)) $names [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #attributes(structure(pairlist(1,2,3), myattr=42)) $myattr [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #attributes(structure(pairlist(a=1,b=2,c=3), myattr=42)) $names [1] "a" "b" "c" $myattr [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ e <- new.env(); attributes(e) <- list(a=1); attributes(e) } $a [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ e <- new.env(); attributes(e) <- list(class="srcfile"); attributes(e) } $class [1] "srcfile" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- 1 ; attributes(x) <- list(hi=3, hello=2) ; x } [1] 1 attr(,"hi") [1] 3 attr(,"hello") [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- 1 ; attributes(x) <- list(hi=3, names="name") ; x } name 1 attr(,"hi") [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- 1:2; attr(x, "aa") <- 1 ; attr(x, "ab") <- 2; attr(x, "bb") <- 3; attr(x, "b") } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- 1:3 ; attr(x, "myatt") <- 2:4 ; attr(x, "myatt1") <- "hello" ; attributes(x) } $myatt [1] 2 3 4 $myatt1 [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- 1:3 ; attr(x, "myatt") <- 2:4 ; attributes(x) } $myatt [1] 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- 1:3 ; attr(x, "myatt") <- 2:4 ; y <- x; attr(x, "myatt1") <- "hello" ; attributes(y) } $myatt [1] 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- 1; attributes(x) <- list(my = 1) ; y <- x; attributes(y) <- list(his = 2) ; x } [1] 1 attr(,"my") [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- 1; attributes(x) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- 1; names(x) <- "hello" ; attributes(x) } $names [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(a=1, b=2) ; attr(x, "mya") <- 1; attr(x, "b") <- 2; attr(x, "m") } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 2:4 ; y <- x; attr(x, "myatt1") <- "hello" ; attributes(y) } $names [1] "a" "b" $myatt [1] 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(a=1, b=2) ; attr(x, "na") } [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(a=1, b=2) ; attr(x, "names") } [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(hello=1) ; attributes(x) <- list(1, hi = 2) ; x } Error in attributes(x) <- list(1, hi = 2) : attempt to use zero-length variable name ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(hello=1) ; attributes(x) <- list(1, hi = 2, 3) ; x } Error in attributes(x) <- list(1, hi = 2, 3) : all attributes must have names [3 does not] ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(hello=1) ; attributes(x) <- list(hi = 1, 2) ; x } Error in attributes(x) <- list(hi = 1, 2) : all attributes must have names [2 does not] ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(hello=1) ; attributes(x) <- list(hi=1) ; attributes(x) <- NULL ; x } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(hello=1) ; attributes(x) <- list(hi=1, names=NULL, hello=3, hi=2, hello=NULL) ; x } [1] 1 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(hello=1) ; attributes(x) <- list(ho = 1, 2, 3) ; x } Error in attributes(x) <- list(ho = 1, 2, 3) : all attributes must have names [2 does not] ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(hello=1) ; attributes(x) <- list(names=NULL) ; x } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x <- c(hello=1) ; y<-list(1,2); names(y)<-c("hi", ""); attributes(x)<-y; x } Error in attributes(x) <- y : all attributes must have names [2 does not] ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ x<-1; attributes(x)<-list(names="c", dim=NULL); attributes(x) } $names [1] "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testAttributes# #{ z <- 1; attr(z,"a") <- 1; attr(z,"b") <- 2; attr(z,"c") <- 3 ; attr(z,"b") <- NULL ; z } [1] 1 attr(,"a") [1] 1 attr(,"c") [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes1# #argv <- list(structure(c(5.79821692617331, 1.82341879820553, 2.78390295547843, 5.76851897647876, 1.96728131351224, 1.64012180629841, 0.76150764829566, 8.78324957466388, 0.711713280005232, 0.0432245134694077, 0.484038236738706, 2.2604286525194), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')));attributes(argv[[1]]); $names [1] "1" "3" "5" "7" "9" "11" "13" "15" "17" "19" "21" "23" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes10# #argv <- list(structure(list(zi.si. = c(-2.73014251717135, -2.16787987308811, -1.61026765290054, -1.06093652746977, -0.523224065200069, 0, 0.506450782357207, 0.994479058519472, 1.46306067722175, 1.91173866627745, 2.34053598638487, 2.74985599456053)), .Names = 'zi.si.', row.names = c(NA, -12L), class = 'data.frame'));attributes(argv[[1]]); $names [1] "zi.si." $row.names [1] 1 2 3 4 5 6 7 8 9 10 11 12 $class [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes11# #argv <- list(structure(c(4L, 5L, 1L, 5L, 3L, 4L, 5L, 3L, 2L, 4L), .Label = c('a', 'c', 'i', 's', 't'), class = 'factor', contrasts = structure(c(1, 0, 0, 0, -1, 0, 1, 0, 0, -1, -0.247125681008604, -0.247125681008604, -0.149872105789645, 0.891249148815458, -0.247125681008604, 0.268816352031209, 0.268816352031209, -0.881781351530059, 0.0753322954364324, 0.268816352031209), .Dim = c(5L, 4L), .Dimnames = list(c('a', 'c', 'i', 's', 't'), NULL))));attributes(argv[[1]]); $levels [1] "a" "c" "i" "s" "t" $class [1] "factor" $contrasts [,1] [,2] [,3] [,4] a 1 0 -0.2471257 0.2688164 c 0 1 -0.2471257 0.2688164 i 0 0 -0.1498721 -0.8817814 s 0 0 0.8912491 0.0753323 t -1 -1 -0.2471257 0.2688164 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes12# #argv <- list(structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')));attributes(argv[[1]]); $names character(0) $package character(0) $class [1] "signature" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes13# #argv <- list(c(FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE));attributes(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes14# #argv <- list(structure(list(a_string = c('foo', 'bar'), a_bool = FALSE, a_struct = structure(list(a = 1, b = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), c = 'foo'), .Names = c('a', 'b', 'c')), a_cell = structure(list(1, 'foo', structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'bar'), .Dim = c(2L, 2L)), a_complex_scalar = 0+1i, a_list = list(1, structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'foo'), a_complex_matrix = structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)), a_range = c(1, 2, 3, 4, 5), a_scalar = 1, a_complex_3_d_array = structure(c(1+1i, 3+1i, 2+1i, 4+1i, 5-1i, 7-1i, 6-1i, 8-1i), .Dim = c(2L, 2L, 2L)), a_3_d_array = structure(c(1, 3, 2, 4, 5, 7, 6, 8), .Dim = c(2L, 2L, 2L)), a_matrix = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), a_bool_matrix = structure(c(TRUE, FALSE, FALSE, TRUE), .Dim = c(2L, 2L))), .Names = c('a_string', 'a_bool', 'a_struct', 'a_cell', 'a_complex_scalar', 'a_list', 'a_complex_matrix', 'a_range', 'a_scalar', 'a_complex_3_d_array', 'a_3_d_array', 'a_matrix', 'a_bool_matrix')));attributes(argv[[1]]); $names [1] "a_string" "a_bool" "a_struct" [4] "a_cell" "a_complex_scalar" "a_list" [7] "a_complex_matrix" "a_range" "a_scalar" [10] "a_complex_3_d_array" "a_3_d_array" "a_matrix" [13] "a_bool_matrix" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes15# #argv <- list(structure(c(1L, NA, 3L), .Label = c('1', '2', NA)));attributes(argv[[1]]); $levels [1] "1" "2" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes16# #argv <- list(structure(1, .Dim = c(1L, 1L), a = c(NA, 3, -1, 2), class = structure('B', package = '.GlobalEnv')));attributes(argv[[1]]); $dim [1] 1 1 $a [1] NA 3 -1 2 $class [1] "B" attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes17# #argv <- list(structure(list(L = structure(c('Min. :14.00 ', '1st Qu.:26.00 ', 'Median :29.50 ', 'Mean :36.39 ', '3rd Qu.:49.25 ', 'Max. :70.00 ', 'A:9 ', 'B:9 ', NA, NA, NA, NA), .Dim = c(6L, 2L), .Dimnames = list(c('', '', '', '', '', ''), c(' breaks', 'wool')), class = 'table'), M = structure(c('Min. :12.00 ', '1st Qu.:18.25 ', 'Median :27.00 ', 'Mean :26.39 ', '3rd Qu.:33.75 ', 'Max. :42.00 ', 'A:9 ', 'B:9 ', NA, NA, NA, NA), .Dim = c(6L, 2L), .Dimnames = list(c('', '', '', '', '', ''), c(' breaks', 'wool')), class = 'table'), H = structure(c('Min. :10.00 ', '1st Qu.:15.25 ', 'Median :20.50 ', 'Mean :21.67 ', '3rd Qu.:25.50 ', 'Max. :43.00 ', 'A:9 ', 'B:9 ', NA, NA, NA, NA), .Dim = c(6L, 2L), .Dimnames = list(c('', '', '', '', '', ''), c(' breaks', 'wool')), class = 'table')), .Dim = 3L, .Dimnames = structure(list(`warpbreaks[, 'tension']` = c('L', 'M', 'H')), .Names = 'warpbreaks[, \'tension\']')));attributes(argv[[1]]); $dim [1] 3 $dimnames $dimnames$`warpbreaks[, 'tension']` [1] "L" "M" "H" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes18# #argv <- list(structure(3.14159265358979, comment = 'Start with pi'));attributes(argv[[1]]); $comment [1] "Start with pi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes19# #argv <- list(structure(list(school = c(1L, 1L, 2L, 2L, 3L, 3L), class = c(9L, 10L, 9L, 10L, 9L, 10L), score.1 = c(0.487429052428485, 0.738324705129217, 1.51178116845085, 0.389843236411431, 1.12493091814311, -0.0449336090152309), score.2 = c(0.575781351653492, -0.305388387156356, -0.621240580541804, -2.2146998871775, -0.0161902630989461, 0.943836210685299)), .Names = c('school', 'class', 'score.1', 'score.2'), row.names = c(1L, 2L, 5L, 6L, 9L, 10L), class = 'data.frame', reshapeWide = structure(list(v.names = NULL, timevar = 'time', idvar = c('school', 'class'), times = c(1, 2), varying = structure(c('score.1', 'score.2'), .Dim = 1:2)), .Names = c('v.names', 'timevar', 'idvar', 'times', 'varying'))));attributes(argv[[1]]); $names [1] "school" "class" "score.1" "score.2" $row.names [1] 1 2 5 6 9 10 $class [1] "data.frame" $reshapeWide $reshapeWide$v.names NULL $reshapeWide$timevar [1] "time" $reshapeWide$idvar [1] "school" "class" $reshapeWide$times [1] 1 2 $reshapeWide$varying [,1] [,2] [1,] "score.1" "score.2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes2# #argv <- list(1386518010.66723);attributes(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes20# #argv <- list(structure(c(-0.927486533732408, -0.13045118082262, -1.45825662858798, -1.81793776180039, -1.62313249921887, 1.26834845395072, -0.994859212587552, -0.60437576902456, -1.06120404454492, 0.877124074149983, 0.824787552890982, 0.704014030529726, -0.702775741558964, 0.544818578451748, 1.48964468805446, 0.13432541283722, -0.128923575804159, -0.354052007275421, 1.0711307633823, -1.33461699082502, 0.380875114294515, -1.07786690183251, 0.810306659502442, -2.17501201437322, -0.407604875801864, -0.462999392844433, 0.194880873045067, 2.65407152575046, 0.564656783773942, 0.906337761254496, -0.631531096896236, -1.27819755429098, -0.538330333636237, 1.00231821330914, -0.286364553583536, 0.469006850788945, 1.05885815169124, 1.21503113231427, 1.44216953152086, 0.486588338054406, 0.268701510628534, -0.463411907566429, 1.02436199321322, -1.39004777906874, 0.999688613035661, -0.916808034628566, -0.502852003923634, 0.212379391073633, -0.0134736853666567, 1.31736970279298, -0.0944249611837457, 0.806746464646202, 0.315038937675493, -1.17340599897154, 0.482494016048211, -0.791050343541626, 0.808325470742601, 0.588652339988029, 1.10512245024341, 1.12322151831428, 0.208749082415184, -0.357070741737234, 0.572101015785145, -0.533738015097777, -0.360034768896796, 0.0342776735716719, -1.99368868442296, 2.04525110526828, 0.854582964377424, -0.292897401378698, -1.18433316855268, -0.376789959833897, -0.538288068463758, -0.232305057346106, -0.375870899318979, -0.359017335348666, -0.741816586737615, -0.269774297924449, -0.796951579131833, 0.0323594165086663, 0.439067375500569, 0.466080486767734, -1.49275492910805, 0.947406234969688, 0.182071046143441, 0.445836300099003, 2.02477378068589, -1.70432399838533, -0.440962927710655, 0.831168740087201, 2.13610340066555, -1.8137969168688, 1.22501979912183, 0.795942206968001, 1.87235555725712, -1.26557065145048, 0.378275537740316, 0.789728084675539, 0.99886763527649, 2.29736830042939, -0.00228198643744461, 0.161544616498807, -1.14848457105275, -1.08025155036982, -1.03819987128219, -0.856130938839897, 1.0042164519591, -0.843667376942675, -1.21154108350058, 0.460882948229546, -0.468389916732288, -0.946568852822378, 1.17783540515932, -0.973911234750034, -0.0639785174878419, -1.1045450251553, 0.442020873295079, 0.0831991221894004, 0.269053190969569, 0.901338595939942, -0.086250034518703, 0.478492308026563, -0.925167039266549, -0.658186865278783, 1.0337884593443, -0.434569632901449, 2.038954875659, 0.202381377518746, 0.484762177881311, -0.360074615793248, -0.129300783906607, 0.651643789311553, 0.934922268235395, -0.0934722501709123, -0.0103213567459648, 1.61917070438612, -1.06268414268298, 0.696244014590397, 0.992388229201836, 0.697363816464206, 0.250252166543902, -0.557960198745092, 0.221087284404152, 0.10961920608307, 0.259174711435693, -0.70162900779778, 1.92431317758909, -0.578758205883074, 1.59171854092147, 0.902876390823624, 0.840275033814991, 1.77586917630517, 0.403033282757909, 0.0539091417299491, -1.26615014148617, 0.0148781649233171, 0.256100494565364, -1.01942222514274, 0.549839939376835, -0.724728578424903, 0.151976282801212, 0.326791648750199, 0.748909789058061, -1.85444018168148, 0.0869984536340467, 1.25350587157032, 0.962041461790638, 0.120578653081864, -0.11935793490114, 0.6951267107979, -1.39729724662012, 1.03310979193329, -0.619324332563388, 0.60759513170927, 0.665670243263983, 1.34746787641065, 0.213814029897928, -0.43608749915348, -0.196912890515945, -0.474024803180795, -0.0932220458288109, -0.739450980689706, -0.299196422560384, -0.765918956807232, -0.374980670595253, 0.65328744055362, -0.552631311606602, -1.24532249102801, 1.50941913047883, -1.79189867145273, -0.892183862327233, 1.20950581962313, 0.454528744013934, 0.266817155028672, 1.65771215541012, 1.00893183514602, 0.761621316769915, 0.262896620317128, -0.128241496594234, 0.980274347240293), .Label = structure(list(c(-2.17503193782145, -0.474004879732569), c(-0.97393115819826, -0.0932021223805848), c(-0.468409840180514, 0.266837078476898), c(-0.086269957966929, 0.696263938038623), c(0.268681587180308, 1.02438191666144), c(0.697343893015979, 2.65409144919869)), class = 'shingleLevel'), class = 'shingle'));attributes(argv[[1]]); $levels [[1]] [1] -2.1750319 -0.4740049 [[2]] [1] -0.97393116 -0.09320212 [[3]] [1] -0.4684098 0.2668371 [[4]] [1] -0.08626996 0.69626394 [[5]] [1] 0.2686816 1.0243819 [[6]] [1] 0.6973439 2.6540914 attr(,"class") [1] "shingleLevel" $class [1] "shingle" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes21# #argv <- list(structure(c(82, 82, 82, 75, 63, 50, 43, 35, 35, 54, 54, 54, 39, 36, 0, 0, 57, 57, 57, 51, 45, 45, 39, 39, 36, 32, 25, 25, 25, 25, 32, 32, 59, 74, 74, 71, 71, 71, 71, 71, 71, 71, 73, 73, 73, 71, 71, 75, 75, 63, 62, 60, 57, 49, 49, 52, 57, 61, 62, 66, 66, 62, 61, 61, 72, 72, 78, 78, 78, 71, 71, 74, 74, 64, 62, 62, 73, 73, 69, 69, 69, 69, 64, 63, 62, 56, 46, 44, 44, 44, 44, 44, 44, 44, 44, 44, 59, 65, 65, 65, 61, 56, 53, 52, 51, 51, 49, 49, 49, 49, 0, 0, 44, 44, 40, 28, 27, 25, 24, 24), .Tsp = c(1945, 1974.75, 4), class = 'ts'));attributes(argv[[1]]); $tsp [1] 1945.00 1974.75 4.00 $class [1] "ts" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes22# #argv <- list(c(1000, 1e+07, 1));attributes(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes23#Ignored.OutputFormatting# #argv <- list(structure(list(), .Names = character(0), arguments = structure('object', simpleOnly = TRUE), signatures = list(), generic = structure(function (object) standardGeneric('show'), generic = structure('show', package = 'methods'), package = 'methods', group = list(), valueClass = character(0), signature = structure('object', simpleOnly = TRUE), default = structure(function (object) showDefault(object, FALSE), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'object', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'object', package = 'methods'), generic = structure('show', package = 'methods'), class = structure('derivedDefaultMethod', package = 'methods')), skeleton = quote((function (object) showDefault(object, FALSE))(object)), class = structure('standardGeneric', package = 'methods')), class = structure('listOfMethods', package = 'methods')));attributes(argv[[1]]); $names character(0) $arguments [1] "object" attr(,"simpleOnly") [1] TRUE $signatures list() $generic function (object) standardGeneric('show') attr(,"generic") [1] "show" attr(,"generic")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"group") list() attr(,"valueClass") character(0) attr(,"signature") [1] "object" attr(,"signature")attr(,"simpleOnly") [1] TRUE attr(,"default") function (object) showDefault(object, FALSE) attr(,"target") object "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"defined") object "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"generic") [1] "show" attr(,"generic")attr(,"package") [1] "methods" attr(,"class") [1] "derivedDefaultMethod" attr(,"class")attr(,"package") [1] "methods" attr(,"skeleton") (function(object) showDefault(object, FALSE))(object) attr(,"class") [1] "standardGeneric" attr(,"class")attr(,"package") [1] "methods" $class [1] "listOfMethods" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes24# #argv <- list(structure(list(x = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1), y = c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10), fac = structure(c(1L, 3L, 2L, 3L, 3L, 1L, 2L, 3L, 2L, 2L), .Label = c('A', 'B', 'C'), class = 'factor')), .Names = c('x', 'y', 'fac'), row.names = c(NA, -10L), class = 'data.frame'));attributes(argv[[1]]); $names [1] "x" "y" "fac" $row.names [1] 1 2 3 4 5 6 7 8 9 10 $class [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes25# #argv <- list(structure(character(0), package = character(0), class = structure('ObjectsWithPackage', package = 'methods')));attributes(argv[[1]]); $package character(0) $class [1] "ObjectsWithPackage" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes26# #argv <- list(structure(list(qr = structure(c(-561841.166008647, 1.48748911573234e-06, 1.62250974987379e-06, 1.29819733159371e-06, 1.3199650315892e-06, 1.59089005368605e-06, 3.38370366592718e-06, 1.54037267089339e-06, 1.26888887472893e-06, 1.66561998324397e-06, 2.71299853206351e-06, 1.82740883826792e-06, 1.69185183297085e-06, 1.36523405858032e-06, 1.55319864307643e-06, 1.56902110896583e-06, 1.3906190700334e-06, 1.2997165800148e-06, 1.56369334788134e-06, 1.43353743471477e-06, 1.74457009494164e-06, 2.03022219956374e-06, 1.73363224357496e-06, 1.47177180858703e-06, 4.47621920517122e-06, 1.45868913292866e-06, 1.67531329485535e-06, 1.56635043280177e-06, 1.90866628223014e-06, 1.54802991445627e-06, 1.60217310325092e-06, 2.68573152311995e-06, 1.55319864307643e-06, 1.65295348775885e-06, 1.41747488364731e-06, 0.999999999831096, 1.61369967706714e-06, 1.31520838537442e-06, 2.44157411192876e-06, 5.1686927260975e-06, 1.81484917852149e-06, 1.50372096623665e-06, 1.91837965937479e-06, 1.68517783522785e-06, 1.65295348775885e-06, 1.58810634192319e-06, 1.77478134630985e-06, 1.66883236806679e-06, 2.2002369936867e-06, 1.56635043280177e-06, 1.31520838537442e-06, 1.23229813671524e-06, 1.69185183297085e-06, 1.77091892313243e-06, 1.92329229138616e-06, 1.33290617468824e-06, 1.64672765212343e-06, 2.17841592228372e-06, 2.07828144894252e-06, 1.72289757538629e-06, 1.92824285888419e-06, 1.81484917852149e-06, 2.01304088471671e-06, 1.47621155263461e-06, 1.91350448082172e-06, 1.47177180858703e-06, 1.60217310325092e-06, 1.53282794306286e-06, 1.53282794306286e-06, 2.24592152723567e-06, 1.3564992660355e-06, 1.61662040285441e-06, 1.78652203450807e-06, 1.84456798315616e-06, 1.83165369610876e-06, 2.34653452685434e-06, 2.12325719919593e-06, 1.37956761746782e-06, 1.32156208605305e-06, 1.77478134630985e-06, 1.66242607813213e-06, 1.88501398961327e-06, 1.75571762111387e-06, 1.71936342279218e-06, 2.15723147161546e-06, 1.48294715363101e-06, 1.94332712676627e-06, 1.26606598163328e-06, 1.70544122262692e-06, 1.72289757538629e-06, 1.44385821185109e-06, 1.53533052096275e-06, 1.35133818480092e-06, 1.72645361131692e-06, 1.82319335667127e-06, 1.32963523435973e-06, 1.41158914936576e-06, 2.12325719919593e-06, 1.47844654491007e-06, 1.44385821185109e-06, 1472023.85454144, -24.6606754318977, 0.101285140222523, 0.12658801819228, 0.124500435606533, 0.103298237275271, 0.0485666635912155, 0.106685971539808, 0.129511920733888, 0.0986636292980589, 0.0605734308209414, 0.0899284547245126, 0.0971338624854, 0.120372186413924, 0.105804979598362, 0.104738008044408, 0.118174850871225, 0.126440048191751, 0.105094868834514, 0.114636830861078, 0.0941986135491651, 0.0809448199785816, 0.0947929347785712, 0.111658733889352, 0.0367127444946359, 0.11266018033215, 0.0980927625103667, 0.104916590166795, 0.0860999235367981, 0.106158253725478, 0.102570773477205, 0.06118841105676, 0.105804979598362, 0.0994196861729652, 0.115935876650863, -0.105466791174436, 0.101838113293825, 0.124950710904606, 0.0673073062385254, 0.0317940330935366, 0.0905508070559734, 0.109286343932539, 0.0856639697119484, 0.0975185539657231, 0.0994196861729652, 0.103479304149645, 0.0925951094262163, 0.0984737080806255, 0.0746900879658086, 0.104916590166795, 0.124950710904606, 0.13335753753099, 0.0971338624854, 0.0927970627378338, 0.0854451586907835, 0.123291662172605, 0.099795566659867, 0.075438259057915, 0.0790730002999382, 0.0953835529495729, 0.0852257858900505, 0.0905508070559734, 0.0816356880948164, 0.111322916452723, 0.085882223247457, 0.111658733889352, 0.102570773477205, 0.10721109183635, 0.10721109183635, 0.0731707992415186, 0.121147290839092, 0.101654123163447, 0.0919865892416036, 0.0890918891744519, 0.0897200446166977, 0.0700334141981384, 0.0773980324983756, 0.119121529360296, 0.124349981516283, 0.0925951094262163, 0.0988531856309209, 0.0871802709827442, 0.093600518723111, 0.095579614648734, 0.0761790825557647, 0.110817282218029, 0.0845642530341719, 0.129800688512867, 0.096359872295819, 0.0953835529495729, 0.113817398381304, 0.107036337986806, 0.121609982184857, 0.0951870874129862, 0.0901363829552483, 0.123594963843665, 0.116419281840054, 0.0773980324983756, 0.111154627274007, 0.113817398381304), .Dim = c(100L, 2L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100'), c('(Intercept)', 'x'))), rank = 2L, qraux = c(1.00000155841949, 1.11047890709071), pivot = 1:2, tol = 1e-11), .Names = c('qr', 'rank', 'qraux', 'pivot', 'tol')));attributes(argv[[1]]); $names [1] "qr" "rank" "qraux" "pivot" "tol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes27# #argv <- list(structure(list(message = 'NAs produced', call = quote(rnorm(2, numeric()))), .Names = c('message', 'call')));attributes(argv[[1]]); $names [1] "message" "call" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes28# #argv <- list(structure(c(7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 8L, 8L, 8L, 8L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 27L, 27L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 20L, 20L, 20L, 20L, 20L, 20L, 20L, 20L, 20L, 20L, 20L, 20L, 20L, 20L, 20L, 22L, 22L, 22L, 22L, 22L, 22L, 22L, 22L, 22L, 22L, 22L, 22L, 22L, 23L, 23L, 23L, 23L, 23L, 23L, 23L, 23L, 23L, 23L, 23L, 23L, 23L, 18L, 18L, 18L, 18L, 18L, 18L, 18L, 18L, 18L, 18L, 18L, 18L, 18L, 18L, 26L, 26L, 26L, 26L, 26L, 26L, 26L, 26L, 26L, 26L, 26L, 26L, 26L, 26L, 26L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 24L, 24L, 24L, 24L, 24L, 24L, 24L, 24L, 24L, 24L, 24L, 24L, 24L, 24L, 24L, 24L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 17L, 17L, 17L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 16L, 16L, 16L, 16L, 16L, 16L, 16L, 16L, 15L, 15L, 15L, 15L, 15L, 15L, 15L, 15L, 15L, 14L, 14L, 14L, 14L, 14L, 14L, 14L, 14L, 14L), .Label = structure(c('9', '8', '7', '4', '2', '10', '1', '3', '5', '6', '21', '22', '24', '27', '26', '25', '23', '17', '11', '14', '13', '15', '16', '20', '19', '18', '12'), .Names = c('Control1', 'Control2', 'Control3', 'Control4', 'Control5', 'Control6', 'Control7', 'Control8', 'Control9', 'Control10', 'High1', 'High2', 'High3', 'High4', 'High5', 'High6', 'High7', 'Low1', 'Low2', 'Low3', 'Low4', 'Low5', 'Low6', 'Low7', 'Low8', 'Low9', 'Low10')), class = c('ordered', 'factor')));attributes(argv[[1]]); $levels Control1 Control2 Control3 Control4 Control5 Control6 Control7 Control8 "9" "8" "7" "4" "2" "10" "1" "3" Control9 Control10 High1 High2 High3 High4 High5 High6 "5" "6" "21" "22" "24" "27" "26" "25" High7 Low1 Low2 Low3 Low4 Low5 Low6 Low7 "23" "17" "11" "14" "13" "15" "16" "20" Low8 Low9 Low10 "19" "18" "12" $class [1] "ordered" "factor" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes29# #argv <- list(structure(list(tau = c(-0.704193760852047, 0, 1.5847914530377, 2.07658624888165, 2.62779840842982, 3.16900609499152, 3.70430313207003), par.vals = structure(c(1.19410356771918, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 0.0145810141529953, 0.24263452560295, 0.470688037052905, 0.562956252821107, 0.683253495496408, 0.823187854524599, 0.98897386701965), .Dim = c(7L, 2L), .Dimnames = list(NULL, c('a', 'b')))), .Names = c('tau', 'par.vals')));attributes(argv[[1]]); $names [1] "tau" "par.vals" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes3# #argv <- list(structure(list(x = c(55, 55.4, 55.8, 56.2, 56.6, 57, 57.4, 57.8, 58.2, 58.6, 59, 59.4, 59.8, 60.2, 60.6, 61, 61.4, 61.8, 62.2, 62.6, 63, 63.4, 63.8, 64.2, 64.6, 65, 65.4, 65.8, 66.2, 66.6, 67, 67.4, 67.8, 68.2, 68.6, 69, 69.4, 69.8, 70.2, 70.6, 71, 71.4, 71.8, 72.2, 72.6, 73, 73.4, 73.8, 74.2, 74.6, 75), y = c(NA, NA, NA, NA, NA, NA, NA, NA, 115.348528272371, 116.097056544742, 117, 118.121358638144, 119.369358638144, 120.616754451341, 121.816150264538, 123, 124.196077478756, 125.399549206385, 126.598034046405, 127.793047158796, 129, 130.223726064439, 131.424330251242, 132.555722198323, 133.686509958601, 135, 136.60008742339, 138.253074310999, 139.654076730115, 140.802092261622, 142, 143.481497863021, 145.150710102743, 146.833352023286, 148.446781704108, 150, 151.524882658905, 153.128867127397, 154.93285159589, 156.93285159589, 159, 161.026859361644, 163.013429680822, NA, NA, NA, NA, NA, NA, NA, NA)), .Names = c('x', 'y')));attributes(argv[[1]]); $names [1] "x" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes4# #argv <- list(structure(c(1+1i, 2+1.4142135623731i, 3+1.73205080756888i, 4+2i, 5+2.23606797749979i, 6+2.44948974278318i, 7+2.64575131106459i, 8+2.82842712474619i, 9+3i, 10+3.1622776601684i), id = character(0), class = structure('withId', package = '.GlobalEnv')));attributes(argv[[1]]); $id character(0) $class [1] "withId" attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes5# #argv <- list(structure(c('o', 'p', 'v', 'i', 'r', 'w', 'b', 'm', 'f', 's'), date = structure(1224086400, class = c('POSIXct', 'POSIXt'), tzone = ''), .S3Class = 'stamped', class = structure('stamped', package = '.GlobalEnv')));attributes(argv[[1]]); $date [1] "2008-10-15 16:00:00 GMT" $.S3Class [1] "stamped" $class [1] "stamped" attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes6# #argv <- list(structure(list(loc = c(0.0804034870161223, 10.3548347412639), cov = structure(c(3.01119301965569, 6.14320559215603, 6.14320559215603, 14.7924762275451), .Dim = c(2L, 2L)), d2 = 2, wt = c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0), sqdist = c(0.439364946869246, 0.0143172566761092, 0.783644692619938, 0.766252947443554, 0.346865912102713, 1.41583192825661, 0.168485512965902, 0.354299830956879, 0.0943280426627965, 1.05001058449122, 1.02875556201707, 0.229332323173361, 0.873263925064789, 2.00000009960498, 0.449304354954282, 0.155023307933165, 0.118273979375253, 0.361693898800799, 0.21462398586105, 0.155558909016629, 0.471723661454506, 0.719528696331092, 0.0738164380664225, 1.46001193111051, 0.140785322548143, 0.127761195166703, 0.048012401156175, 0.811750426884519, 0.425827709817574, 0.163016638545231, 0.557810866640707, 0.277350147637843, 0.0781399119055092, 1.29559183995835, 0.718376405567138, 1.37650242941478, 0.175087780508154, 0.233808973148729, 0.693473805463067, 0.189096604125073, 1.96893781800017, 0.4759756980592, 1.69665760380474, 0.277965749373647, 0.920525436884815, 0.57525234053591, 1.59389578665009, 0.175715364671313, 0.972045794851437, 1.75514684962809, 0.0597413185507202, 0.174340343040626, 0.143421553552865, 0.997322770596838, 1.94096736957465, 2.00000001159796, 0.367000821772989, 0.682474530588235, 1.20976163307984, 1.27031685239035, 1.79775635513363, 0.0857761902860323, 0.435578932929501, 0.214370604878221, 0.494714247412686, 1.78784623754399, 1.24216674083069, 1.87749485326709, 0.0533296334123023, 1.45588362584438, 2.00000000631459, 0.208857144738039, 0.119251291573058, 0.365303924649962, 0.690656674239668, 0.0396958405786268, 0.258262120876164, 1.57360254057537, 0.307548421049514, 0.628417063100241, 1.00647098749202, 0.297624360530352, 0.400289147351669, 1.98298426250944, 0.129127182829694, 0.0794695319493149, 0.991481735944321, 0.444068154119836, 0.206790162395106, 0.574310829851377, 0.181887577583334, 0.433872021297517, 0.802994892604009, 0.293053770941001, 1.7002969001965, 0.77984639982848, 1.36127407487932, 0.761935213110323, 0.597915313430067, 0.237134831067472), prob = NULL, tol = 1e-07, eps = 9.96049758228423e-08, it = 898L, maxit = 5000, ierr = 0L, conv = TRUE), .Names = c('loc', 'cov', 'd2', 'wt', 'sqdist', 'prob', 'tol', 'eps', 'it', 'maxit', 'ierr', 'conv'), class = 'ellipsoid'));attributes(argv[[1]]); $names [1] "loc" "cov" "d2" "wt" "sqdist" "prob" "tol" "eps" [9] "it" "maxit" "ierr" "conv" $class [1] "ellipsoid" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes7# #argv <- list(NULL);attributes(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes8# #argv <- list('Error in setClass(\'class3\', representation(\'class1\', \'class2\')) : \n error in contained classes (\'class2\') for class “class3”; class definition removed from ‘.GlobalEnv’\n');attributes(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributes.testattributes9# #argv <- list(structure(list(), .Names = character(0), row.names = integer(0), .S3Class = 'data.frame', extra = character(0)));attributes(argv[[1]]); $names character(0) $row.names integer(0) $.S3Class [1] "data.frame" $extra character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testArgsCasts# #x <- 42; attributes(x) <- 44 Error in attributes(x) <- 44 : attributes must be a list or NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testArgsCasts# #x <- 42; attributes(x) <- NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testArgsCasts# #x <- 42; attributes(x) <- list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassign1# #argv <- list(NULL, NULL);`attributes<-`(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassign1# #{ `attributes<-`(NULL, list(a=42)) } list() attr(,"a") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassign2#Output.IgnoreWhitespace# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));`attributes<-`(argv[[1]],argv[[2]]); [[1]] factor(0) Levels: attr(,"c0") factor(0) Levels: ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassign3# #argv <- list(NA, value = NULL);`attributes<-`(argv[[1]],argv[[2]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassign4# #argv <- list(1:6, value = NULL);`attributes<-`(argv[[1]],argv[[2]]); [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassign5# #argv <- list(c(2.63548374681491, 2.5910646070265, 2.66370092538965, 2.70586371228392, 2.78247262416629, 2.79379038469082, 2.72835378202123, 2.67394199863409, 2.66370092538965, 2.6222140229663, 2.59217675739587, 2.62013605497376, 2.60745502321467, 2.55870857053317, 2.60959440922522, 2.66558099101795, 2.74741180788642, 2.73878055848437, 2.67394199863409, 2.6232492903979, 2.59769518592551, 2.60852603357719, 2.53402610605613, 2.55630250076729, 2.52762990087134, 2.49136169383427, 2.55509444857832, 2.60638136511061, 2.70329137811866, 2.69108149212297, 2.63848925695464, 2.55990662503611, 2.54157924394658, 2.55870857053317, 2.50242711998443, 2.53147891704225, 2.52633927738984, 2.48429983934679, 2.54032947479087, 2.60638136511061, 2.66931688056611, 2.66745295288995, 2.62531245096167, 2.55022835305509, 2.54157924394658, 2.55144999797288, 2.47856649559384, 2.4983105537896, 2.48572142648158, 2.43296929087441, 2.48572142648158, 2.55022835305509, 2.60745502321467, 2.6159500516564, 2.57287160220048, 2.50242711998443, 2.49554433754645, 2.50105926221775, 2.44247976906445, 2.45331834004704, 2.44404479591808, 2.3747483460101, 2.43775056282039, 2.49415459401844, 2.54032947479087, 2.56110138364906, 2.4983105537896, 2.43136376415899, 2.42975228000241, 2.42651126136458, 2.36735592102602, 2.38381536598043, 2.35983548233989, 2.30749603791321, 2.35983548233989, 2.41329976408125, 2.46686762035411, 2.48000694295715, 2.42160392686983, 2.36921585741014, 2.35602585719312, 2.37106786227174, 2.27415784926368, 2.3096301674259, 2.30319605742049, 2.25527250510331, 2.32428245529769, 2.3747483460101, 2.4345689040342, 2.42160392686983, 2.38560627359831, 2.35983548233989, 2.37106786227174, 2.37291200297011, 2.29225607135648, 2.29225607135648, 2.28780172993023, 2.23552844690755, 2.28103336724773, 2.32014628611105, 2.38381536598043, 2.36172783601759, 2.3384564936046, 2.26245108973043, 2.25767857486918, 2.28555730900777, 2.25527250510331, 2.23299611039215, 2.22010808804005, 2.16435285578444, 2.20951501454263, 2.26481782300954, 2.29885307640971, 2.29885307640971, 2.25042000230889, 2.23552844690755, 2.21218760440396, 2.25042000230889, 2.17609125905568, 2.16136800223497, 2.14612803567824, 2.05690485133647, 2.12385164096709, 2.19865708695442, 2.23044892137827, 2.23044892137827, 2.17318626841227, 2.09691001300806, 2.13033376849501, 2.14921911265538, 2.10037054511756, 2.06069784035361, 2.07188200730613, 2.01703333929878, 2.07554696139253, 2.13353890837022, 2.17026171539496, 2.17026171539496, 2.13033376849501, 2.08278537031645, 2.11058971029925, 2.12057393120585, 2.07188200730613, 2.04921802267018), value = structure(list(tsp = c(1949, 1960.91666666667, 12), class = 'ts'), .Names = c('tsp', 'class')));`attributes<-`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul Aug 1949 2.635484 2.591065 2.663701 2.705864 2.782473 2.793790 2.728354 2.673942 1950 2.607455 2.558709 2.609594 2.665581 2.747412 2.738781 2.673942 2.623249 1951 2.527630 2.491362 2.555094 2.606381 2.703291 2.691081 2.638489 2.559907 1952 2.526339 2.484300 2.540329 2.606381 2.669317 2.667453 2.625312 2.550228 1953 2.485721 2.432969 2.485721 2.550228 2.607455 2.615950 2.572872 2.502427 1954 2.444045 2.374748 2.437751 2.494155 2.540329 2.561101 2.498311 2.431364 1955 2.359835 2.307496 2.359835 2.413300 2.466868 2.480007 2.421604 2.369216 1956 2.303196 2.255273 2.324282 2.374748 2.434569 2.421604 2.385606 2.359835 1957 2.287802 2.235528 2.281033 2.320146 2.383815 2.361728 2.338456 2.262451 1958 2.220108 2.164353 2.209515 2.264818 2.298853 2.298853 2.250420 2.235528 1959 2.146128 2.056905 2.123852 2.198657 2.230449 2.230449 2.173186 2.096910 1960 2.071882 2.017033 2.075547 2.133539 2.170262 2.170262 2.130334 2.082785 Sep Oct Nov Dec 1949 2.663701 2.622214 2.592177 2.620136 1950 2.597695 2.608526 2.534026 2.556303 1951 2.541579 2.558709 2.502427 2.531479 1952 2.541579 2.551450 2.478566 2.498311 1953 2.495544 2.501059 2.442480 2.453318 1954 2.429752 2.426511 2.367356 2.383815 1955 2.356026 2.371068 2.274158 2.309630 1956 2.371068 2.372912 2.292256 2.292256 1957 2.257679 2.285557 2.255273 2.232996 1958 2.212188 2.250420 2.176091 2.161368 1959 2.130334 2.149219 2.100371 2.060698 1960 2.110590 2.120574 2.071882 2.049218 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassign6# #argv <- list(structure(c(1, 1, 1, 1, 2, 3), .Dim = c(3L, 2L), .Dimnames = list(NULL, c('I', 'a')), foo = 'bar', class = 'matrix'), value = structure(list(class = 'matrix', foo = 'bar', dimnames = list(NULL, c('I', 'a')), dim = c(3L, 2L)), .Names = c('class', 'foo', 'dimnames', 'dim')));`attributes<-`(argv[[1]],argv[[2]]); I a [1,] 1 1 [2,] 1 2 [3,] 1 3 attr(,"class") [1] "matrix" attr(,"foo") [1] "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(42, comment='a') [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(42, comment=1) Error in attributes(.Data) <- c(attributes(.Data), attrib) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(42, comment=NA) Error in attributes(.Data) <- c(attributes(.Data), attrib) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(42, comment=NULL) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(42, comment=c('a', 'b')) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(42, comment=c('a', NA)) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(42, comment=c(1, 2)) Error in attributes(.Data) <- c(attributes(.Data), attrib) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(42, comment=c(NA)) Error in attributes(.Data) <- c(attributes(.Data), attrib) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(42, comment=c(NA, 'a', NA)) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(42, comment=c(NA, NA)) Error in attributes(.Data) <- c(attributes(.Data), attrib) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(NA, comment='a') [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(NULL, comment='a') list() Warning message: In structure(NULL, comment = "a") : Calling 'structure(NULL, *)' is deprecated, as NULL cannot have attributes. Consider 'structure(list(), *)' instead. ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignComment# #structure(c(), comment='a') list() Warning message: In structure(c(), comment = "a") : Calling 'structure(NULL, *)' is deprecated, as NULL cannot have attributes. Consider 'structure(list(), *)' instead. ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignTsp# #structure(42, tsp=1) Error in attributes(.Data) <- c(attributes(.Data), attrib) : 'tsp' attribute must be numeric of length three ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignTsp# #structure(42, tsp=NA) Error in attributes(.Data) <- c(attributes(.Data), attrib) : 'tsp' attribute must be numeric of length three ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignTsp# #structure(42, tsp=NULL) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignTsp# #structure(42, tsp=c(1, 1, 1)) [1] 42 attr(,"tsp") [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignTsp# #structure(42, tsp=c(1, 2)) Error in attributes(.Data) <- c(attributes(.Data), attrib) : 'tsp' attribute must be numeric of length three ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignTsp# #structure(NA, tsp=c(1, 1, 1)) [1] NA attr(,"tsp") [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignTsp# #structure(NULL, tsp=c(1, 1, 1)) Error in attributes(.Data) <- c(attributes(.Data), attrib) : cannot assign 'tsp' to zero-length vector In addition: Warning message: In structure(NULL, tsp = c(1, 1, 1)) : Calling 'structure(NULL, *)' is deprecated, as NULL cannot have attributes. Consider 'structure(list(), *)' instead. ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign.testattributesassignTsp# #structure(c(), tsp=c(1, 1, 1)) Error in attributes(.Data) <- c(attributes(.Data), attrib) : cannot assign 'tsp' to zero-length vector In addition: Warning message: In structure(c(), tsp = c(1, 1, 1)) : Calling 'structure(NULL, *)' is deprecated, as NULL cannot have attributes. Consider 'structure(list(), *)' instead. ##com.oracle.truffle.r.test.builtins.TestBuiltin_attributesassign_.testattributesassign_1# #argv <- structure(list(structure(list(), class = structure('L', package = '.GlobalEnv')), value = NULL), .Names = c('', 'value'));do.call('attributes<-', argv) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_backsolve.testbacksolve1# #argv <- list(structure(c(-2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.0421675318334475, 0, -2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.0421675318334475, 0, 0, -2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.445407110781343, 0, 0, 0, -1.73205080756888, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.510819156714975, 0, 0, 0, 0, -1.73205080756888, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.510819156714975, 0, 0, 0, 0, 0, -1.73205080756888, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.510819156714975, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.0592753100948471, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.428419619610855, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.252201198430086, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.428419619610855, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.73205080756888, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.510819156714975, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.0592753100948472, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, -0.0592753100948472, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, -0.252201198430086, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, -0.252201198430086, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -2, 0, 0, 0, 0, 0, -0.0421675318334475, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -2, 0, 0, 0, 0, -0.0421675318334475, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.73205080756888, 0, 0, 0, -0.0486697428190666, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.73205080756888, 0, 0, -0.0486697428190666, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.73205080756888, 0, -0.0486697428190666, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.73205080756888, -0.0486697428190666, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.935285871700694), .Dim = c(22L, 22L), .Dimnames = list(c('StripS01', 'StripS02', 'StripS03', 'StripS04', 'StripS05', 'StripS06', 'StripS07', 'StripS08', 'StripS09', 'StripS10', 'StripS11', 'StripS12', 'StripS13', 'StripS14', 'StripS15', 'StripS16', 'StripS17', 'StripS18', 'StripS19', 'StripS20', 'StripS21', ''), c('3', '4', '5', '6', '9', '10', '11', '12', '13', '14', '15', '16', '19', '20', '21', '25', '26', '27', '31', '32', '33', '39'))), structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0.00019677474442243), .Dim = c(22L, 1L)), 22L, FALSE, FALSE); .Internal(backsolve(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [,1] [1,] 0.0000000000 [2,] 0.0000000000 [3,] 0.0000000000 [4,] 0.0000000000 [5,] 0.0000000000 [6,] 0.0000000000 [7,] 0.0000000000 [8,] 0.0000000000 [9,] 0.0000000000 [10,] 0.0000000000 [11,] 0.0000000000 [12,] 0.0000000000 [13,] 0.0000000000 [14,] 0.0000000000 [15,] 0.0000000000 [16,] 0.0000000000 [17,] 0.0000000000 [18,] 0.0000000000 [19,] 0.0000000000 [20,] 0.0000000000 [21,] 0.0000000000 [22,] -0.0002103899 ##com.oracle.truffle.r.test.builtins.TestBuiltin_backsolve.testbacksolve2# #argv <- list(structure(c(-2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.0421590411210753, 0, -2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.0421590411210753, 0, 0, -2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.445373554228914, 0, 0, 0, -1.73205080756888, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.510781706167877, 0, 0, 0, 0, -1.73205080756888, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.510781706167877, 0, 0, 0, 0, 0, -1.73205080756888, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.510781706167877, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.0592635069735823, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.428392065749892, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.252172670570357, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.428392065749892, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.73205080756888, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.510781706167877, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.0592635069735823, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, 0, -0.0592635069735823, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, 0, -0.252172670570357, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.4142135623731, 0, 0, 0, 0, 0, 0, -0.252172670570357, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -2, 0, 0, 0, 0, 0, -0.0421590411210753, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -2, 0, 0, 0, 0, -0.0421590411210753, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.73205080756888, 0, 0, 0, -0.0486599542810648, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.73205080756888, 0, 0, -0.0486599542810647, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.73205080756888, 0, -0.0486599542810648, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.73205080756888, -0.0486599542810648, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.935253697073914), .Dim = c(22L, 22L), .Dimnames = list(c('StripS01', 'StripS02', 'StripS03', 'StripS04', 'StripS05', 'StripS06', 'StripS07', 'StripS08', 'StripS09', 'StripS10', 'StripS11', 'StripS12', 'StripS13', 'StripS14', 'StripS15', 'StripS16', 'StripS17', 'StripS18', 'StripS19', 'StripS20', 'StripS21', ''), c('3', '4', '5', '6', '9', '10', '11', '12', '13', '14', '15', '16', '19', '20', '21', '25', '26', '27', '31', '32', '33', '39'))), structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.20033559004316e-05), .Dim = c(22L, 1L)), 22L, FALSE, FALSE); .Internal(backsolve(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [,1] [1,] 0.000000e+00 [2,] 0.000000e+00 [3,] 0.000000e+00 [4,] 0.000000e+00 [5,] 0.000000e+00 [6,] 0.000000e+00 [7,] 0.000000e+00 [8,] 0.000000e+00 [9,] 0.000000e+00 [10,] 0.000000e+00 [11,] 0.000000e+00 [12,] 0.000000e+00 [13,] 0.000000e+00 [14,] 0.000000e+00 [15,] 0.000000e+00 [16,] 0.000000e+00 [17,] 0.000000e+00 [18,] 0.000000e+00 [19,] 0.000000e+00 [20,] 0.000000e+00 [21,] 0.000000e+00 [22,] -1.283433e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_backsolve.testbacksolve3# #argv <- list(structure(c(-0.91092349872819, -1.26769315823132, 0, -1.11965595698793), .Dim = c(2L, 2L)), structure(c(-0.000210872744086474, 0.000210873298561107), .Dim = c(2L, 1L)), 2L, FALSE, FALSE); .Internal(backsolve(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [,1] [1,] 0.0002314934 [2,] -0.0004504382 ##com.oracle.truffle.r.test.builtins.TestBuiltin_basename.testbasename1# #argv <- list('/home/roman/r-instrumented/library/base/help/DateTimeClasses'); .Internal(basename(argv[[1]])) [1] "DateTimeClasses" ##com.oracle.truffle.r.test.builtins.TestBuiltin_basename.testbasename2# #argv <- list(structure('myTst', .Names = '')); .Internal(basename(argv[[1]])) [1] "myTst" ##com.oracle.truffle.r.test.builtins.TestBuiltin_basename.testbasename3# #argv <- list(c('file55711ba85492.R', '/file55711ba85492.R')); .Internal(basename(argv[[1]])) [1] "file55711ba85492.R" "file55711ba85492.R" ##com.oracle.truffle.r.test.builtins.TestBuiltin_basename.testbasename4# #argv <- list(character(0)); .Internal(basename(argv[[1]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_basename.testbasename5# #argv <- list(structure('/home/lzhao/hg/r-instrumented/library/utils', .Names = 'Dir')); .Internal(basename(argv[[1]])) [1] "utils" ##com.oracle.truffle.r.test.builtins.TestBuiltin_basename.testbasename6# #argv <- list('tk_messageBox.Rd'); .Internal(basename(argv[[1]])) [1] "tk_messageBox.Rd" ##com.oracle.truffle.r.test.builtins.TestBuiltin_basename.testbasename7# #argv <- list(c('.', '.', '.', '.', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'R', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'data', 'inst', 'inst', 'inst/doc', 'inst/doc', 'inst/doc', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'man', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb/figures', 'noweb/figures', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb/rates', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'noweb', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'src', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'tests', 'vignettes', 'vignettes', 'vignettes')); .Internal(basename(argv[[1]])) [1] "." "." "." "." "R" "R" [7] "R" "R" "R" "R" "R" "R" [13] "R" "R" "R" "R" "R" "R" [19] "R" "R" "R" "R" "R" "R" [25] "R" "R" "R" "R" "R" "R" [31] "R" "R" "R" "R" "R" "R" [37] "R" "R" "R" "R" "R" "R" [43] "R" "R" "R" "R" "R" "R" [49] "R" "R" "R" "R" "R" "R" [55] "R" "R" "R" "R" "R" "R" [61] "R" "R" "R" "R" "R" "R" [67] "R" "R" "R" "R" "R" "R" [73] "R" "R" "R" "R" "R" "R" [79] "R" "R" "R" "R" "R" "R" [85] "R" "R" "R" "R" "R" "R" [91] "R" "R" "R" "R" "R" "R" [97] "R" "R" "R" "R" "R" "R" [103] "R" "R" "R" "R" "R" "R" [109] "R" "R" "R" "R" "R" "R" [115] "R" "R" "R" "R" "R" "R" [121] "R" "R" "R" "data" "data" "data" [127] "data" "data" "data" "data" "data" "data" [133] "data" "data" "data" "data" "data" "data" [139] "data" "data" "data" "data" "inst" "inst" [145] "doc" "doc" "doc" "man" "man" "man" [151] "man" "man" "man" "man" "man" "man" [157] "man" "man" "man" "man" "man" "man" [163] "man" "man" "man" "man" "man" "man" [169] "man" "man" "man" "man" "man" "man" [175] "man" "man" "man" "man" "man" "man" [181] "man" "man" "man" "man" "man" "man" [187] "man" "man" "man" "man" "man" "man" [193] "man" "man" "man" "man" "man" "man" [199] "man" "man" "man" "man" "man" "man" [205] "man" "man" "man" "man" "man" "man" [211] "man" "man" "man" "man" "man" "man" [217] "man" "man" "man" "man" "man" "man" [223] "man" "man" "man" "man" "man" "man" [229] "man" "noweb" "noweb" "noweb" "noweb" "noweb" [235] "noweb" "noweb" "noweb" "noweb" "figures" "figures" [241] "noweb" "noweb" "noweb" "noweb" "noweb" "rates" [247] "rates" "rates" "rates" "rates" "rates" "rates" [253] "rates" "rates" "rates" "rates" "rates" "rates" [259] "rates" "rates" "rates" "noweb" "noweb" "noweb" [265] "noweb" "noweb" "noweb" "noweb" "noweb" "noweb" [271] "src" "src" "src" "src" "src" "src" [277] "src" "src" "src" "src" "src" "src" [283] "src" "src" "src" "src" "src" "src" [289] "src" "src" "src" "src" "src" "src" [295] "src" "src" "src" "src" "src" "src" [301] "src" "src" "src" "src" "src" "src" [307] "src" "src" "src" "src" "src" "src" [313] "src" "src" "src" "src" "src" "src" [319] "tests" "tests" "tests" "tests" "tests" "tests" [325] "tests" "tests" "tests" "tests" "tests" "tests" [331] "tests" "tests" "tests" "tests" "tests" "tests" [337] "tests" "tests" "tests" "tests" "tests" "tests" [343] "tests" "tests" "tests" "tests" "tests" "tests" [349] "tests" "tests" "tests" "tests" "tests" "tests" [355] "tests" "tests" "tests" "tests" "tests" "tests" [361] "tests" "tests" "tests" "tests" "tests" "tests" [367] "tests" "tests" "tests" "tests" "tests" "tests" [373] "tests" "tests" "tests" "tests" "tests" "tests" [379] "tests" "tests" "tests" "tests" "tests" "tests" [385] "tests" "tests" "tests" "tests" "tests" "tests" [391] "tests" "tests" "tests" "tests" "tests" "tests" [397] "tests" "tests" "tests" "tests" "tests" "tests" [403] "tests" "tests" "tests" "tests" "tests" "tests" [409] "tests" "tests" "tests" "tests" "tests" "tests" [415] "tests" "tests" "tests" "tests" "tests" "tests" [421] "tests" "tests" "tests" "tests" "tests" "tests" [427] "tests" "tests" "tests" "tests" "tests" "tests" [433] "tests" "tests" "tests" "tests" "tests" "tests" [439] "tests" "tests" "tests" "tests" "tests" "tests" [445] "tests" "tests" "tests" "tests" "tests" "tests" [451] "tests" "tests" "tests" "tests" "tests" "tests" [457] "tests" "tests" "tests" "tests" "tests" "tests" [463] "tests" "tests" "tests" "tests" "tests" "tests" [469] "tests" "tests" "tests" "tests" "tests" "tests" [475] "tests" "tests" "tests" "tests" "tests" "vignettes" [481] "vignettes" "vignettes" ##com.oracle.truffle.r.test.builtins.TestBuiltin_basename.testbasename9# #argv <- structure(list(path = 'myTst'), .Names = 'path');do.call('basename', argv) [1] "myTst" ##com.oracle.truffle.r.test.builtins.TestBuiltin_bcVersion.testbcVersion1# #.Internal(bcVersion()) [1] 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselI.testbesselI1# #argv <- list(FALSE, FALSE, 1); .Internal(besselI(argv[[1]], argv[[2]], argv[[3]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselI.testbesselI1# #besselI(1,c(NA,1)) [1] NA 0.5651591 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselI.testbesselI1# #besselI(c(1,2),1) [1] 0.5651591 1.5906369 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselI.testbesselI1# #besselI(c(1,2,3),c(1,2)) [1] 0.5651591 0.6889484 3.9533702 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselI.testbesselI1# #besselI(c(1,2,3),c(1,2),c(3,4,5,6,7,8)) [1] 0.20791042 0.09323903 0.19682671 0.04993878 0.21526929 0.11178255 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselI.testbesselI1# #besselI(c(1,2,3),c(1,2),c(3,4,NA,6,7,8)) [1] 0.20791042 0.09323903 NA 0.04993878 0.21526929 0.11178255 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselI.testbesselI1# #besselI(c(1,2,3),c(NA,2)) [1] NA 0.6889484 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselI.testbesselI1# #besselI(c(1,NA),1) [1] 0.5651591 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselI.testbesselI2# #argv <- list(logical(0), logical(0), 1); .Internal(besselI(argv[[1]], argv[[2]], argv[[3]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselJ.testbesselJ1# #argv <- list(logical(0), logical(0)); .Internal(besselJ(argv[[1]], argv[[2]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselJ.testbesselJ2# #argv <- list(FALSE, FALSE); .Internal(besselJ(argv[[1]], argv[[2]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselJ.testbesselJ3# #argv <- list(c(9.5367431640625e-07, 1.9073486328125e-06, 3.814697265625e-06, 7.62939453125e-06, 1.52587890625e-05, 3.0517578125e-05, 6.103515625e-05, 0.0001220703125, 0.000244140625, 0.00048828125, 0.0009765625, 0.001953125, 0.00390625, 0.0078125, 0.015625, 0.03125, 0.0625, 0.125, 0.25, 0.5, 1, 2, 4, 8, 16, 32, 64, 128, 256, 512, 1024), 2.5); .Internal(besselJ(argv[[1]], argv[[2]])) [1] 4.724426e-17 2.672539e-16 1.511816e-15 8.552124e-15 4.837812e-14 [6] 2.736680e-13 1.548100e-12 8.757375e-12 4.953919e-11 2.802360e-10 [11] 1.585254e-09 8.967549e-09 5.072808e-08 2.869604e-07 1.623272e-06 [16] 9.182133e-06 5.193112e-05 2.935209e-04 1.654852e-03 9.236408e-03 [21] 4.949681e-02 2.239245e-01 4.408850e-01 -2.506185e-01 9.257268e-02 [26] -8.858053e-02 -9.352409e-02 -4.969565e-02 4.984926e-02 -2.597979e-03 [31] 3.880718e-03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselJ.testbesselJ3# #besselJ(1,c(NA,1)) [1] NA 0.4400506 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselJ.testbesselJ3# #besselJ(c(1,2),1) [1] 0.4400506 0.5767248 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselJ.testbesselJ3# #besselJ(c(1,2,3),c(1,2)) [1] 0.4400506 0.3528340 0.3390590 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselJ.testbesselJ3# #besselJ(c(1,2,3),c(1,2),c(3,4,5,6,7,8)) Error in besselJ(c(1, 2, 3), c(1, 2), c(3, 4, 5, 6, 7, 8)) : unused argument (c(3, 4, 5, 6, 7, 8)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselJ.testbesselJ3# #besselJ(c(1,2,3),c(1,2),c(3,4,NA,6,7,8)) Error in besselJ(c(1, 2, 3), c(1, 2), c(3, 4, NA, 6, 7, 8)) : unused argument (c(3, 4, NA, 6, 7, 8)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselJ.testbesselJ3# #besselJ(c(1,2,3),c(NA,2)) [1] NA 0.352834 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselJ.testbesselJ3# #besselJ(c(1,NA),1) [1] 0.4400506 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK1# #argv <- list(FALSE, FALSE, 1); .Internal(besselK(argv[[1]], argv[[2]], argv[[3]])) [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK2# #argv <- list(logical(0), logical(0), 1); .Internal(besselK(argv[[1]], argv[[2]], argv[[3]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK3# #argv <- list(c(9.5367431640625e-07, 1.9073486328125e-06, 3.814697265625e-06, 7.62939453125e-06, 1.52587890625e-05, 3.0517578125e-05, 6.103515625e-05, 0.0001220703125, 0.000244140625, 0.00048828125, 0.0009765625, 0.001953125, 0.00390625, 0.0078125, 0.015625, 0.03125, 0.0625, 0.125, 0.25, 0.5, 1, 2, 4, 8, 16, 32, 64, 128, 256, 512, 1024), 3, 1); .Internal(besselK(argv[[1]], argv[[2]], argv[[3]])) [1] 9.223372e+18 1.152922e+18 1.441152e+17 1.801440e+16 2.251800e+15 [6] 2.814750e+14 3.518437e+13 4.398047e+12 5.497558e+11 6.871947e+10 [11] 8.589934e+09 1.073741e+09 1.342175e+08 1.677709e+07 2.097088e+06 [16] 2.621120e+05 3.275201e+04 4.088015e+03 5.080305e+02 6.205791e+01 [21] 7.101263e+00 6.473854e-01 2.988492e-02 2.480257e-04 4.594734e-08 [26] 3.209956e-15 2.688919e-29 2.948133e-57 5.271814e-113 2.445443e-224 [31] 0.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK4# #argv <- list(c(9.5367431640625e-07, 1.9073486328125e-06, 3.814697265625e-06, 7.62939453125e-06, 1.52587890625e-05, 3.0517578125e-05, 6.103515625e-05, 0.0001220703125, 0.000244140625, 0.00048828125, 0.0009765625, 0.001953125, 0.00390625, 0.0078125, 0.015625, 0.03125, 0.0625, 0.125, 0.25, 0.5, 1, 2, 4, 8, 16, 32, 64, 128, 256, 512, 1024), 3.5, 1); .Internal(besselK(argv[[1]], argv[[2]], argv[[3]])) [1] 2.219478e+22 1.961760e+21 1.733967e+20 1.532625e+19 1.354662e+18 [6] 1.197363e+17 1.058330e+16 9.354401e+14 8.268201e+13 7.308126e+12 [11] 6.459531e+11 5.709471e+10 5.046502e+09 4.460499e+08 3.942489e+07 [16] 3.484446e+06 3.078942e+05 2.718241e+04 2.391401e+03 2.074842e+02 [21] 1.705953e+01 1.154401e+00 4.214440e-02 2.993283e-04 5.067833e-08 [26] 3.374310e-15 2.757500e-29 2.985649e-57 5.305318e-113 2.453209e-224 [31] 0.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK4# #besselK(1,c(NA,1)) [1] NA 0.6019072 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK4# #besselK(c(1,2),1) [1] 0.6019072 0.1398659 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK4# #besselK(c(1,2,3),c(1,2)) [1] 0.60190723 0.25375975 0.04015643 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK4# #besselK(c(1,2,3),c(1,2),c(3,4,5,6,7,8)) [1] 1.6361535 1.8750451 0.8065635 4.4167701 1.0334768 1.2354706 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK4# #besselK(c(1,2,3),c(1,2),c(3,4,NA,6,7,8)) [1] 1.636153 1.875045 NA 4.416770 1.033477 1.235471 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK4# #besselK(c(1,2,3),c(NA,2)) [1] NA 0.2537598 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselK.testbesselK4# #besselK(c(1,NA),1) [1] 0.6019072 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY1# #argv <- list(c(9.5367431640625e-07, 1.9073486328125e-06, 3.814697265625e-06, 7.62939453125e-06, 1.52587890625e-05, 3.0517578125e-05, 6.103515625e-05, 0.0001220703125, 0.000244140625, 0.00048828125, 0.0009765625, 0.001953125, 0.00390625, 0.0078125, 0.015625, 0.03125, 0.0625, 0.125, 0.25, 0.5, 1, 2, 4, 8, 16, 32, 64, 128, 256, 512, 1024), 20.5); .Internal(besselY(argv[[1]], argv[[2]])) [1] -6.747747e+146 -4.550341e+140 -3.068520e+134 -2.069255e+128 -1.395401e+122 [6] -9.409884e+115 -6.345551e+109 -4.279120e+103 -2.885623e+97 -1.945918e+91 [11] -1.312229e+85 -8.849013e+78 -5.967329e+72 -4.024068e+66 -2.713635e+60 [16] -1.829956e+54 -1.234076e+48 -8.323238e+41 -5.616146e+35 -3.796362e+29 [21] -2.584821e+23 -1.811541e+17 -1.426325e+11 -1.812625e+05 -2.144517e+00 [26] -7.076470e-02 2.381079e-02 4.744158e-02 -3.516090e-02 3.336562e-02 [31] -2.491015e-02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY2# #argv <- list(2, c(3, 8.94, 14.88, 20.82, 26.76, 32.7, 38.64, 44.58, 50.52, 56.46, 62.4, 68.34, 74.28, 80.22, 86.16, 92.1, 98.04, 103.98, 109.92, 115.86, 121.8, 127.74, 133.68, 139.62, 145.56, 151.5, 157.44, 163.38, 169.32, 175.26, 181.2, 187.14, 193.08, 199.02, 204.96, 210.9, 216.84, 222.78, 228.72, 234.66, 240.6, 246.54, 252.48, 258.42, 264.36, 270.3, 276.24, 282.18, 288.12, 294.06, 300)); .Internal(besselY(argv[[1]], argv[[2]])) [1] -1.127784e+00 -1.282008e+04 -2.165098e+10 -4.733004e+17 -6.084569e+25 [6] -3.046226e+34 -4.601250e+43 -1.761838e+53 -1.506980e+63 -2.615568e+73 [11] -8.541706e+83 -4.938386e+94 -4.807161e+105 -7.554121e+116 -1.848984e+128 [16] -6.835352e+139 -3.715626e+151 -2.900895e+163 -3.185825e+175 -4.831103e+187 [21] -9.949028e+199 -2.741002e+212 -9.966114e+224 -4.723366e+237 -2.885144e+250 [26] -2.247803e+263 -2.212400e+276 -2.726712e+289 -4.173696e+302 -Inf [31] -Inf -Inf -Inf -Inf -Inf [36] -Inf -Inf -Inf -Inf -Inf [41] -Inf -Inf -Inf -Inf -Inf [46] -Inf -Inf -Inf -Inf -Inf [51] -Inf There were 22 warnings (use warnings() to see them) ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY3# #argv <- list(c(0, 0.1, 0.2, 0.3, 0.4, 0.5, 0.6, 0.7, 0.8, 0.9, 1, 1.1, 1.2, 1.3, 1.4, 1.5, 1.6, 1.7, 1.8, 1.9, 2, 2.1, 2.2, 2.3, 2.4, 2.5, 2.6, 2.7, 2.8, 2.9, 3, 3.1, 3.2, 3.3, 3.4, 3.5, 3.6, 3.7, 3.8, 3.9, 4, 4.1, 4.2, 4.3, 4.4, 4.5, 4.6, 4.7, 4.8, 4.9, 5, 5.1, 5.2, 5.3, 5.4, 5.5, 5.6, 5.7, 5.8, 5.9, 6, 6.1, 6.2, 6.3, 6.4, 6.5, 6.6, 6.7, 6.8, 6.9, 7, 7.1, 7.2, 7.3, 7.4, 7.5, 7.6, 7.7, 7.8, 7.9, 8, 8.1, 8.2, 8.3, 8.4, 8.5, 8.6, 8.7, 8.8, 8.9, 9, 9.1, 9.2, 9.3, 9.4, 9.5, 9.6, 9.7, 9.8, 9.9, 10), -0.2); .Internal(besselY(argv[[1]], argv[[2]])) [1] -Inf -1.129937637 -0.690945975 -0.435238869 -0.251890636 [6] -0.108032918 0.010318976 0.110293104 0.195945764 0.269765825 [11] 0.333369654 0.387858170 0.434015467 0.472426328 0.503549207 [16] 0.527763319 0.545399938 0.556763644 0.562146923 0.561840250 [21] 0.556138962 0.545347836 0.529783929 0.509778137 0.485675721 [26] 0.457836051 0.426631718 0.392447128 0.355676704 0.316722756 [31] 0.275993101 0.233898491 0.190849900 0.147255722 0.103518918 [36] 0.060034160 0.017185000 -0.024658892 -0.065144400 -0.103937501 [41] -0.140725660 -0.175220043 -0.207157531 -0.236302515 -0.262448461 [46] -0.285419214 -0.305070050 -0.321288448 -0.333994594 -0.343141591 [51] -0.348715396 -0.350734473 -0.349249167 -0.344340811 -0.336120572 [56] -0.324728046 -0.310329620 -0.293116614 -0.273303223 -0.251124276 [61] -0.226832836 -0.200697664 -0.173000566 -0.144033653 -0.114096536 [66] -0.083493484 -0.052530570 -0.021512829 0.009258542 0.039488923 [71] 0.068892919 0.097196894 0.124141377 0.149483304 0.172998093 [76] 0.194481527 0.213751419 0.230649073 0.245040498 0.256817382 [81] 0.265897830 0.272226827 0.275776465 0.276545903 0.274561078 [86] 0.269874164 0.262562797 0.252729061 0.240498256 0.226017461 [91] 0.209453900 0.190993139 0.170837125 0.149202083 0.126316301 [96] 0.102417825 0.077752074 0.052569412 0.027122694 0.001664807 [101] -0.023553761 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY4# #argv <- list(logical(0), logical(0)); .Internal(besselY(argv[[1]], argv[[2]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY4# #besselY(1,c(NA,1)) [1] NA -0.7812128 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY4# #besselY(c(1,2),1) [1] -0.7812128 -0.1070324 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY4# #besselY(c(1,2,3),c(1,2)) [1] -0.7812128 -0.6174081 0.3246744 ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY4# #besselY(c(1,2,3),c(1,2),c(3,4,5,6,7,8)) Error in besselY(c(1, 2, 3), c(1, 2), c(3, 4, 5, 6, 7, 8)) : unused argument (c(3, 4, 5, 6, 7, 8)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY4# #besselY(c(1,2,3),c(1,2),c(3,4,NA,6,7,8)) Error in besselY(c(1, 2, 3), c(1, 2), c(3, 4, NA, 6, 7, 8)) : unused argument (c(3, 4, NA, 6, 7, 8)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY4# #besselY(c(1,2,3),c(NA,2)) [1] NA -0.6174081 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_besselY.testbesselY4# #besselY(c(1,NA),1) [1] -0.7812128 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbeta1# #argv <- list(FALSE, FALSE); .Internal(beta(argv[[1]], argv[[2]])) [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbeta2# #argv <- list(logical(0), logical(0)); .Internal(beta(argv[[1]], argv[[2]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbeta4# #argv <- structure(list(a = 0.01, b = 171), .Names = c('a', 'b'));do.call('beta', argv) [1] 94.45204 ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbeta5# #argv <- structure(list(a = 1e-200, b = 1e-200), .Names = c('a', 'b'));do.call('beta', argv) [1] 2e+200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #.Internal(beta(47, structure(array(21:24, dim=c(2,2)), dimnames=list(a=c('a1','a2'),b=c('b1','b2'))))) b a b1 b2 a1 3.670670e-19 3.614342e-20 a2 1.133589e-19 1.187570e-20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #.Internal(beta(structure(47, myattr='hello'), 2)) [1] 0.0004432624 attr(,"myattr") [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #.Internal(beta(structure(array(21:24, dim=c(2,2)), dimnames=list(a=c('a1','a2'),b=c('b1','b2'))), 2)) b a b1 b2 a1 0.002164502 0.001811594 a2 0.001976285 0.001666667 ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(0:2, 2.2)) } [1] Inf 0.4545455 0.1420455 ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(1, NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(1, NULL)) } Error: non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(2, 2.2)) } [1] 0.1420455 ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(FALSE, FALSE)) } [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(NA, 1)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(NULL, 1)) } Error: non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(c(2.2, 3.3), 2)) } [1] 0.14204545 0.07047216 ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(c(2.2, 3.3), c(2,3,4))) } [1] 0.14204545 0.02659327 0.03902348 ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(c(2.2, 3.3, 4.4), c(2,3))) } [1] 0.14204545 0.02659327 0.04208754 ##com.oracle.truffle.r.test.builtins.TestBuiltin_beta.testbetabuiltin# #{ .Internal(beta(logical(0), logical(0))) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testBincode#Output.MayIgnoreErrorContext# #{ .Internal(bincode(, 1, T, T)) } Error in .Internal(bincode(, 1, T, T)) : argument 1 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testBincode#Output.MayIgnoreErrorContext# #{ .Internal(bincode(1, ,T, T)) } Error in .Internal(bincode(1, , T, T)) : argument 2 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testBincode# #{ .Internal(bincode(2, NULL, T, T)) } Error: long vector 'breaks' is not supported ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testBincode# #{ .Internal(bincode(NULL, 2, T, T)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testBincode# #{ x <- c(0, 0.01, 0.5, 0.99, 1); b <- c(0, 0, 1, 1); .bincode(x, b, FALSE) } [1] 2 2 2 2 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testBincode# #{ x <- c(0, 0.01, 0.5, 0.99, 1); b <- c(0, 0, 1, 1); .bincode(x, b, FALSE, TRUE) } [1] 2 2 2 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testBincode# #{ x <- c(0, 0.01, 0.5, 0.99, 1); b <- c(0, 0, 1, 1); .bincode(x, b, TRUE) } [1] NA 2 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testBincode# #{ x <- c(0, 0.01, 0.5, 0.99, 1); b <- c(0, 0, 1, 1); .bincode(x, b, TRUE, TRUE) } [1] 1 2 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testbincode1# #argv <- list(c(-1, -1, -1, -1, -1), c(-1.001, -1, -0.999), TRUE, FALSE); .Internal(bincode(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testbincode2# #argv <- list(c(8.70599232813489e-06, 7.24187268717448e-10, 7.84878459581784e-14), c(0, 0.001, 0.01, 0.05, 0.1, 1), TRUE, TRUE); .Internal(bincode(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testbincode3# #argv <- list(c(0.00316901674455053, 0.000313731190323184, 2.12051012154177e-05, 0.000158772845963692), c(0, 0.001, 0.01, 0.05, 0.1, 1), TRUE, TRUE); .Internal(bincode(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 2 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testbincode4# #argv <- list(c(NA, 0.0654707112145736, 0.999999999999999), c(0, 0.001, 0.01, 0.05, 0.1, 1), TRUE, TRUE); .Internal(bincode(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testbincode5# #argv <- list(structure(c(3.00863041155973, 0.411191886071604, -0.690490615408105, -4.08011169113016, -1.74096111020938, 0.149871643848704, -0.617403399223794, 1.77225991336381, 0.70873696276922, 0.831384833755618, 0.760421822835713, -1.43576852408133, -1.06684579764157, 0.112230570314199, 1.7784773190779, 0.601241755061942, 3.2084694607557, 1.30812378137844, 0.548795030131126, -4.19457515085108, -2.57754314942853, -2.82255910587143, -1.79648698551886, 8.02186933983834, -1.32562596449111, 1.07620193452922, 0.454145574974766, -1.70834615344098, -1.67960999025708, -0.580565722061994, 1.46027792034151, 0.274978829340024), class = 'table', .Dim = c(4L, 4L, 2L), .Dimnames = structure(list(Hair = c('Black', 'Brown', 'Red', 'Blond'), Eye = c('Brown', 'Blue', 'Hazel', 'Green'), Sex = c('Male', 'Female')), .Names = c('Hair', 'Eye', 'Sex'))), c(-Inf, -4, -2, 0, 2, 4, Inf), TRUE, FALSE); .Internal(bincode(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 5 4 3 1 3 4 3 4 4 4 4 3 3 4 4 4 5 4 4 1 2 2 3 6 3 4 4 3 3 3 4 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bincode.testbincode6# #argv <- list(c(4L, 8L, 7L, 4L, 8L, 7L, NA, 7L, 6L, 7L, 7L, 8L, 8L, 6L, 7L, 8L, 5L, 4L, 8L, 7L, 5L, 6L, 5L, 6L, 5L, 6L, 7L, 6L, 5L, 7L, 4L, 6L, 6L, 5L, 7L, 5L, 5L, 6L, 6L, 6L, 5L, 7L, 5L, 7L, 5L, 3L, 7L, 6L, 5L, 5L, 6L, 5L, 5L, 6L, 10L, 10L, 6L, 3L, 5L, 8L, 7L, 5L, 6L, 5L, 5L, 5L, 6L, 5L, 6L, 5L, 5L, 6L, 7L, 7L, 6L, 7L, 7L, 8L, 9L, 7L, 8L, 6L, 4L, 7L, 7L, 6L, NA, 8L, 5L, 7L, 6L, 5L, NA, 7L, 6L, 7L, 7L, 9L, 5L, 8L, 6L, 8L, 9L, 6L, 6L, 7L, 8L, 8L, 8L, 7L, 8L, 7L, 6L, 6L, 9L, 7L, 6L, 8L, 5L, 7L, 8L, 8L, 7L, 7L, 7L, 8L, 5L, 6L, 6L, 5L, 7L, 5L, 7L, 7L, 4L, 5L, 8L, 5L, 5L, 6L, 7L, 5L, 9L, 5L, 6L, 7L), c(2, 5.5, 10), TRUE, FALSE); .Internal(bincode(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 2 2 1 2 2 NA 2 2 2 2 2 2 2 2 2 1 1 2 2 1 2 1 2 1 [26] 2 2 2 1 2 1 2 2 1 2 1 1 2 2 2 1 2 1 2 1 1 2 2 1 1 [51] 2 1 1 2 2 2 2 1 1 2 2 1 2 1 1 1 2 1 2 1 1 2 2 2 2 [76] 2 2 2 2 2 2 2 1 2 2 2 NA 2 1 2 2 1 NA 2 2 2 2 2 1 2 [101] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 1 2 2 2 2 2 2 [126] 2 1 2 2 1 2 1 2 2 1 1 2 1 1 2 2 1 2 1 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bindtextdomain.testbindtextdomain1#Ignored.MissingBuiltin# #argv <- list('splines', '/home/roman/r-instrumented/library/translations'); .Internal(bindtextdomain(argv[[1]], argv[[2]])) [1] "/home/roman/r-instrumented/library/translations" ##com.oracle.truffle.r.test.builtins.TestBuiltin_bindtextdomain.testbindtextdomain2#Ignored.MissingBuiltin# #argv <- list('utils', '/home/lzhao/hg/r-instrumented/library/translations'); .Internal(bindtextdomain(argv[[1]], argv[[2]])) [1] "/home/lzhao/hg/r-instrumented/library/translations" ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseAnd.testBitwiseFunctions#Output.IgnoreErrorContext#Output.IgnoreErrorMessage# #{ bitwAnd(NULL, NULL) } Error in bitwAnd(NULL, NULL) : unimplemented type 'NULL' in 'bitwAnd' ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseAnd.testBitwiseFunctions#Output.IgnoreErrorContext#Output.IgnoreErrorMessage# #{ bitwAnd(c(), c(1,2,3)) } Error in bitwAnd(c(), c(1, 2, 3)) : 'a' and 'b' must have the same type ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseAnd.testBitwiseFunctions#Output.IgnoreErrorMessage# #{ bitwAnd(c(1,2,3,4), c(TRUE)) } Error in bitwAnd(c(1, 2, 3, 4), c(TRUE)) : 'a' and 'b' must have the same type ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseAnd.testBitwiseFunctions# #{ bitwAnd(c(10,11,12,13,14,15), c(1,1,1,1,1,1)) } [1] 0 1 0 1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseAnd.testBitwiseFunctions# #{ bitwAnd(c(10.5,11.6,17.8), c(5L,7L,8L)) } [1] 0 3 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseAnd.testBitwiseFunctions# #{ bitwAnd(c(10L,20L,30L,40L), c(3,5,7)) } [1] 2 4 6 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseAnd.testBitwiseFunctions# #{ bitwAnd(c(25,57,66), c(10,20,30,40,50,60)) } [1] 8 16 2 8 48 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseAnd.testbitwiseAnd1# #argv <- list(structure(c(420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 493L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 420L, 493L, 493L, 493L, 493L, 493L, 493L, 493L, 493L, 493L, 493L, 493L), class = 'octmode'), structure(256L, class = 'octmode')); .Internal(bitwiseAnd(argv[[1]], argv[[2]])) [1] 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 [19] 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 [37] 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 [55] 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 [73] 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 [91] 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 [109] 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 [127] 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 256 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseAnd.testbitwiseAnd2# #argv <- list(structure(integer(0), class = 'hexmode'), structure(integer(0), class = 'hexmode')); .Internal(bitwiseAnd(argv[[1]], argv[[2]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseNot.testBitwiseFunctions# #{ bitwNot(TRUE) } Error in bitwNot(TRUE) : unimplemented type 'logical' in 'bitwNot' ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseNot.testBitwiseFunctions# #{ bitwNot(as.integer(NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseNot.testBitwiseFunctions# #{ bitwNot(c(0,100,200,50,70,20)) } [1] -1 -101 -201 -51 -71 -21 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseNot.testBitwiseFunctions# #{ bitwNot(c(17,24,34,48,51,66,72,99)) } [1] -18 -25 -35 -49 -52 -67 -73 -100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseNot.testbitwiseNot1# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L))); .Internal(bitwiseNot(argv[[1]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseOr.testBitwiseFunctions#Output.IgnoreErrorMessage# #{ bitwOr(c(1,2,3,4), c(3+3i)) } Error in bitwOr(c(1, 2, 3, 4), c(3 + (0+3i))) : 'a' and 'b' must have the same type ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseOr.testBitwiseFunctions# #{ bitwOr(c(10,11,12,13,14,15), c(1,1,1,1,1,1)) } [1] 11 11 13 13 15 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseOr.testBitwiseFunctions# #{ bitwOr(c(25,57,66), c(10,20,30,40,50,60)) } [1] 27 61 94 57 59 126 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseOr.testbitwiseOr1# #argv <- list(15L, 7L); .Internal(bitwiseOr(argv[[1]], argv[[2]])) [1] 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.generated# #argv <- list(-1, 1:31); .Internal(bitwiseShiftL(argv[[1]], argv[[2]])) [1] -2 -4 -8 -16 -32 -64 [7] -128 -256 -512 -1024 -2048 -4096 [13] -8192 -16384 -32768 -65536 -131072 -262144 [19] -524288 -1048576 -2097152 -4194304 -8388608 -16777216 [25] -33554432 -67108864 -134217728 -268435456 -536870912 -1073741824 [31] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions#Output.MayIgnoreErrorContext# #{ .Internal(bitwiseShiftL(, 1))} Error in .Internal(bitwiseShiftL(, 1)) : argument 1 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions#Output.MayIgnoreErrorContext# #{ .Internal(bitwiseShiftL(200, ))} Error in .Internal(bitwiseShiftL(200, )) : argument 2 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(1, NULL) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(1L, NULL) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(NA, NA) } Error in bitwShiftL(NA, NA) : 'a' and 'b' must have the same type ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(NULL, 1 } Error: unexpected '}' in "{ bitwShiftL(NULL, 1 }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(NULL, 1L) } Error in bitwShiftL(NULL, 1L) : 'a' and 'b' must have the same type ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(NULL, NULL) } Error in bitwShiftL(NULL, NULL) : 'a' and 'b' must have the same type ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(TRUE, c(TRUE, FALSE)) } Error in bitwShiftL(TRUE, c(TRUE, FALSE)) : 'a' and 'b' must have the same type ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(c(1,2,3,4), c("a")) } [1] NA NA NA NA Warning message: In bitwShiftL(c(1, 2, 3, 4), c("a")) : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(c(10,11,12,13,14,15), c(1,1,1,1,1,1)) } [1] 20 22 24 26 28 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(c(100,200,300), 1) } [1] 200 400 600 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(c(25,57,66), c(10,20,30,40,50,60)) } [1] 25600 59768832 NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(c(3+3i), c(3,2,4)) } Error in bitwShiftL(c(3 + (0+3i)), c(3, 2, 4)) : 'a' and 'b' must have the same type ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(c(3,2,4), c(3+3i)) } [1] 24 16 32 Warning message: In bitwShiftL(c(3, 2, 4), c(3 + (0+3i))) : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftL.testBitwiseFunctions# #{ bitwShiftL(c(8,4,2), NULL) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftR.testBitwiseFunctions#Output.MayIgnoreErrorContext# #{ .Internal(bitwiseShiftR(, 1))} Error in .Internal(bitwiseShiftR(, 1)) : argument 1 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftR.testBitwiseFunctions#Output.MayIgnoreErrorContext# #{ .Internal(bitwiseShiftR(200, ))} Error in .Internal(bitwiseShiftR(200, )) : argument 2 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftR.testBitwiseFunctions#Output.IgnoreWarningMessage# #{ bitwShiftR(c(1,2,3,4), c("Hello")) } [1] NA NA NA NA Warning message: In bitwShiftR(c(1, 2, 3, 4), c("Hello")) : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftR.testBitwiseFunctions# #{ bitwShiftR(c(10,11,12,13,14,15), c(1,1,1,1,1,1)) } [1] 5 5 6 6 7 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftR.testBitwiseFunctions# #{ bitwShiftR(c(100,200,300), 1) } [1] 50 100 150 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftR.testBitwiseFunctions# #{ bitwShiftR(c(25,57,66), c(10,20,30,40,50,60)) } [1] 0 0 0 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftR.testBitwiseFunctions# #{ bitwShiftR(c(3,2,4), c(3+3i)) } [1] 0 0 0 Warning message: In bitwShiftR(c(3, 2, 4), c(3 + (0+3i))) : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseShiftR.testbitwiseShiftR1# #argv <- list(-1, 1:31); .Internal(bitwiseShiftR(argv[[1]], argv[[2]])) [1] 2147483647 1073741823 536870911 268435455 134217727 67108863 [7] 33554431 16777215 8388607 4194303 2097151 1048575 [13] 524287 262143 131071 65535 32767 16383 [19] 8191 4095 2047 1023 511 255 [25] 127 63 31 15 7 3 [31] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseXor.testBitwiseFunctions# #{ bitwXor(20,30) } [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseXor.testBitwiseFunctions#Output.IgnoreErrorMessage# #{ bitwXor(c("r"), c(16,17)) } Error in bitwXor(c("r"), c(16, 17)) : 'a' and 'b' must have the same type ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseXor.testBitwiseFunctions# #{ bitwXor(c(10,11,12,13,14,15), c(1,1,1,1,1,1)) } [1] 11 10 13 12 15 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseXor.testBitwiseFunctions# #{ bitwXor(c(25,57,66), c(10,20,30,40,50,60)) } [1] 19 45 92 49 11 126 ##com.oracle.truffle.r.test.builtins.TestBuiltin_bitwiseXor.testbitwiseXor1# #argv <- list(-1L, 1L); .Internal(bitwiseXor(argv[[1]], argv[[2]])) [1] -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody1# #argv <- list(function (x, y) { c(x, y)}); .Internal(body(argv[[1]])) { c(x, y) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody2# #argv <- list(function (object) TRUE); .Internal(body(argv[[1]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody3# #argv <- list(function (from, strict = TRUE) from); .Internal(body(argv[[1]])) from ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody4# #argv <- list(.Primitive('/')); .Internal(body(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody5#Output.IgnoreWarningMessage# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame')); .Internal(body(argv[[1]])) NULL Warning message: In body(argv[[1]]) : argument is not a function ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody6#Output.IgnoreWarningMessage# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L))); .Internal(body(argv[[1]])) NULL Warning message: In body(argv[[1]]) : argument is not a function ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody6# #{ body <- 1:10; f <- function() 42; body(f) <- body; f; f() } [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody6# #{ body <- c('a','b','c'); f <- function() 42; body(f) <- body; f; f() } [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody6# #{ body <- c(1,3,42); f <- function() 42; body(f) <- body; f; f() } [1] 1 3 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody6# #{ body <- expression(1+3); f <- function() 42; body(f) <- body; f; f() } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody6# #{ body <- print(1); f <- function() 42; body(f) <- body; f; f() } [1] 1 [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_body.testbody6# #{ body <- structure('OK', class='testOK'); f <- function() 42; body(f) <- body; f; f() } [1] "OK" attr(,"class") [1] "testOK" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #c(1,2,) Error in c(1, 2, ) : argument 3 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #c(as.expression(1)) expression(1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #c(as.expression(1), as.expression(1)) expression(1, 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #c(as.symbol(1)) [[1]] `1` ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #c(as.symbol(1), as.symbol(1)) [[1]] `1` [[2]] `1` ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #c(environment()) [[1]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #c(environment(), environment()) [[1]] [[2]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #c(x~a) [[1]] x ~ a ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #c(x~a, x~b) [[1]] x ~ a [[2]] x ~ b ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #l<-c(1, methods:::.newExternalptr()); typeof(l); l[[1]]; typeof(l[[2]]) [1] "list" [1] 1 [1] "externalptr" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #typeof(c(substitute(graphics::par), list(as.symbol('a')))) [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c( 100, 1:3, 200 ) } [1] 100 1 2 3 200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c( 1:3 ) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c( 1:3, 5, 7:9 ) } [1] 1 2 3 5 7 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c( 1:3, 7:9 ) } [1] 1 2 3 7 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c( 1L:3L ) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("1","b") } [1] "1" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("1.00","2.00") } [1] "1.00" "2.00" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("1.00","b") } [1] "1.00" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("1.2","3.4") } [1] "1.2" "3.4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("a") } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("a", "b") } [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("a", NULL) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("a", c("b","c")) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("a","b","c") } [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("d") } [1] "d" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("d", 2L) } [1] "d" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("d", NULL) } [1] "d" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("d", c(2L,"f")) } [1] "d" "2" "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("g") } [1] "g" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("g", 2) } [1] "g" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("g", NULL) } [1] "g" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("g", c(2,2)) } [1] "g" "2" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("hello", "hi") } [1] "hello" "hi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("j") } [1] "j" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("j", NULL) } [1] "j" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("j", TRUE) } [1] "j" "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c("j", c(TRUE,TRUE)) } [1] "j" "TRUE" "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c() } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1+1i, as.raw(10)) } [1] 1+1i 10+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1+1i,2-3i,4+5i) } [1] 1+1i 2-3i 4+5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1, 2) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1, NULL) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1, b=2) } b 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1, c(2,3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1,z=list(1,b=22,3)) } [[1]] [1] 1 $z1 [1] 1 $z.b [1] 22 $z3 [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1.0,1L) } [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1L, 2L) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1L, NULL) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1L, c(2L,3L)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(1L,1.0) } [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, "a") } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, "a", NULL) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, "d") } [1] "d" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, "d", NULL) } [1] "d" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, "g") } [1] "g" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, "g", NULL) } [1] "g" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, "j") } [1] "j" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, "j", NULL) } [1] "j" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, 1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, 1, NULL) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, 1L, NULL) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, TRUE, NULL) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, c("a","b")) } [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, c("d",2L)) } [1] "d" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, c("g",2)) } [1] "g" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, c("j",TRUE)) } [1] "j" "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, c(1,2)) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, c(1L,2L)) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL, c(TRUE,FALSE)) } [1] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL,1,2,3) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(NULL,NULL) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(TRUE, FALSE) } [1] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(TRUE, NULL) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(TRUE, c(FALSE,FALSE)) } [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(TRUE,1L,1.0,list(3,4)) } [[1]] [1] TRUE [[2]] [1] 1 [[3]] [1] 1 [[4]] [1] 3 [[5]] [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(TRUE,1L,1.0,list(3,list(4,5))) } [[1]] [1] TRUE [[2]] [1] 1 [[3]] [1] 1 [[4]] [1] 3 [[5]] [[5]][[1]] [1] 4 [[5]][[2]] [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a="bar", b="baz") } a b "bar" "baz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a="foo") } a "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=1, 2) } a 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=1, b=2) } a b 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=1,b=2:3,list(x=FALSE)) } $a [1] 1 $b1 [1] 2 $b2 [1] 3 $x [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=1:2, 42) } a1 a2 1 2 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=1:2, b=c(42)) } a1 a2 b 1 2 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=1:2, b=double()) } a1 a2 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=1i, b=2i) } a b 0+1i 0+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=42) } a 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=7i) } a 0+7i ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=7i, a=1:2) } a a1 a2 0+7i 1+0i 2+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=FALSE) } a FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=FALSE, b=TRUE) } a b FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=as.raw(1), b=as.raw(2)) } a b 01 02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=as.raw(7)) } a 07 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(a=c(z=1), 42) } a.z 1 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(as.raw(10), "test") } [1] "0a" "test" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(as.raw(10), as.raw(20)) } [1] 0a 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("a","b"), "c") } [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("a","b"), "c", c("a","b")) } [1] "a" "b" "c" "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("a","b"), NULL) } [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("a","b"), c("c","a")) } [1] "a" "b" "c" "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("a","b"), c("c","a"), c("b","c")) } [1] "a" "b" "c" "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("d",2L), "f") } [1] "d" "2" "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("d",2L), "f", c("d",2L)) } [1] "d" "2" "f" "d" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("d",2L), NULL) } [1] "d" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("d",2L), c("f","d")) } [1] "d" "2" "f" "d" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("d",2L), c("f","d"), c(2L,"f")) } [1] "d" "2" "f" "d" "2" "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("g",2), 2) } [1] "g" "2" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("g",2), 2, c("g",2)) } [1] "g" "2" "2" "g" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("g",2), NULL) } [1] "g" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("g",2), c(2,"g")) } [1] "g" "2" "2" "g" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("g",2), c(2,"g"), c(2,2)) } [1] "g" "2" "2" "g" "2" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("j",TRUE), NULL) } [1] "j" "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("j",TRUE), TRUE) } [1] "j" "TRUE" "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("j",TRUE), TRUE, c("j",TRUE)) } [1] "j" "TRUE" "TRUE" "j" "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("j",TRUE), c(TRUE,"j")) } [1] "j" "TRUE" "TRUE" "j" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c("j",TRUE), c(TRUE,"j"), c(TRUE,TRUE)) } [1] "j" "TRUE" "TRUE" "j" "TRUE" "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(1,2), 3) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(1,2), 3, c(1,2)) } [1] 1 2 3 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(1,2), NULL) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(1,2), c(3,1)) } [1] 1 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(1,2), c(3,1), c(2,3)) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(1L,2L), 3L) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(1L,2L), 3L, c(1L,2L)) } [1] 1 2 3 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(1L,2L), NULL) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(1L,2L), c(3L,1L)) } [1] 1 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(1L,2L), c(3L,1L), c(2L,3L)) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(TRUE,FALSE), FALSE) } [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(TRUE,FALSE), FALSE, c(TRUE,FALSE)) } [1] TRUE FALSE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(TRUE,FALSE), NULL) } [1] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(TRUE,FALSE), c(FALSE,TRUE)) } [1] TRUE FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(c(TRUE,FALSE), c(FALSE,TRUE), c(FALSE,FALSE)) } [1] TRUE FALSE FALSE TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(x=1,2) } x 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ c(x=1,y=2) } x y 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine#Output.ContainsReferences# #{ e1 <- new.env(); c(e1, 3) } [[1]] [[2]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine#Output.ContainsReferences# #{ e1 <- new.env(); e2 <- new.env(); c(e1, e2) } [[1]] [[2]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ f <- function() { }; length(c(f, 2)) == 2 } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ f <- function(){}; l <- c(f); print(is.list(l)); identical(l[[1]], f) } [1] TRUE [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ f <- function(){}; l <- c(f, f); print(is.list(l)); identical(l[[1]], f) } [1] TRUE [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ f <- function(x,y) { c(x,y) } ; f(1,1) ; f(1, TRUE) ; f(NULL, NULL) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ f <- function(x,y) { c(x,y) } ; f(1,1) ; f(1, TRUE) } [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ is.matrix(c(matrix(1:4,2))) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ setClass("foo", representation(d="numeric")); x<-new("foo", d=42); y<-c(x, 7); y[[1]] } An object of class "foo" Slot "d": [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ setClass('foo', representation(bar = 'ANY')); c(new('foo', bar=1)) } [[1]] An object of class "foo" Slot "bar": [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ setClass('foo', representation(bar = 'ANY')); c(new('foo', bar=1), new('foo', bar=1)) } [[1]] An object of class "foo" Slot "bar": [1] 1 [[2]] An object of class "foo" Slot "bar": [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ typeof(c(as.symbol("foo"), 42)) } [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x <- 1:2 ; names(x) <- c("A",NA) ; c(x,test=x) } A test.A test.NA 1 2 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-1:2; names(x)<-7:8; z<-c(x, integer()); z } 7 8 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-1:2; names(x)<-7:8; y<-3:4; names(y)<-9:10; z<-c(x, y); z } 7 8 9 10 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-1:2; names(x)<-7:8; y<-3:4; z<-c(x, y); z } 7 8 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-1:2; names(x)<-7:8; y<-double(0); z<-c(x, y); z } 7 8 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-1:2; names(x)<-7:8; z<-c(3L, x); z } 7 8 3 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-1:2; names(x)<-7:8; z<-c(x, 3); attributes(z) } $names [1] "7" "8" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-1:2; names(x)<-7:8; z<-c(x, 3); z } 7 8 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-1:2; names(x)<-7:8; z<-c(x, 3L); z } 7 8 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-c(1); c(z=x, 42) } z 1 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-c(a=42); y<-c(b=7); z<-c(x,y); w<-names(z); w[[1]]<-"c"; z } a b 42 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-c(y=1); c(x, 42) } y 1 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-c(y=1, 2); c(a=x, 42) } a.y a2 1 2 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-c(y=1, z=2); c(a=x, 42) } a.y a.z 1 2 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-c(y=1, z=2); names(x)=c("", ""); c(a=x, 42) } a1 a2 1 2 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-c(z=1); names(x)=c(""); c(a=x, 42) } a 1 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-expression(1); c(x) } expression(1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombine# #{ x<-expression(1); c(x,2) } expression(1, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testCombineBroken# #{ c(1i,0/0) } [1] 0+1i NaN+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testRecursive# #argv <- list(c(1,2),c(3,4),c(5,6), recursive=TRUE);c(argv[[1]]); [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testRecursive# #argv <- list(c(list(c(1,2),c(3,4)),c(5,6), recursive=TRUE));c(argv[[1]]); [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testRecursive# #argv <- list(list(), recursive=TRUE);c(argv[[1]]); list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc1# #argv <- list(character(0), 'myLib/myTst');c(argv[[1]],argv[[2]]); [1] "myLib/myTst" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc10# #argv <- list(NULL, structure(list(class = 'try-error', condition = structure(list(message = 'supply both x and y or a matrix-like x', call = quote(cor(rnorm(10), NULL))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), .Names = c('class', 'condition')));c(argv[[1]],argv[[2]]); $class [1] "try-error" $condition ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc11# #argv <- list(`(Intercept)` = '(Intercept)', structure(list(B = 'B', V = 'V', N = 'N', `V:N` = c('V', 'N'), Residuals = c('B', 'V', 'N', 'Within')), .Names = c('B', 'V', 'N', 'V:N', 'Residuals')));c(argv[[1]],argv[[2]]); [[1]] [1] "(Intercept)" $B [1] "B" $V [1] "V" $N [1] "N" $`V:N` [1] "V" "N" $Residuals [1] "B" "V" "N" "Within" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc12# #argv <- list(structure(c(512, 313, 89, 19, 353, 207, 17, 8, 120, 205, 202, 391, 138, 279, 131, 244, 53, 138, 94, 299, 22, 351, 24, 317), .Dim = c(2L, 2L, 6L), .Dimnames = structure(list(Admit = c('Admitted', 'Rejected'), Gender = c('Male', 'Female'), Dept = c('A', 'B', 'C', 'D', 'E', 'F')), .Names = c('Admit', 'Gender', 'Dept')), class = 'table'));c(argv[[1]]); [1] 512 313 89 19 353 207 17 8 120 205 202 391 138 279 131 244 53 138 94 [20] 299 22 351 24 317 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc13# #argv <- list(structure(1208822400, class = c('POSIXct', 'POSIXt')), structure(1209168000, class = c('POSIXct', 'POSIXt')));c(argv[[1]],argv[[2]]); [1] "2008-04-22 GMT" "2008-04-26 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc14# #argv <- list(`Grand mean` = structure(103.87323943662, class = 'mtable'), structure(list(N = structure(c(78.7365206866197, 98.5088731171753, 113.842206450509, 123.008873117175), .Dim = 4L, .Dimnames = structure(list(N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = 'N'), class = 'mtable'), `V:N` = structure(c(79.5323303457107, 86.1989970123773, 69.7732394366197, 98.0323303457106, 108.032330345711, 89.1989970123773, 114.198997012377, 116.698997012377, 110.365663679044, 124.365663679044, 126.365663679044, 118.032330345711), .Dim = 3:4, .Dimnames = structure(list(V = c('Golden.rain', 'Marvellous', 'Victory'), N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = c('V', 'N')), class = 'mtable')), .Names = c('N', 'V:N')));c(argv[[1]],argv[[2]]); [[1]] [1] 103.8732 $N N 0.0cwt 0.2cwt 0.4cwt 0.6cwt 78.73652 98.50887 113.84221 123.00887 $`V:N` N V 0.0cwt 0.2cwt 0.4cwt 0.6cwt Golden.rain 79.53233 98.03233 114.19900 124.36566 Marvellous 86.19900 108.03233 116.69900 126.36566 Victory 69.77324 89.19900 110.36566 118.03233 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc14# #options(digits=4);c(0.12345678912345,0.123) [1] 0.1235 0.1230 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc15# #argv <- list(NULL, structure(list(class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rexp(2, numeric()))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), .Names = c('class', 'condition')));c(argv[[1]],argv[[2]]); $class [1] "try-error" $condition ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc16# #argv <- list(NULL, structure(list(other = structure(1:3, .Label = c('A', 'B', 'C'), class = 'factor')), .Names = 'other'));c(argv[[1]],argv[[2]]); $other [1] A B C Levels: A B C ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc17# #argv <- list(logical(0), structure(1:10, .Tsp = c(1920.5, 1921.25, 12), class = 'ts'), logical(0));c(argv[[1]],argv[[2]],argv[[3]]); [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc18# #argv <- list(structure(list(V1 = c(1L, 1L, 2L, 3L), V2 = structure(c(1L, 1L, 2L, 3L), .Label = c('A', 'D', 'E'), class = 'factor'), V3 = c(6, 6, 9, 10)), .Names = c('V1', 'V2', 'V3'), row.names = c(NA, 4L), class = 'data.frame'), sep = '\r');c(argv[[1]],argv[[2]]); $V1 [1] 1 1 2 3 $V2 [1] A A D E Levels: A D E $V3 [1] 6 6 9 10 [[4]] [1] "\r" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc19# #argv <- list(10L, NULL, 10);c(argv[[1]],argv[[2]],argv[[3]]); [1] 10 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc2# #argv <- list(structure(list(names = c('x', 'z')), .Names = 'names'), structure(list(class = 'data.frame', row.names = c(NA, 10L)), .Names = c('class', 'row.names')));c(argv[[1]],argv[[2]]); $names [1] "x" "z" $class [1] "data.frame" $row.names [1] NA 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc20# #argv <- list(NULL, structure(list(class = 'try-error', condition = structure(list(message = 'non-numeric argument to mathematical function', call = quote(log('a'))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), .Names = c('class', 'condition')));c(argv[[1]],argv[[2]]); $class [1] "try-error" $condition ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc21# #argv <- list(NULL, structure(list(class = 'try-error', condition = structure(list(message = 'x is empty', call = quote(cor(Z[, FALSE], use = 'pairwise.complete.obs', method = 'kendall'))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), .Names = c('class', 'condition')));c(argv[[1]],argv[[2]]); $class [1] "try-error" $condition ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc22# #argv <- list(structure(list(N = structure(c(17, 18, 18, 18), .Dim = 4L, .Dimnames = structure(list(N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = 'N'))), .Names = 'N'), structure(list(`V:N` = structure(c(6, 6, 5, 6, 6, 6, 6, 6, 6, 6, 6, 6), .Dim = 3:4, .Dimnames = structure(list(V = c('Golden.rain', 'Marvellous', 'Victory'), N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = c('V', 'N')))), .Names = 'V:N'));c(argv[[1]],argv[[2]]); $N N 0.0cwt 0.2cwt 0.4cwt 0.6cwt 17 18 18 18 $`V:N` N V 0.0cwt 0.2cwt 0.4cwt 0.6cwt Golden.rain 6 6 6 6 Marvellous 6 6 6 6 Victory 5 6 6 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc23# #argv <- list(list(NULL), list(NULL, c('a', 'b', 'c'), NULL, c('V5', 'V6', 'V7', 'V8', 'V9')));c(argv[[1]],argv[[2]]); [[1]] NULL [[2]] NULL [[3]] [1] "a" "b" "c" [[4]] NULL [[5]] [1] "V5" "V6" "V7" "V8" "V9" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc24# #argv <- list(NULL, structure(list(class = 'try-error', condition = structure(list(message = 'undefined columns selected', call = quote(`[.data.frame`(dd, , 'C'))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), .Names = c('class', 'condition')));c(argv[[1]],argv[[2]]); $class [1] "try-error" $condition ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc25# #argv <- list(NULL, structure(list(class = 'try-error', condition = structure(list(message = 'line 1 did not have 4 elements', call = quote(scan(file, what, nmax, sep, dec, quote, skip, nlines, na.strings, flush, fill, strip.white, quiet, blank.lines.skip, multi.line, comment.char, allowEscapes, encoding))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), .Names = c('class', 'condition')));c(argv[[1]],argv[[2]]); $class [1] "try-error" $condition ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc26# #argv <- list(0, c(FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE));c(argv[[1]],argv[[2]]); [1] 0 0 0 0 0 1 0 0 0 0 1 0 0 0 0 1 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc27# #argv <- list(character(0));c(argv[[1]]); character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc28# #argv <- list(NULL, structure(list(class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rnorm(1, sd = Inf))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), .Names = c('class', 'condition')));c(argv[[1]],argv[[2]]); $class [1] "try-error" $condition ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc29# #argv <- list(1944, 1944.75, 4);c(argv[[1]],argv[[2]],argv[[3]]); [1] 1944.00 1944.75 4.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc3# #argv <- list(0.1, 1e+60);c(argv[[1]],argv[[2]]); [1] 1e-01 1e+60 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc30# #argv <- list(structure(c(2.8709968773466e-06, -0.000158359165766342, 0.00727428858396739, -0.000819679205658397, -0.000777694946526408, -0.00356554678621684, 0.000131355545630207, 0.0114265093267527, -0.000158359165766342, 5.43254707707774e-06, -0.000158630865337517, 9.73709585506688e-05, 0.000111529300368063, 5.13485783500411e-05, -6.33871099330885e-05, -0.000383481109923256, 0.00727428858396739, -0.000158630865337517, -1.56486391901245e-05, -0.00236056684784514, -0.00652700637569598, 0.00050199030070891, 0.00218994696407579, 0.0203300594009954, -0.000819679205658397, 9.73709585506688e-05, -0.00236056684784514, 7.93209373295412e-07, 0.00187235412049774, 0.00143329638746881, -3.6749249077872e-05, -0.0118829190788863, -0.000777694946526408, 0.000111529300368063, -0.00652700637569598, 0.00187235412049774, 4.25289264915918e-06, 0.00235407805712873, -0.000833270910443051, -0.00229252218256459, -0.00356554678621684, 5.13485783500411e-05, 0.00050199030070891, 0.00143329638746881, 0.00235407805712873, -3.00860514170775e-05, -0.00105162168837414, -0.00640852176345075, 0.000131355545630207, -6.33871099330885e-05, 0.00218994696407579, -3.6749249077872e-05, -0.000833270910443051, -0.00105162168837414, 2.63610545947479e-06, 0.00637158302982355, 0.0114265093267527, -0.000383481109923256, 0.0203300594009954, -0.0118829190788863, -0.00229252218256459, -0.00640852176345075, 0.00637158302982355, -9.55643771360926e-05), .Dim = c(8L, 8L), .Dimnames = list(c('height', 'arm.span', 'forearm', 'lower.leg', 'weight', 'bitro.diameter', 'chest.girth', 'chest.width'), c('height', 'arm.span', 'forearm', 'lower.leg', 'weight', 'bitro.diameter', 'chest.girth', 'chest.width'))));c(argv[[1]]); [1] 2.870997e-06 -1.583592e-04 7.274289e-03 -8.196792e-04 -7.776949e-04 [6] -3.565547e-03 1.313555e-04 1.142651e-02 -1.583592e-04 5.432547e-06 [11] -1.586309e-04 9.737096e-05 1.115293e-04 5.134858e-05 -6.338711e-05 [16] -3.834811e-04 7.274289e-03 -1.586309e-04 -1.564864e-05 -2.360567e-03 [21] -6.527006e-03 5.019903e-04 2.189947e-03 2.033006e-02 -8.196792e-04 [26] 9.737096e-05 -2.360567e-03 7.932094e-07 1.872354e-03 1.433296e-03 [31] -3.674925e-05 -1.188292e-02 -7.776949e-04 1.115293e-04 -6.527006e-03 [36] 1.872354e-03 4.252893e-06 2.354078e-03 -8.332709e-04 -2.292522e-03 [41] -3.565547e-03 5.134858e-05 5.019903e-04 1.433296e-03 2.354078e-03 [46] -3.008605e-05 -1.051622e-03 -6.408522e-03 1.313555e-04 -6.338711e-05 [51] 2.189947e-03 -3.674925e-05 -8.332709e-04 -1.051622e-03 2.636105e-06 [56] 6.371583e-03 1.142651e-02 -3.834811e-04 2.033006e-02 -1.188292e-02 [61] -2.292522e-03 -6.408522e-03 6.371583e-03 -9.556438e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc31# #argv <- list(c(-Inf, 2.17292368994844e-311, 4.34584737989688e-311, 8.69169475979376e-311, 1.73833895195875e-310, 3.4766779039175e-310, 6.953355807835e-310, 1.390671161567e-309, 2.781342323134e-309, 5.562684646268e-309, 1.1125369292536e-308, 2.2250738585072e-308, 4.4501477170144e-308, 8.90029543402881e-308, 1.78005908680576e-307, 2.2250738585072e-303, 2.2250738585072e-298, 1.79769313486232e+298, 1.79769313486232e+303, 2.24711641857789e+307, 4.49423283715579e+307, 8.98846567431158e+307, 1.79769313486232e+308, Inf, Inf), c(NaN, NA));c(argv[[1]],argv[[2]]); [1] -Inf 2.172924e-311 4.345847e-311 8.691695e-311 1.738339e-310 [6] 3.476678e-310 6.953356e-310 1.390671e-309 2.781342e-309 5.562685e-309 [11] 1.112537e-308 2.225074e-308 4.450148e-308 8.900295e-308 1.780059e-307 [16] 2.225074e-303 2.225074e-298 1.797693e+298 1.797693e+303 2.247116e+307 [21] 4.494233e+307 8.988466e+307 Inf Inf Inf [26] NaN NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc32# #argv <- list(list(structure(list(Ozone = c(NA, NA, NA, NA, NA, NA, 29L, NA, 71L, 39L, NA, NA, 23L, NA, NA, 21L, 37L, 20L, 12L, 13L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), Solar.R = c(286L, 287L, 242L, 186L, 220L, 264L, 127L, 273L, 291L, 323L, 259L, 250L, 148L, 332L, 322L, 191L, 284L, 37L, 120L, 137L, 150L, 59L, 91L, 250L, 135L, 127L, 47L, 98L, 31L, 138L), Wind = c(8.6, 9.7, 16.1, 9.2, 8.6, 14.3, 9.7, 6.9, 13.8, 11.5, 10.9, 9.2, 8, 13.8, 11.5, 14.9, 20.7, 9.2, 11.5, 10.3, 6.3, 1.7, 4.6, 6.3, 8, 8, 10.3, 11.5, 14.9, 8), Temp = c(78L, 74L, 67L, 84L, 85L, 79L, 82L, 87L, 90L, 87L, 93L, 92L, 82L, 80L, 79L, 77L, 72L, 65L, 73L, 76L, 77L, 76L, 76L, 76L, 75L, 78L, 73L, 80L, 77L, 83L), Month = c(6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L), Day = 1:30), .Names = c('Ozone', 'Solar.R', 'Wind', 'Temp', 'Month', 'Day'), row.names = 32:61, class = 'data.frame')), structure(list(Oz.Z = structure(c(NA, NA, NA, NA, NA, NA, -0.0244094233987339, NA, 2.28228108778162, 0.52480260307278, NA, NA, -0.353936639281642, NA, NA, -0.463779044575945, 0.414960197778477, -0.518700247223096, -0.958069868400307, -0.903148665753156, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), .Dim = c(30L, 1L), '`scaled:center`' = 29.4444444444444, '`scaled:scale`' = 18.2079042664931)), .Names = 'Oz.Z'));c(argv[[1]],argv[[2]]); [[1]] Ozone Solar.R Wind Temp Month Day 32 NA 286 8.6 78 6 1 33 NA 287 9.7 74 6 2 34 NA 242 16.1 67 6 3 35 NA 186 9.2 84 6 4 36 NA 220 8.6 85 6 5 37 NA 264 14.3 79 6 6 38 29 127 9.7 82 6 7 39 NA 273 6.9 87 6 8 40 71 291 13.8 90 6 9 41 39 323 11.5 87 6 10 42 NA 259 10.9 93 6 11 43 NA 250 9.2 92 6 12 44 23 148 8.0 82 6 13 45 NA 332 13.8 80 6 14 46 NA 322 11.5 79 6 15 47 21 191 14.9 77 6 16 48 37 284 20.7 72 6 17 49 20 37 9.2 65 6 18 50 12 120 11.5 73 6 19 51 13 137 10.3 76 6 20 52 NA 150 6.3 77 6 21 53 NA 59 1.7 76 6 22 54 NA 91 4.6 76 6 23 55 NA 250 6.3 76 6 24 56 NA 135 8.0 75 6 25 57 NA 127 8.0 78 6 26 58 NA 47 10.3 73 6 27 59 NA 98 11.5 80 6 28 60 NA 31 14.9 77 6 29 61 NA 138 8.0 83 6 30 $Oz.Z [,1] [1,] NA [2,] NA [3,] NA [4,] NA [5,] NA [6,] NA [7,] -0.02440942 [8,] NA [9,] 2.28228109 [10,] 0.52480260 [11,] NA [12,] NA [13,] -0.35393664 [14,] NA [15,] NA [16,] -0.46377904 [17,] 0.41496020 [18,] -0.51870025 [19,] -0.95806987 [20,] -0.90314867 [21,] NA [22,] NA [23,] NA [24,] NA [25,] NA [26,] NA [27,] NA [28,] NA [29,] NA [30,] NA attr(,"`scaled:center`") [1] 29.44444 attr(,"`scaled:scale`") [1] 18.2079 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc33# #argv <- list(list('*', ' ', 'skipping installation test', '\n'), sep = '');c(argv[[1]],argv[[2]]); [[1]] [1] "*" [[2]] [1] " " [[3]] [1] "skipping installation test" [[4]] [1] "\n" [[5]] [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc34# #argv <- list('exNSS4', 'myLib', structure(c('1.0', NA, 'methods', NA, NA, NA, NA, 'GPL (>= 2)', NA, NA, NA, NA, NA, NA, '3.0.1'), .Names = c('Version', NA, 'Depends', NA, NA, NA, NA, 'License', NA, NA, NA, NA, NA, NA, 'Built')));c(argv[[1]],argv[[2]],argv[[3]]); Version Depends "exNSS4" "myLib" "1.0" NA "methods" NA License NA NA NA "GPL (>= 2)" NA NA Built NA NA NA NA "3.0.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc35# #argv <- list(c('‘?’ for shortcuts to help topics.', '', ' ‘help.search()’ or ‘??’ for finding help pages', ' on a vague topic;', ' ‘help.start()’ which opens the HTML version of the R', ' help pages;', ' ‘library()’ for listing available packages and the', ' help objects they contain;', ' ‘data()’ for listing available data sets;', ' ‘methods()’.', '', ' Use ‘prompt'), character(0));c(argv[[1]],argv[[2]]); [1] "‘?’ for shortcuts to help topics." [2] "" [3] " ‘help.search()’ or ‘??’ for finding help pages" [4] " on a vague topic;" [5] " ‘help.start()’ which opens the HTML version of the R" [6] " help pages;" [7] " ‘library()’ for listing available packages and the" [8] " help objects they contain;" [9] " ‘data()’ for listing available data sets;" [10] " ‘methods()’." [11] "" [12] " Use ‘prompt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc36# #argv <- list(-1, 0+1i);c(argv[[1]],argv[[2]]); [1] -1+0i 0+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc37# #argv <- list(c(0, 1, 1.3, 1.8, 2.4), 4.6, NULL);c(argv[[1]],argv[[2]],argv[[3]]); [1] 0.0 1.0 1.3 1.8 2.4 4.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc38# #argv <- list(raw(0), 61);c(argv[[1]],argv[[2]]); [1] 61 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc39# #argv <- list(structure(list(c(1L, 2L, 4L), 1:3, c(2L, 1L)), class = c('package_version', 'numeric_version')));c(argv[[1]]); [1] ‘1.2.4’ ‘1.2.3’ ‘2.1’ ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc4# #argv <- list(1, 1, 1, 1, NA);c(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]]); [1] 1 1 1 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc40# #argv <- list(structure(list(A = 1, c = 'C'), .Names = c('A', 'c')), d = 1:3);c(argv[[1]],argv[[2]]); $A [1] 1 $c [1] "C" [[3]] [1] 1 [[4]] [1] 2 [[5]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc41# #argv <- list(structure(list(1:3), class = c('package_version', 'numeric_version')), structure(list(c(2L, 1L)), class = c('package_version', 'numeric_version')));c(argv[[1]],argv[[2]]); [1] ‘1.2.3’ ‘2.1’ ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc42# #argv <- list(structure(list(Ozone = c(41L, 36L, 12L, 18L, NA, 28L, 23L, 19L, 8L, NA, 7L, 16L, 11L, 14L, 18L, 14L, 34L, 6L, 30L, 11L, 1L, 11L, 4L, 32L, NA, NA, NA, 23L, 45L, 115L, 37L, NA, NA, NA, NA, NA, NA, 29L, NA, 71L, 39L, NA, NA, 23L, NA, NA, 21L, 37L, 20L, 12L, 13L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 135L, 49L, 32L, NA, 64L, 40L, 77L, 97L, 97L, 85L, NA, 10L, 27L, NA, 7L, 48L, 35L, 61L, 79L, 63L, 16L, NA, NA, 80L, 108L, 20L, 52L, 82L, 50L, 64L, 59L, 39L, 9L, 16L, 78L, 35L, 66L, 122L, 89L, 110L, NA, NA, 44L, 28L, 65L, NA, 22L, 59L, 23L, 31L, 44L, 21L, 9L, NA, 45L, 168L, 73L, NA, 76L, 118L, 84L, 85L, 96L, 78L, 73L, 91L, 47L, 32L, 20L, 23L, 21L, 24L, 44L, 21L, 28L, 9L, 13L, 46L, 18L, 13L, 24L, 16L, 13L, 23L, 36L, 7L, 14L, 30L, NA, 14L, 18L, 20L), Solar.R = c(190L, 118L, 149L, 313L, NA, NA, 299L, 99L, 19L, 194L, NA, 256L, 290L, 274L, 65L, 334L, 307L, 78L, 322L, 44L, 8L, 320L, 25L, 92L, 66L, 266L, NA, 13L, 252L, 223L, 279L, 286L, 287L, 242L, 186L, 220L, 264L, 127L, 273L, 291L, 323L, 259L, 250L, 148L, 332L, 322L, 191L, 284L, 37L, 120L, 137L, 150L, 59L, 91L, 250L, 135L, 127L, 47L, 98L, 31L, 138L, 269L, 248L, 236L, 101L, 175L, 314L, 276L, 267L, 272L, 175L, 139L, 264L, 175L, 291L, 48L, 260L, 274L, 285L, 187L, 220L, 7L, 258L, 295L, 294L, 223L, 81L, 82L, 213L, 275L, 253L, 254L, 83L, 24L, 77L, NA, NA, NA, 255L, 229L, 207L, 222L, 137L, 192L, 273L, 157L, 64L, 71L, 51L, 115L, 244L, 190L, 259L, 36L, 255L, 212L, 238L, 215L, 153L, 203L, 225L, 237L, 188L, 167L, 197L, 183L, 189L, 95L, 92L, 252L, 220L, 230L, 259L, 236L, 259L, 238L, 24L, 112L, 237L, 224L, 27L, 238L, 201L, 238L, 14L, 139L, 49L, 20L, 193L, 145L, 191L, 131L, 223L), Wind = c(7.4, 8, 12.6, 11.5, 14.3, 14.9, 8.6, 13.8, 20.1, 8.6, 6.9, 9.7, 9.2, 10.9, 13.2, 11.5, 12, 18.4, 11.5, 9.7, 9.7, 16.6, 9.7, 12, 16.6, 14.9, 8, 12, 14.9, 5.7, 7.4, 8.6, 9.7, 16.1, 9.2, 8.6, 14.3, 9.7, 6.9, 13.8, 11.5, 10.9, 9.2, 8, 13.8, 11.5, 14.9, 20.7, 9.2, 11.5, 10.3, 6.3, 1.7, 4.6, 6.3, 8, 8, 10.3, 11.5, 14.9, 8, 4.1, 9.2, 9.2, 10.9, 4.6, 10.9, 5.1, 6.3, 5.7, 7.4, 8.6, 14.3, 14.9, 14.9, 14.3, 6.9, 10.3, 6.3, 5.1, 11.5, 6.9, 9.7, 11.5, 8.6, 8, 8.6, 12, 7.4, 7.4, 7.4, 9.2, 6.9, 13.8, 7.4, 6.9, 7.4, 4.6, 4, 10.3, 8, 8.6, 11.5, 11.5, 11.5, 9.7, 11.5, 10.3, 6.3, 7.4, 10.9, 10.3, 15.5, 14.3, 12.6, 9.7, 3.4, 8, 5.7, 9.7, 2.3, 6.3, 6.3, 6.9, 5.1, 2.8, 4.6, 7.4, 15.5, 10.9, 10.3, 10.9, 9.7, 14.9, 15.5, 6.3, 10.9, 11.5, 6.9, 13.8, 10.3, 10.3, 8, 12.6, 9.2, 10.3, 10.3, 16.6, 6.9, 13.2, 14.3, 8, 11.5), Temp = c(67L, 72L, 74L, 62L, 56L, 66L, 65L, 59L, 61L, 69L, 74L, 69L, 66L, 68L, 58L, 64L, 66L, 57L, 68L, 62L, 59L, 73L, 61L, 61L, 57L, 58L, 57L, 67L, 81L, 79L, 76L, 78L, 74L, 67L, 84L, 85L, 79L, 82L, 87L, 90L, 87L, 93L, 92L, 82L, 80L, 79L, 77L, 72L, 65L, 73L, 76L, 77L, 76L, 76L, 76L, 75L, 78L, 73L, 80L, 77L, 83L, 84L, 85L, 81L, 84L, 83L, 83L, 88L, 92L, 92L, 89L, 82L, 73L, 81L, 91L, 80L, 81L, 82L, 84L, 87L, 85L, 74L, 81L, 82L, 86L, 85L, 82L, 86L, 88L, 86L, 83L, 81L, 81L, 81L, 82L, 86L, 85L, 87L, 89L, 90L, 90L, 92L, 86L, 86L, 82L, 80L, 79L, 77L, 79L, 76L, 78L, 78L, 77L, 72L, 75L, 79L, 81L, 86L, 88L, 97L, 94L, 96L, 94L, 91L, 92L, 93L, 93L, 87L, 84L, 80L, 78L, 75L, 73L, 81L, 76L, 77L, 71L, 71L, 78L, 67L, 76L, 68L, 82L, 64L, 71L, 81L, 69L, 63L, 70L, 77L, 75L, 76L, 68L), Month = c(5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L), Day = c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L)), .Names = c('Ozone', 'Solar.R', 'Wind', 'Temp', 'Month', 'Day'), row.names = c(NA, -153L)), list(NULL, NULL));c(argv[[1]],argv[[2]]); $Ozone [1] 41 36 12 18 NA 28 23 19 8 NA 7 16 11 14 18 14 34 6 [19] 30 11 1 11 4 32 NA NA NA 23 45 115 37 NA NA NA NA NA [37] NA 29 NA 71 39 NA NA 23 NA NA 21 37 20 12 13 NA NA NA [55] NA NA NA NA NA NA NA 135 49 32 NA 64 40 77 97 97 85 NA [73] 10 27 NA 7 48 35 61 79 63 16 NA NA 80 108 20 52 82 50 [91] 64 59 39 9 16 78 35 66 122 89 110 NA NA 44 28 65 NA 22 [109] 59 23 31 44 21 9 NA 45 168 73 NA 76 118 84 85 96 78 73 [127] 91 47 32 20 23 21 24 44 21 28 9 13 46 18 13 24 16 13 [145] 23 36 7 14 30 NA 14 18 20 $Solar.R [1] 190 118 149 313 NA NA 299 99 19 194 NA 256 290 274 65 334 307 78 [19] 322 44 8 320 25 92 66 266 NA 13 252 223 279 286 287 242 186 220 [37] 264 127 273 291 323 259 250 148 332 322 191 284 37 120 137 150 59 91 [55] 250 135 127 47 98 31 138 269 248 236 101 175 314 276 267 272 175 139 [73] 264 175 291 48 260 274 285 187 220 7 258 295 294 223 81 82 213 275 [91] 253 254 83 24 77 NA NA NA 255 229 207 222 137 192 273 157 64 71 [109] 51 115 244 190 259 36 255 212 238 215 153 203 225 237 188 167 197 183 [127] 189 95 92 252 220 230 259 236 259 238 24 112 237 224 27 238 201 238 [145] 14 139 49 20 193 145 191 131 223 $Wind [1] 7.4 8.0 12.6 11.5 14.3 14.9 8.6 13.8 20.1 8.6 6.9 9.7 9.2 10.9 13.2 [16] 11.5 12.0 18.4 11.5 9.7 9.7 16.6 9.7 12.0 16.6 14.9 8.0 12.0 14.9 5.7 [31] 7.4 8.6 9.7 16.1 9.2 8.6 14.3 9.7 6.9 13.8 11.5 10.9 9.2 8.0 13.8 [46] 11.5 14.9 20.7 9.2 11.5 10.3 6.3 1.7 4.6 6.3 8.0 8.0 10.3 11.5 14.9 [61] 8.0 4.1 9.2 9.2 10.9 4.6 10.9 5.1 6.3 5.7 7.4 8.6 14.3 14.9 14.9 [76] 14.3 6.9 10.3 6.3 5.1 11.5 6.9 9.7 11.5 8.6 8.0 8.6 12.0 7.4 7.4 [91] 7.4 9.2 6.9 13.8 7.4 6.9 7.4 4.6 4.0 10.3 8.0 8.6 11.5 11.5 11.5 [106] 9.7 11.5 10.3 6.3 7.4 10.9 10.3 15.5 14.3 12.6 9.7 3.4 8.0 5.7 9.7 [121] 2.3 6.3 6.3 6.9 5.1 2.8 4.6 7.4 15.5 10.9 10.3 10.9 9.7 14.9 15.5 [136] 6.3 10.9 11.5 6.9 13.8 10.3 10.3 8.0 12.6 9.2 10.3 10.3 16.6 6.9 13.2 [151] 14.3 8.0 11.5 $Temp [1] 67 72 74 62 56 66 65 59 61 69 74 69 66 68 58 64 66 57 68 62 59 73 61 61 57 [26] 58 57 67 81 79 76 78 74 67 84 85 79 82 87 90 87 93 92 82 80 79 77 72 65 73 [51] 76 77 76 76 76 75 78 73 80 77 83 84 85 81 84 83 83 88 92 92 89 82 73 81 91 [76] 80 81 82 84 87 85 74 81 82 86 85 82 86 88 86 83 81 81 81 82 86 85 87 89 90 [101] 90 92 86 86 82 80 79 77 79 76 78 78 77 72 75 79 81 86 88 97 94 96 94 91 92 [126] 93 93 87 84 80 78 75 73 81 76 77 71 71 78 67 76 68 82 64 71 81 69 63 70 77 [151] 75 76 68 $Month [1] 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 6 6 6 6 6 6 [38] 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 6 7 7 7 7 7 7 7 7 7 7 7 7 7 [75] 7 7 7 7 7 7 7 7 7 7 7 7 7 7 7 7 7 7 8 8 8 8 8 8 8 8 8 8 8 8 8 8 8 8 8 8 8 [112] 8 8 8 8 8 8 8 8 8 8 8 8 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 [149] 9 9 9 9 9 $Day [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 [51] 20 21 22 23 24 25 26 27 28 29 30 1 2 3 4 5 6 7 8 9 10 11 12 13 14 [76] 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 1 2 3 4 5 6 7 8 [101] 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 1 2 [126] 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 [151] 28 29 30 [[7]] NULL [[8]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc43# #argv <- list(list(structure(list(u = c(5, 10, 15, 20, 30, 40, 60, 80, 100), lot1 = c(118, 58, 42, 35, 27, 25, 21, 19, 18), lot2 = c(69, 35, 26, 21, 18, 16, 13, 12, 12)), .Names = c('u', 'lot1', 'lot2'), row.names = c(NA, -9L), class = 'data.frame')), structure(list(max.level = 0, give.attr = FALSE, digits = 3), .Names = c('max.level', 'give.attr', 'digits')));c(argv[[1]],argv[[2]]); [[1]] u lot1 lot2 1 5 118 69 2 10 58 35 3 15 42 26 4 20 35 21 5 30 27 18 6 40 25 16 7 60 21 13 8 80 19 12 9 100 18 12 $max.level [1] 0 $give.attr [1] FALSE $digits [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc44# #argv <- list(list(structure(list(structure('vpl1', class = c('vpListing', 'gridVectorListing', 'gridListing')), structure('1', class = c('vpUpListing', 'gridVectorListing', 'gridListing'))), class = c('gridListListing', 'gridListing'))), list(structure('vpl2', class = c('vpListing', 'gridVectorListing', 'gridListing'))));c(argv[[1]],argv[[2]]); [[1]] [[1]] [1] "vpl1" attr(,"class") [1] "vpListing" "gridVectorListing" "gridListing" [[2]] [1] "1" attr(,"class") [1] "vpUpListing" "gridVectorListing" "gridListing" attr(,"class") [1] "gridListListing" "gridListing" [[2]] [1] "vpl2" attr(,"class") [1] "vpListing" "gridVectorListing" "gridListing" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc45# #argv <- list(1, c(2, 3, 4, 6, 7, 8, 9, 10, 11), c(3, 4, 5, 7, 8, 9, 10, 11), 11L);c(argv[[1]],argv[[2]],argv[[3]],argv[[4]]); [1] 1 2 3 4 6 7 8 9 10 11 3 4 5 7 8 9 10 11 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc46# #argv <- list(TRUE, NULL);c(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc47# #argv <- list(NULL, structure(list(names = structure('stats', .Names = 'name')), .Names = 'names'));c(argv[[1]],argv[[2]]); $names name "stats" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc48# #argv <- list(list(c('foo', 'bar'), FALSE, structure(list(a = 1, b = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), c = 'foo'), .Names = c('a', 'b', 'c')), structure(list(1, 'foo', structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'bar'), .Dim = c(2L, 2L)), 0+1i, list(1, structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'foo'), structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)), c(1, 2, 3, 4, 5), 1, structure(c(1+1i, 3+1i, 2+1i, 4+1i, 5-1i, 7-1i, 6-1i, 8-1i), .Dim = c(2L, 2L, 2L)), structure(c(1, 3, 2, 4, 5, 7, 6, 8), .Dim = c(2L, 2L, 2L)), structure(c(1, 3, 2, 4), .Dim = c(2L, 2L))), list(structure(c(TRUE, FALSE, FALSE, TRUE), .Dim = c(2L, 2L))));c(argv[[1]],argv[[2]]); [[1]] [1] "foo" "bar" [[2]] [1] FALSE [[3]] [[3]]$a [1] 1 [[3]]$b [,1] [,2] [1,] 1 2 [2,] 3 4 [[3]]$c [1] "foo" [[4]] [,1] [,2] [1,] 1 Numeric,4 [2,] "foo" "bar" [[5]] [1] 0+1i [[6]] [[6]][[1]] [1] 1 [[6]][[2]] [,1] [,2] [1,] 1 2 [2,] 3 4 [[6]][[3]] [1] "foo" [[7]] [,1] [,2] [1,] 1+2i 3-4i [2,] 5+0i -6+0i [[8]] [1] 1 2 3 4 5 [[9]] [1] 1 [[10]] , , 1 [,1] [,2] [1,] 1+1i 2+1i [2,] 3+1i 4+1i , , 2 [,1] [,2] [1,] 5-1i 6-1i [2,] 7-1i 8-1i [[11]] , , 1 [,1] [,2] [1,] 1 2 [2,] 3 4 , , 2 [,1] [,2] [1,] 5 6 [2,] 7 8 [[12]] [,1] [,2] [1,] 1 2 [2,] 3 4 [[13]] [,1] [,2] [1,] TRUE FALSE [2,] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc49# #argv <- list(c(NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), structure(c(3.3032627879465, 3.28768675817403, 3.28198500972868, 3.26064954685429, 3.28230636466286, 3.29427556805693, 3.28140319515598, 3.31501132729969, 3.29996451963546, 3.3405648068776, 3.3615463372345, 3.37238152179651, 3.32652089130696, 3.31449399159178, 3.31051950313397, 3.29704421073007, 3.31063284281209, 3.31814807478072, 3.3100622663054, 3.33117177869743, 3.32172069914554, 3.34722215914612, 3.36040087649739, 3.36720656884446), .Tsp = c(1983, 1984.91666666667, 12), class = 'ts'), logical(0));c(argv[[1]],argv[[2]],argv[[3]]); [1] NA NA NA NA NA NA NA NA [9] NA NA NA NA NA NA NA NA [17] NA NA NA NA NA NA NA NA [25] NA NA NA NA NA NA NA NA [33] NA NA NA NA NA NA NA NA [41] NA NA NA NA NA NA NA NA [49] NA NA NA NA NA NA NA NA [57] NA NA NA NA NA NA NA NA [65] NA NA NA NA NA NA NA NA [73] NA NA NA NA NA NA NA NA [81] NA NA NA NA NA NA NA NA [89] NA NA NA NA NA NA NA NA [97] NA NA NA NA NA NA NA NA [105] NA NA NA NA NA NA NA NA [113] NA NA NA NA NA NA NA NA [121] NA NA NA NA NA NA NA NA [129] NA NA NA NA NA NA NA NA [137] NA NA NA NA NA NA NA NA [145] NA NA NA NA NA NA NA NA [153] NA NA NA NA NA NA NA NA [161] NA NA NA NA NA NA NA NA [169] 3.303263 3.287687 3.281985 3.260650 3.282306 3.294276 3.281403 3.315011 [177] 3.299965 3.340565 3.361546 3.372382 3.326521 3.314494 3.310520 3.297044 [185] 3.310633 3.318148 3.310062 3.331172 3.321721 3.347222 3.360401 3.367207 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc5# #argv <- list(`difference in location` = -30);c(argv[[1]]); [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc50# #argv <- list(1, 1, 1, list());c(argv[[1]],argv[[2]],argv[[3]],argv[[4]]); [[1]] [1] 1 [[2]] [1] 1 [[3]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc51# #argv <- list(list('1: In matrix(1:7, 3, 4) :\n data length [7] is not a sub-multiple or multiple of the number of rows [3]'), list(), fill = TRUE);c(argv[[1]],argv[[2]],argv[[3]]); [[1]] [1] "1: In matrix(1:7, 3, 4) :\n data length [7] is not a sub-multiple or multiple of the number of rows [3]" [[2]] [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc52# #argv <- list(structure(list(names = c('freq', 'score')), .Names = 'names'), structure(list(class = 'data.frame', row.names = integer(0)), .Names = c('class', 'row.names')));c(argv[[1]],argv[[2]]); $names [1] "freq" "score" $class [1] "data.frame" $row.names integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc53# #argv <- list(1, FALSE, c(0, 0));c(argv[[1]],argv[[2]],argv[[3]]); [1] 1 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc54# #argv <- list(structure(list(x = structure(1:8, .Dim = structure(8L, .Names = 'voice.part'))), .Names = 'x'), list(4));c(argv[[1]],argv[[2]]); $x [1] 1 2 3 4 5 6 7 8 [[2]] [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc55# #argv <- list(c(1L, 2L, 3L, NA), c(-1, 0, 1, NA));c(argv[[1]],argv[[2]]); [1] 1 2 3 NA -1 0 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc56# #argv <- list(369.430769230769, 4.99999999999983);c(argv[[1]],argv[[2]]); [1] 369.4308 5.0000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc57#Ignored.ImplementationError# #argv <- list(structure(list(structure(list(title = 'boot: Bootstrap R (S-PLUS) Functions', author = structure(list(structure(list(given = 'Angelo', family = 'Canty', role = 'aut', email = NULL, comment = 'S original'), .Names = c('given', 'family', 'role', 'email', 'comment')), structure(list(given = c('Brian', 'D.'), family = 'Ripley', role = c('aut', 'trl', 'cre'), email = 'ripley@stats.ox.ac.uk', comment = 'R port, author of parallel support'), .Names = c('given', 'family', 'role', 'email', 'comment'))), class = 'person'), year = '2012', note = 'R package version 1.3-4', url = 'http://CRAN.R-project.org/package=boot'), .Names = c('title', 'author', 'year', 'note', 'url'), bibtype = 'Manual', key = 'boot-package')), class = 'bibentry'), structure(list(structure(list(title = 'Bootstrap Methods and Their Applications', author = structure(list(structure(list(given = c('Anthony', 'C.'), family = 'Davison', role = 'aut', email = NULL, comment = NULL), .Names = c('given', 'family', 'role', 'email', 'comment')), structure(list( given = c('David', 'V.'), family = 'Hinkley', role = 'aut', email = NULL, comment = NULL), .Names = c('given', 'family', 'role', 'email', 'comment'))), class = 'person'), year = '1997', publisher = 'Cambridge University Press', address = 'Cambridge', isbn = '0-521-57391-2', url = 'http://statwww.epfl.ch/davison/BMA/'), .Names = c('title', 'author', 'year', 'publisher', 'address', 'isbn', 'url'), bibtype = 'Book', key = 'boot-book')), class = 'bibentry'));c(argv[[1]],argv[[2]]); Canty A, Ripley BD (2012). _boot: Bootstrap R (S-PLUS) Functions_. R package version 1.3-4, . Davison AC, Hinkley DV (1997). _Bootstrap Methods and Their Applications_. Cambridge University Press, Cambridge. ISBN 0-521-57391-2, . ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc58# #argv <- list(FALSE, 'More testing :', 12321, 'B2');c(argv[[1]],argv[[2]],argv[[3]],argv[[4]]); [1] "FALSE" "More testing :" "12321" "B2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc59# #argv <- list(1:10, 1+1i, TRUE);c(argv[[1]],argv[[2]],argv[[3]]); [1] 1+0i 2+0i 3+0i 4+0i 5+0i 6+0i 7+0i 8+0i 9+0i 10+0i 1+1i 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc6# #argv <- list(TRUE, TRUE, NA);c(argv[[1]],argv[[2]],argv[[3]]); [1] TRUE TRUE NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc60# #argv <- list('ArgMethod', 1.10714871779409);c(argv[[1]],argv[[2]]); [1] "ArgMethod" "1.10714871779409" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc61#Ignored.OutputFormatting# #.Primitive('==');.Primitive('!'); function (e1, e2) .Primitive("==") function (x) .Primitive("!") ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc61#Ignored.OutputFormatting# #argv <- list(structure(list(`ANY#ANY` = .Primitive('==')), .Names = 'ANY#ANY'), list());c(argv[[1]],argv[[2]]); $`ANY#ANY` function (e1, e2) .Primitive("==") ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc62# #argv <- list(list(), list());c(argv[[1]],argv[[2]]); list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc63# #argv <- list(recursive = TRUE);c(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc64# #argv <- list(structure(1386393974.25184, class = c('POSIXct', 'POSIXt')), structure(1386393974.25184, class = c('POSIXct', 'POSIXt')));c(argv[[1]],argv[[2]]); [1] "2013-12-07 05:26:14 GMT" "2013-12-07 05:26:14 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc65# #argv <- list('BiocInstaller', '/home/lzhao/R/x86_64-unknown-linux-gnu-library/3.0', structure(c('1.12.0', NA, 'R (>= 3.0.0)', NA, NA, 'RUnit, BiocGenerics', NA, 'Artistic-2.0', NA, NA, NA, NA, NA, NA, '3.0.1'), .Names = c('Version', NA, 'Depends', NA, NA, 'Suggests', NA, 'License', NA, NA, NA, NA, NA, NA, 'Built')));c(argv[[1]],argv[[2]],argv[[3]]); "BiocInstaller" "/home/lzhao/R/x86_64-unknown-linux-gnu-library/3.0" Version "1.12.0" NA Depends "R (>= 3.0.0)" NA NA Suggests "RUnit, BiocGenerics" NA License "Artistic-2.0" NA NA NA NA NA NA Built "3.0.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc66# #argv <- list(NA, 1+2i);c(argv[[1]],argv[[2]]); [1] NA 1+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc67# #argv <- list(structure(c(0.06, 0.32, 0.63), .Names = c('0%', '25%', '50%')), 909.591818181818, structure(c(0.905, 10000), .Names = c('75%', '100%')));c(argv[[1]],argv[[2]],argv[[3]]); 0% 25% 50% 75% 100% 0.0600 0.3200 0.6300 909.5918 0.9050 10000.0000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc68# #argv <- list(structure(list(ctrl = c(4.17, 5.58, 5.18, 6.11, 4.5, 4.61, 5.17, 4.53, 5.33, 5.14), trt1 = c(4.81, 4.17, 4.41, 3.59, 5.87, 3.83, 6.03, 4.89, 4.32, 4.69), trt2 = c(6.31, 5.12, 5.54, 5.5, 5.37, 5.29, 4.92, 6.15, 5.8, 5.26)), .Dim = 3L, .Dimnames = list(c('ctrl', 'trt1', 'trt2'))));c(argv[[1]]); $ctrl [1] 4.17 5.58 5.18 6.11 4.50 4.61 5.17 4.53 5.33 5.14 $trt1 [1] 4.81 4.17 4.41 3.59 5.87 3.83 6.03 4.89 4.32 4.69 $trt2 [1] 6.31 5.12 5.54 5.50 5.37 5.29 4.92 6.15 5.80 5.26 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc69# #argv <- list(list(NA, FALSE), structure(list(na.rm = TRUE), .Names = 'na.rm'));c(argv[[1]],argv[[2]]); [[1]] [1] NA [[2]] [1] FALSE $na.rm [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc7# #argv <- list(expression(data.frame), list(), check.names = TRUE, stringsAsFactors = TRUE);c(argv[[1]],argv[[2]],argv[[3]],argv[[4]]); expression(data.frame, TRUE, TRUE) ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc70# #argv <- list(structure(list(Topic = character(0), File = character(0)), .Names = c('Topic', 'File'), class = 'data.frame', row.names = integer(0)), sep = '\r');c(argv[[1]],argv[[2]]); $Topic character(0) $File character(0) [[3]] [1] "\r" ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc71# #argv <- list(structure(list(Subject = structure(c(1L, 3L, 6L, 2L, 4L, 5L), .Label = c('1', '4', '2', '5', '6', '3'), class = c('ordered', 'factor')), conc.0.25 = c(1.5, 2.03, 2.72, 1.85, 2.05, 2.31), conc.0.5 = c(0.94, 1.63, 1.49, 1.39, 1.04, 1.44), conc.0.75 = c(0.78, 0.71, 1.16, 1.02, 0.81, 1.03), conc.1 = c(0.48, 0.7, 0.8, 0.89, 0.39, 0.84), conc.1.25 = c(0.37, 0.64, 0.8, 0.59, 0.3, 0.64), conc.2 = c(0.19, 0.36, 0.39, 0.4, 0.23, 0.42)), row.names = c(1L, 12L, 23L, 34L, 45L, 56L), .Names = c('Subject', 'conc.0.25', 'conc.0.5', 'conc.0.75', 'conc.1', 'conc.1.25', 'conc.2')), list(NULL));c(argv[[1]],argv[[2]]); $Subject [1] 1 2 3 4 5 6 Levels: 1 < 4 < 2 < 5 < 6 < 3 $conc.0.25 [1] 1.50 2.03 2.72 1.85 2.05 2.31 $conc.0.5 [1] 0.94 1.63 1.49 1.39 1.04 1.44 $conc.0.75 [1] 0.78 0.71 1.16 1.02 0.81 1.03 $conc.1 [1] 0.48 0.70 0.80 0.89 0.39 0.84 $conc.1.25 [1] 0.37 0.64 0.80 0.59 0.30 0.64 $conc.2 [1] 0.19 0.36 0.39 0.40 0.23 0.42 [[8]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc72# #argv <- list(structure(list(x.limits = c(-2.46408176011189, 2.92512533057276), y.limits = structure(c(1386479490.57927, 1387608090.57927), class = c('POSIXct', 'POSIXt')), x.used.at = NULL, y.used.at = NULL, x.num.limit = NULL, y.num.limit = NULL, aspect.ratio = 1, prepanel.default = 'prepanel.default.xyplot', prepanel = NULL), .Names = c('x.limits', 'y.limits', 'x.used.at', 'y.used.at', 'x.num.limit', 'y.num.limit', 'aspect.ratio', 'prepanel.default', 'prepanel')), structure(list(index.cond = list(1:3), perm.cond = 1L), .Names = c('index.cond', 'perm.cond')));c(argv[[1]],argv[[2]]); $x.limits [1] -2.464082 2.925125 $y.limits [1] "2013-12-08 05:11:30 GMT" "2013-12-21 06:41:30 GMT" $x.used.at NULL $y.used.at NULL $x.num.limit NULL $y.num.limit NULL $aspect.ratio [1] 1 $prepanel.default [1] "prepanel.default.xyplot" $prepanel NULL $index.cond $index.cond[[1]] [1] 1 2 3 $perm.cond [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc73# #argv <- list(structure(list(coefficients = structure(c(-0.0529307911108286, -0.200175675120066), .Names = c('(Intercept)', 'xTRUE')), residuals = structure(c(0.196977726701894, -0.102864715594501, -1.21764591766838, -0.425219263997792, 0.671048026430597, 1.41161034263987, 0.150318738887899, 0.440602402670198, 0.19930142564799, -1.32412876571778), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), effects = structure(c(0.483887391035467, -0.316505532770654, -1.29088865053614, -0.430233412486575, 0.597805293562832, 1.40659619415109, 0.0770760060201344, 0.435588254181415, 0.126058692780225, -1.32914291420656), .Names = c('(Intercept)', 'xTRUE', '', '', '', '', '', '', '', '')), rank = 2L), .Names = c('coefficients', 'residuals', 'effects', 'rank')), structure(list(fitted.values = structure(c(-0.253106466230895, -0.0529307911108286, -0.253106466230895, -0.0529307911108285, -0.253106466230895, -0.0529307911108285, -0.253106466230895, -0.0529307911108285, -0.253106466230895, -0.0529307911108285), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), assign = 0:1, qr = structure(list(qr = structure(c(-3.16227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, -1.58113883008419, 1.58113883008419, -0.240253073352042, 0.392202458681634, -0.240253073352042, 0.392202458681634, -0.240253073352042, 0.392202458681634, -0.240253073352042, 0.392202458681634), .Dim = c(10L, 2L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10'), c('(Intercept)', 'xTRUE')), assign = 0:1, contrasts = structure(list(x = 'contr.treatment'), .Names = 'x')), qraux = c(1.31622776601684, 1.39220245868163), pivot = 1:2, tol = 1e-07, rank = 2L), .Names = c('qr', 'qraux', 'pivot', 'tol', 'rank'), class = 'qr'), df.residual = 8L), .Names = c('fitted.values', 'assign', 'qr', 'df.residual')));c(argv[[1]],argv[[2]]); $coefficients (Intercept) xTRUE -0.05293079 -0.20017568 $residuals 1 2 3 4 5 6 7 0.1969777 -0.1028647 -1.2176459 -0.4252193 0.6710480 1.4116103 0.1503187 8 9 10 0.4406024 0.1993014 -1.3241288 $effects (Intercept) xTRUE 0.48388739 -0.31650553 -1.29088865 -0.43023341 0.59780529 1.40659619 0.07707601 0.43558825 0.12605869 -1.32914291 $rank [1] 2 $fitted.values 1 2 3 4 5 6 -0.25310647 -0.05293079 -0.25310647 -0.05293079 -0.25310647 -0.05293079 7 8 9 10 -0.25310647 -0.05293079 -0.25310647 -0.05293079 $assign [1] 0 1 $qr $qr (Intercept) xTRUE 1 -3.1622777 -1.5811388 2 0.3162278 1.5811388 3 0.3162278 -0.2402531 4 0.3162278 0.3922025 5 0.3162278 -0.2402531 6 0.3162278 0.3922025 7 0.3162278 -0.2402531 8 0.3162278 0.3922025 9 0.3162278 -0.2402531 10 0.3162278 0.3922025 attr(,"assign") [1] 0 1 attr(,"contrasts") attr(,"contrasts")$x [1] "contr.treatment" $qraux [1] 1.316228 1.392202 $pivot [1] 1 2 $tol [1] 1e-07 $rank [1] 2 attr(,"class") [1] "qr" $df.residual [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc74#Ignored.OutputFormatting# #argv <- list(structure(list(object = c('time', 'status')), .Names = 'object'), structure(list(max.level = NA, vec.len = 4, digits.d = 3, nchar.max = 128, give.attr = TRUE, give.head = TRUE, width = 80L, envir = NULL, strict.width = 'no', formatNum = function (x, ...) format(x, trim = TRUE, drop0trailing = TRUE, ...), list.len = 99), .Names = c('max.level', 'vec.len', 'digits.d', 'nchar.max', 'give.attr', 'give.head', 'width', 'envir', 'strict.width', 'formatNum', 'list.len')), structure(list(give.length = TRUE, nest.lev = 2, indent.str = ' .. ..'), .Names = c('give.length', 'nest.lev', 'indent.str')));c(argv[[1]],argv[[2]],argv[[3]]); $object [1] "time" "status" $max.level [1] NA $vec.len [1] 4 $digits.d [1] 3 $nchar.max [1] 128 $give.attr [1] TRUE $give.head [1] TRUE $width [1] 80 $envir NULL $strict.width [1] "no" $formatNum function (x, ...) format(x, trim = TRUE, drop0trailing = TRUE, ...) $list.len [1] 99 $give.length [1] TRUE $nest.lev [1] 2 $indent.str [1] " .. .." ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc8# #argv <- list(-0.1, 0.1);c(argv[[1]],argv[[2]]); [1] -0.1 0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_c.testc9# #argv <- list(NULL, structure(list(class = 'try-error', condition = structure(list(message = 'more columns than column names', call = quote(read.table('foo6', header = TRUE))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), .Names = c('class', 'condition')));c(argv[[1]],argv[[2]]); $class [1] "try-error" $condition ##com.oracle.truffle.r.test.builtins.TestBuiltin_cache.testcache1# #argv <- list('ddenseMatrix', c('ddenseMatrix', 'dMatrix', 'denseMatrix', 'Matrix', 'mMatrix'));.cache_class(argv[[1]],argv[[2]]); [1] "ddenseMatrix" "dMatrix" "denseMatrix" "Matrix" "mMatrix" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cache.testcache2# #argv <- list('numeric', c('numeric', 'vector', 'atomicVector'));.cache_class(argv[[1]],argv[[2]]); [1] "numeric" "vector" "atomicVector" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat("a") } a ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat("a", "b") } a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat("a", "b", "c", sep=c("-", "+")) } a-b+c ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat("hi",1:3,"hello") } hi 1 2 3 hello ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat("hi",1[2],"hello",sep="-") } hi-NA-hello ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat("hi",1[2],"hello",sep="-\n") } hi- NA- hello ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat("hi",NULL,"hello",sep="-") } hi-hello ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat("hi",integer(0),"hello",sep="-") } hi--hello ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat() } ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(1) } 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(1, "a") } 1 a ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(1, sep="\n") } 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(1,2,3) } 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(1,2,sep=".") } 1.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(1.2,3.4) } 1.2 3.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(1:3) } 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(1L) } 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(1L, 2L, 3L) } 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(2.3) } 2.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(NULL) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(TRUE) } TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(TRUE, c(1,2,3), FALSE, 7, c("a","b"), "x") } TRUE 1 2 3 FALSE 7 a b x ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(c("a", "b", "c"), "d", sep=c("-", "+")) } a-b+c-d ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(c("a","b")) } a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(c(1,2,3)) } 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(c(1,2,3),c("a","b")) } 1 2 3 a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(c(1.2,3.4),5.6) } 1.2 3.4 5.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(c(1L, 2L, 3L)) } 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(c(TRUE,FALSE), TRUE) } TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(paste(letters, 100* 1:26), fill = TRUE, labels = paste0("{", 1:10, "}:"))} {1}: a 100 b 200 c 300 d 400 e 500 f 600 g 700 h 800 i 900 j 1000 k 1100 l 1200 {2}: m 1300 n 1400 o 1500 p 1600 q 1700 r 1800 s 1900 t 2000 u 2100 v 2200 {3}: w 2300 x 2400 y 2500 z 2600 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(rep(NA, 8), "Hey","Hey","Goodbye","\n") } NA NA NA NA NA NA NA NA Hey Hey Goodbye ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ cat(sep=" ", "hello") } hello ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat#Output.IgnoreErrorMessage# #{ foo <- function(a,b) cat(a,b); foo(42,); } Error in cat(a, b) : argument "b" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCat# #{ m <- matrix(as.character(1:6), nrow=2) ; cat(m) } 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCatUnsupportedArgs# #cat(list(), expression(), sep='this-should-be-ok') this-should-be-ok ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCatUnsupportedArgs# #cat(list(1,2,3)) Error in cat(list(1, 2, 3)) : argument 1 (type 'list') cannot be handled by 'cat' ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCatUnsupportedArgs# #cat(parse(text='42')) Error in cat(parse(text = "42")) : argument 1 (type 'expression') cannot be handled by 'cat' ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCatUnsupportedArgs# #cat(quote(3+3)) Error in cat(quote(3 + 3)) : argument 1 (type 'language') cannot be handled by 'cat' ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCatUnsupportedArgs# #cat(quote(a)) a ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCatVarargs# #{ f <- function(...) {cat(...,sep="-")}; f("a") } a ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCatVarargs# #{ f <- function(...) {cat(...,sep="-")}; f("a", "b") } a-b ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCatVarargs# #{ f <- function(...) {cat(...,sep="-\n")}; f("a") } a ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testCatVarargs# #{ f <- function(...) {cat(...,sep="-\n")}; f("a", "b") } a- b ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testcat1# #argv <- list('head\n', 1:2, '\n', 3:4, file = 'foo4');cat(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]]); head 1 2 3 4 foo4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testcat2# #argv <- list(list('Loading required package: splines\n'), structure(2L, class = c('terminal', 'connection')), '', FALSE, NULL, FALSE); .Internal(cat(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) Loading required package: splines ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testcat3# #argv <- list('%comment\n\n%another\n%\n%\n', 'C1\tC2\tC3\n\'Panel\'\t\'Area Examined\'\t\'% Blemishes\'\n', '\'1\'\t\'0.8\'\t\'3\'\n', '\'2\'\t\'0.6\'\t\'2\'\n', '\'3\'\t\'0.8\'\t\'3\'\n', file = 'test.dat', sep = '');cat(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]],argv[[6]],argv[[7]]); %comment %another % % C1 C2 C3 'Panel' 'Area Examined' '% Blemishes' '1' '0.8' '3' '2' '0.6' '2' '3' '0.8' '3' test.dat ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testcat4# #argv <- list('#comment\n\n#another\n#\n#\n', 'C1\tC2\tC3\n\'Panel\'\t\'Area Examined\'\t\'# Blemishes\'\n', '\'1\'\t\'0.8\'\t\'3\'\n', '\'2\'\t\'0.6\'\t\'2\'\n', '\'3\'\t\'0.8\'\t\'3\'\n', file = 'test.dat', sep = '');cat(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]],argv[[6]],argv[[7]]); #comment #another # # C1 C2 C3 'Panel' 'Area Examined' '# Blemishes' '1' '0.8' '3' '2' '0.6' '2' '3' '0.8' '3' test.dat ##com.oracle.truffle.r.test.builtins.TestBuiltin_cat.testcat5# #argv <- list('head\n', file = 'foo2');cat(argv[[1]],argv[[2]]); head foo2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #cbind(1, 1:4, matrix(1:8, nrow=2)) [,1] [,2] [,3] [,4] [,5] [,6] [1,] 1 1 1 3 5 7 [2,] 1 2 2 4 6 8 Warning message: In cbind(1, 1:4, matrix(1:8, nrow = 2)) : number of rows of result is not a multiple of vector length (arg 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind#Output.IgnoreWarningContext# #cbind(1:2, 1:3, 1:4) [,1] [,2] [,3] [1,] 1 1 1 [2,] 2 2 2 [3,] 1 3 3 [4,] 2 1 4 Warning message: In cbind(1:2, 1:3, 1:4) : number of rows of result is not a multiple of vector length (arg 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #cbind(55, character(0)) [,1] [1,] "55" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #cbind(NULL) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #cbind(a=55, character(0)) a [1,] "55" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #cbind(array(1:8,c(2,4),list(c('x','y'), c('a','b', 'a2', 'b2'))), 1:8) a b a2 b2 x 1 3 5 7 1 y 2 4 6 8 2 Warning message: In cbind(array(1:8, c(2, 4), list(c("x", "y"), c("a", "b", "a2", : number of rows of result is not a multiple of vector length (arg 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind#Ignored.ImplementationError# #cbind(cbind) cbind [1,] ? ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #cbind(character(0)) [,1] ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #cbind(character(0), 'f') [,1] [1,] "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #cbind(matrix(1:4,nrow=2), matrix(1:8,nrow=4)) Error in cbind(matrix(1:4, nrow = 2), matrix(1:8, nrow = 4)) : number of rows of matrices must match (see arg 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #cbind(new.env()) [,1] ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #v <- 1:3; attr(v, 'a') <- 'a'; attr(v, 'a1') <- 'a1'; cbind(v); cbind(v, v) v [1,] 1 [2,] 2 [3,] 3 v v [1,] 1 1 [2,] 2 2 [3,] 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #v <- 1:3; v1<-1:3; attr(v, 'a') <- 'a'; attr(v1, 'a1') <- 'a1'; cbind(v, v1) v v1 [1,] 1 1 [2,] 2 2 [3,] 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #v <- 1; attr(v, 'a') <- 'a'; attr(v, 'a1') <- 'a1'; cbind(v); cbind(v, v) v [1,] 1 v v [1,] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #v <- 1; attr(v, 'a') <- 'a'; cbind(v); cbind(v, v) v [1,] 1 v v [1,] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #x <- matrix(1:20, 10, 2); dimnames(x) <- list(1:10, c('a','b')); cbind(1, x[,-1,drop=FALSE]); b 1 1 11 2 1 12 3 1 13 4 1 14 5 1 15 6 1 16 7 1 17 8 1 18 9 1 19 10 1 20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind() } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind#Output.IgnoreWarningContext# #{ cbind(1:3,1:2) } [,1] [,2] [1,] 1 1 [2,] 2 2 [3,] 3 1 Warning message: In cbind(1:3, 1:2) : number of rows of result is not a multiple of vector length (arg 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(1:3,1:3) } [,1] [,2] [1,] 1 1 [2,] 2 2 [3,] 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(1:3,2) } [,1] [,2] [1,] 1 2 [2,] 2 2 [3,] 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(2,3, c(1,1,1)) } [,1] [,2] [,3] [1,] 2 3 1 [2,] 2 3 1 [3,] 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(2,3, complex(3,3,2));} [,1] [,2] [,3] [1,] 2+0i 3+0i 3+2i [2,] 2+0i 3+0i 3+2i [3,] 2+0i 3+0i 3+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(2.1:10,32.2) } [,1] [,2] [1,] 2.1 32.2 [2,] 3.1 32.2 [3,] 4.1 32.2 [4,] 5.1 32.2 [5,] 6.1 32.2 [6,] 7.1 32.2 [7,] 8.1 32.2 [8,] 9.1 32.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(a=c(1,2), b=c(3,4)) } a b [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(a=c(1,2), b=c(3,y=4)) } a b 1 3 y 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(a=c(1,2), b=c(x=3,y=4)) } a b x 1 3 y 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(a=c(1,x=2), b=c(3,4,5,6)) } a b [1,] 1 3 [2,] 2 4 [3,] 1 5 [4,] 2 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(a=c(1,x=2), b=c(y=3,4,5,6)) } a b y 1 3 2 4 1 5 2 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(a=c(b=1,c=2)) } a b 1 c 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(a=c(x=1,2), b=c(3,y=4)) } a b x 1 3 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(a=c(x=1,y=2), b=c(3,4)) } a b x 1 3 y 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(c(1,2)) } [,1] [1,] 1 [2,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(c(1,c=2)) } [,1] 1 c 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(c(b=1,c=2)) } [,1] b 1 c 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(integer(0), NULL, matrix(integer(0),0,1)) } [,1] [,2] [,3] ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(integer(0), NULL, matrix(integer(0),1,0)) } [1,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(list(1,2), TRUE, "a") } [,1] [,2] [,3] [1,] 1 TRUE "a" [2,] 2 TRUE "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(matrix(1:4, nrow=2), z=c(m=8,n=9)) } z m 1 3 8 n 2 4 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(matrix(1:4, nrow=2, dimnames=list(NULL, c('x', 'y'))), c(m=8,n=9)) } x y m 1 3 8 n 2 4 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(matrix(1:4, nrow=2, dimnames=list(c('a', 'b'), NULL)), z=c(8,9)) } z a 1 3 8 b 2 4 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(matrix(1:4, nrow=2, dimnames=list(c('a', 'b'), c('x', 'y')))) } x y a 1 3 b 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(matrix(1:4, nrow=2, dimnames=list(c('a', 'b'), c('x', 'y'))), c(8,9)) } x y a 1 3 8 b 2 4 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ cbind(matrix(1:4, nrow=2, dimnames=list(c('a', 'b'), c('x', 'y'))), z=c(8,9)) } x y z a 1 3 8 b 2 4 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ m <- matrix(1:6, nrow=2) ; cbind(11:12, m) } [,1] [,2] [,3] [,4] [1,] 11 1 3 5 [2,] 12 2 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ v<-c(b=1, c=2); cbind(v) } v b 1 c 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{ x<-list(a=7, b=NULL, c=42); y<-as.data.frame(do.call(cbind,x)); y } a c 1 7 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testCbind# #{x <- numeric(); y <- matrix(2,2); dimnames(y) <- list(c(NA_character_,NA_character_), c(NA_character_)); rbind(x, y) } 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #cbind(array(1:8,c(2,2),list(c('a','b'), c('d','e'))), array(1:4,c(2,2),list(c('f','g'), c('h','i')))) d e h i a 1 3 1 3 b 2 4 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames#Output.IgnoreWarningContext# #cbind(array(1:8,c(2,2),list(c('a','b'), c('d','e'))), array(1:8,c(2,2,2),list(c('a1','b1'), c('d1','e1'), c('f1','g1')))) d e a 1 3 1 b 2 4 2 Warning message: In cbind(array(1:8, c(2, 2), list(c("a", "b"), c("d", "e"))), array(1:8, : number of rows of result is not a multiple of vector length (arg 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #cbind(array(1:8,c(2,2,2),list(c('a','b'), c('d','e'), c('f','g'))), array(1:8,c(2,2,2),list(c('a1','b1'), c('d1','e1'), c('f1','g1')))) [,1] [,2] [1,] 1 1 [2,] 2 2 [3,] 3 3 [4,] 4 4 [5,] 5 5 [6,] 6 6 [7,] 7 7 [8,] 8 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #cbind(array(1:8,c(2,4),list(c('x','y'), c('a','b', 'a2', 'b2'))), array(1:8,c(2,2,2),list(c('a1','b1'), c('d1','e1'), c('f1','g1')))) a b a2 b2 x 1 3 5 7 1 y 2 4 6 8 2 Warning message: In cbind(array(1:8, c(2, 4), list(c("x", "y"), c("a", "b", "a2", : number of rows of result is not a multiple of vector length (arg 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(1L)) } $dim [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(1L, 2L)) } $dim [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(NULL, integer(0))) } $dim [1] 0 2 $dimnames $dimnames[[1]] NULL $dimnames[[2]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(c(1), integer(0))) } $dim [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(c(1L, 2L))) } $dim [1] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(integer(0))) } $dim [1] 0 1 $dimnames $dimnames[[1]] NULL $dimnames[[2]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(integer(0), integer(0))) } $dim [1] 0 2 $dimnames $dimnames[[1]] NULL $dimnames[[2]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(list())) } $dim [1] 0 1 $dimnames $dimnames[[1]] NULL $dimnames[[2]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(list(1L, 2L))) } $dim [1] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(matrix())) } $dim [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(matrix(1L, 2L))) } $dim [1] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(structure(1:4, dim=c(2,2)), 1L)) } $dim [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(structure(1:4, dim=c(2,2), dimnames=list(c('y1', 'y2'), c('x1', 'x2'))), 1L)) } $dim [1] 2 3 $dimnames $dimnames[[1]] [1] "y1" "y2" $dimnames[[2]] [1] "x1" "x2" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(structure(1:4, dim=c(2,2), dimnames=list(y=c('y1', 'y2'), x=c('x1', 'x2'))), 1L)) } $dim [1] 2 3 $dimnames $dimnames[[1]] [1] "y1" "y2" $dimnames[[2]] [1] "x1" "x2" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ attributes(cbind(structure(1:4, dim=c(2,2), dimnames=list(y=c('y1', 'y2'), x=c('x1', 'x2'))), integer(0))) } $dim [1] 2 2 $dimnames $dimnames[[1]] [1] "y1" "y2" $dimnames[[2]] [1] "x1" "x2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ cbind(NULL, integer(0)) } [,1] [,2] ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ cbind(c(1), integer(0)) } [,1] [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ cbind(integer(0), integer(0)) } [,1] [,2] ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ cbind(structure(1:4, dim=c(2,2)), 1L) } [,1] [,2] [,3] [1,] 1 3 1 [2,] 2 4 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ cbind(structure(1:4, dim=c(2,2), dimnames=list(c('y1', 'y2'), c('x1', 'x2'))), 1L) } x1 x2 y1 1 3 1 y2 2 4 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ cbind(structure(1:4, dim=c(2,2), dimnames=list(y=c('y1', 'y2'), x=c('x1', 'x2'))), 1L) } x1 x2 y1 1 3 1 y2 2 4 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testDimnames# #{ cbind(structure(1:4, dim=c(2,2), dimnames=list(y=c('y1', 'y2'), x=c('x1', 'x2'))), integer(0)) } x1 x2 y1 1 3 y2 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; cbind.foo <- function(...) 'foo'; cbind(v) } v [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; assign('cbind.foo', function(x) {'foo'}, envir=.__S3MethodsTable__.); result <- cbind(v) ; rm('cbind.foo', envir=.__S3MethodsTable__.); result;} [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; cbind(v) } v [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch#Ignored.WrongCaller# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- function() 'foo'; cbind(v) } Error in cbind(deparse.level, ...) : unused argument (1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- function(...) 'foo'; cbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- function(...) 'foo'; v2 <- 1; class(v2) <- 'foo'; cbind(v2) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- function(deparse.level, ...) 'foo'; cbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- function(deparse.level, x) 'foo'; cbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- function(deparse.level, x1, x2) 'foo'; cbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- function(x) 'foo'; cbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- function(x0, deparse.level, x1, x2) 'foo'; cbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- function(x0, x1, x2) 'foo'; cbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch#Ignored.ReferenceError# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- length; cbind(v) } *** caught segfault *** address 0x55a900000081, cause 'memory not mapped' Traceback: 1: cbind(v) An irrecoverable exception occurred. R is aborting now ... ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch#Output.IgnoreErrorContext# #{ v <- 1; class(v) <- 'foo'; cbind.foo <- rawToBits; cbind(v) } Error in cbind(deparse.level, ...) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- c('foo1', 'foo2'); cbind.foo1 <- function(...) 'foo1'; cbind(v) } [1] "foo1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- c('foo1', 'foo2'); cbind.foo1 <- function(...) 'foo1'; cbind.foo2 <- function(...) 'foo2'; cbind(v) } [1] "foo1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v <- 1; class(v) <- c('foo1', 'foo2'); cbind.foo2 <- function(...) 'foo2'; cbind(v) } [1] "foo2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v1 <- 1; class(v1) <- 'foo1'; cbind.foo1 <- function(...) 'foo1'; v2 <- 2; class(v2) <- 'foo2'; cbind(v1, v2) } [1] "foo1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v1 <- 1; class(v1) <- 'foo1'; cbind.foo1 <- function(...) 'foo1'; v2 <- 2; class(v2) <- 'foo2'; cbind.foo2 <- function(...) 'foo2'; cbind(v1, v2) } [1] "foo1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testGenericDispatch# #{ v1 <- 1; class(v1) <- 'foo1'; v2 <- 2; class(v2) <- 'foo2'; cbind.foo2 <- function(...) 'foo2'; cbind(v1, v2) } [1] "foo2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(NULL)) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(NULL, NULL, double(0))) structure(numeric(0), .Dim = c(0L, 3L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(NULL, NULL, double(0), character(0))) structure(character(0), .Dim = c(0L, 4L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(NULL, NULL, double(0), integer(0))) structure(numeric(0), .Dim = c(0L, 4L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(NULL, NULL, double(0), integer(0), character(0))) structure(character(0), .Dim = c(0L, 5L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(NULL, NULL, integer(0))) structure(integer(0), .Dim = c(0L, 3L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(NULL, NULL, integer(0), double(0))) structure(numeric(0), .Dim = c(0L, 4L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(NULL, integer(0))) structure(integer(0), .Dim = c(0L, 2L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(c(NULL, NULL), integer(0))) structure(integer(0), .Dim = c(0L, 2L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(integer(0))) structure(integer(0), .Dim = 0:1, .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #dput(cbind(integer(0), NULL, NULL)) structure(integer(0), .Dim = c(0L, 3L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType#Ignored.ImplementationError# #dput(cbind(substitute(graphics::par), list(as.symbol('a')))) structure(list(`::`, graphics, par, a, a, a), .Dim = 3:2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testRetType# #typeof(cbind(substitute(graphics::par), list(as.symbol('a')))) [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testcbind1# #argv <- list(748L, c(5.08759633523238, 4.0943445622221, 5.66642668811243, 3.43398720448515), c(1L, 1L, 1L, 1L), 1L, c(FALSE, TRUE, TRUE, TRUE), c(0, 1, 0, 1), c(0, 1, 1, 1), c(0, 1, 0, 1), c(FALSE, FALSE, TRUE, FALSE), c(FALSE, FALSE, FALSE, TRUE));do.call('cbind', argv) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] 748 5.087596 1 1 0 0 0 0 0 0 [2,] 748 4.094345 1 1 1 1 1 1 0 0 [3,] 748 5.666427 1 1 1 0 1 0 1 0 [4,] 748 3.433987 1 1 1 1 1 1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testcbind2# #argv <- list(structure(c(-0.0296690260968828, 0.200337918547016, -0.38901358729166, 0.076054310915896, -0.5953576286578, 1.55058467328697, -0.189955959788191, -1.31965097077132, 0.596281133731208, 1.22982396127581), .Dim = c(10L, 1L), .Dimnames = list(NULL, 'runif.10...pi.2..pi.2.'), circularp = structure(list(type = 'angles', units = 'radians', template = 'none', modulo = 'asis', zero = 0, rotation = 'counter'), .Names = c('type', 'units', 'template', 'modulo', 'zero', 'rotation')), class = c('circular', 'matrix')), structure(c(-0.0296690260968828, 0.200337918547016, -0.38901358729166, 0.076054310915896, -0.5953576286578, 1.55058467328697, -0.189955959788191, -1.31965097077132, 0.596281133731208, 1.22982396127581), .Dim = c(10L, 1L), .Dimnames = list(NULL, 'runif.10...pi.2..pi.2.'), circularp = structure(list(type = 'angles', units = 'radians', template = 'none', modulo = 'asis', zero = 0, rotation = 'counter'), .Names = c('type', 'units', 'template', 'modulo', 'zero', 'rotation')), class = c('circular', 'matrix')));do.call('cbind', argv) runif.10...pi.2..pi.2. runif.10...pi.2..pi.2. [1,] -0.02966903 -0.02966903 [2,] 0.20033792 0.20033792 [3,] -0.38901359 -0.38901359 [4,] 0.07605431 0.07605431 [5,] -0.59535763 -0.59535763 [6,] 1.55058467 1.55058467 [7,] -0.18995596 -0.18995596 [8,] -1.31965097 -1.31965097 [9,] 0.59628113 0.59628113 [10,] 1.22982396 1.22982396 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testcbind3# #argv <- list(structure(c(3L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 1L, 2L, 2L, 1L, 2L, 3L, 3L, 2L, 2L, 2L, 2L, 4L, 4L, 3L, 1L, 2L, 2L, 1L, 2L, 3L, 1L, 1L, 1L, 4L, 2L, 2L, 2L, 2L, 1L, 1L, 2L, 1L, 3L, 3L, 2L, 2L, 3L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 1L, 4L, 2L, 3L, 2L, 1L, 3L, 2L, 3L, 1L, 2L, 3L, 4L, 2L, 4L, 2L, 3L, 1L, 1L, 3L, 4L, 3L, 1L, 2L, 2L, 1L, 2L, 3L, 1L, 2L, 2L, 2L, 2L, 4L, 2L, 2L, 2L, 3L, 1L, 1L, 1L, 2L, 2L, 4L, 1L, 1L, 1L, 1L, 2L, 4L, 3L, 2L, 3L, 3L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 4L, 2L, 2L, 1L, 3L, 2L, 2L, 1L, 4L, 1L, 3L, 2L, 2L, 3L, 2L, 1L, 2L, 1L, 1L, 2L, 2L, 1L, 2L, 3L, 2L, 1L, 3L, 1L, 3L, 1L, 1L, 1L, 2L, 1L, 2L, 1L, 3L, 1L, 2L, 1L, 2L, 2L, 4L, 2L, 2L, 2L, 2L, 1L, 3L, 1L, 1L, 1L, 2L, 2L, 3L, 2L, 4L, 3L, 3L, 4L, 1L, 3L, 2L, 2L, 4L, 2L, 1L, 2L, 2L, 2L, 3L, 2L, 2L, 1L, 2L, 3L, 2L, 1L, 2L, 2L), .Label = c('1 Extremely well', '2 Quite well', '3 Not too well', '4 Not well at all'), class = 'factor'), structure(c(1L, 2L, 2L, 4L, 2L, 2L, 1L, 2L, 2L, 3L, 2L, 3L, 3L, 1L, 2L, 3L, 3L, 2L, 1L, 4L, 2L, 3L, 1L, 3L, 1L, 4L, 1L, 1L, 3L, 4L, 2L, 1L, 2L, 3L, 2L, 3L, 4L, 4L, 1L, 4L, 3L, 1L, 3L, 3L, 2L, 3L, 2L, 2L, 3L, 1L, 2L, 2L, 2L, 3L, 2L, 1L, 4L, 2L, 3L, 4L, 1L, 3L, 2L, 3L, 1L, 2L, 2L, 4L, 2L, 4L, 2L, 3L, 1L, 1L, 4L, 4L, 3L, 2L, 3L, 2L, 3L, 3L, 3L, 2L, 3L, 2L, 2L, 3L, 4L, 2L, 4L, 2L, 3L, 1L, 1L, 1L, 2L, 3L, 4L, 3L, 2L, 1L, 2L, 1L, 4L, 3L, 1L, 2L, 2L, 2L, 2L, 2L, 3L, 4L, 2L, 3L, 2L, 1L, 3L, 2L, 3L, 3L, 3L, 1L, 2L, 2L, 3L, 2L, 4L, 1L, 3L, 3L, 4L, 3L, 2L, 2L, 3L, 2L, 4L, 4L, 2L, 1L, 4L, 3L, 2L, 4L, 3L, 4L, 2L, 2L, 1L, 2L, 3L, 1L, 2L, 3L, 2L, 1L, 4L, 3L, 2L, 3L, 3L, 2L, 2L, 1L, 4L, 2L, 3L, 2L, 2L, 2L, 4L, 2L, 4L, 2L, 3L, 3L, 4L, 4L, 1L, 3L, 4L, 3L, 4L, 2L, 1L, 2L, 2L, 2L, 2L, 3L, 2L, 2L, 2L, 3L, 3L, 2L, 3L, 2L), .Label = c('1 Extremely well', '2 Quite well', '3 Not too well', '4 Not well at all'), class = 'factor'), structure(c(2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 1L, 2L, 1L, 1L, 3L, 1L, 2L, 1L, 3L, 2L, 2L, 3L, 2L, 2L, 3L, 2L, 1L, 2L, 2L, 3L, 4L, 2L, 2L, 2L, 2L, 3L, 2L, 2L, 2L, 3L, 1L, 2L, 3L, 2L, 1L, 1L, 3L, 2L, 2L, 4L, 2L, 2L, 2L, 4L, 2L, 2L, 2L, 3L, 3L, 3L, 4L, 2L, 1L, 2L, 2L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 2L, 1L, 2L, 3L, 2L, 3L, 2L, 2L, 4L, 3L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 2L, 2L, 2L, 1L, 1L, 1L, 2L, 2L, 4L, 3L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 3L, 2L, 3L, 2L, 2L, 2L, 2L, 1L, 3L, 2L, 2L, 2L, 2L, 3L, 2L, 2L, 1L, 1L, 1L, 2L, 2L, 1L, 2L, 2L, 2L, 3L, 2L, 2L, 3L, 1L, 1L, 4L, 2L, 1L, 2L, 1L, 2L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 3L, 1L, 1L, 2L, 3L, 1L, 3L, 2L, 2L, 2L, 2L, 3L, 2L, 2L, 2L, 2L, 3L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('1 Extremely well', '2 Quite well', '3 Not too well', '4 Not well at all'), class = 'factor'), structure(c(1L, 2L, 2L, 1L, 3L, 2L, 2L, 3L, 2L, 2L, 3L, 2L, 2L, 4L, 1L, 4L, 2L, 4L, 3L, 2L, 3L, 2L, 3L, 1L, 1L, 1L, 3L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 2L, 1L, 1L, 4L, 3L, 1L, 4L, 3L, 1L, 2L, 2L, 2L, 2L, 1L, 1L, 2L, 2L, 3L, 2L, 1L, 3L, 4L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 1L, 2L, 2L, 1L, 3L, 1L, 4L, 2L, 2L, 4L, 2L, 2L, 2L, 3L, 4L, 2L, 2L, 1L, 1L, 3L, 2L, 1L, 2L, 4L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 1L, 1L, 1L, 3L, 3L, 2L, 1L, 1L, 2L, 3L, 1L, 2L, 2L, 3L, 2L, 2L, 3L, 2L, 3L, 3L, 2L, 3L, 2L, 2L, 2L, 3L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 4L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 3L, 3L, 2L, 3L, 2L, 2L, 2L, 2L, 4L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 3L, 2L, 2L, 1L, 3L, 2L, 4L, 3L, 2L, 2L, 1L, 1L, 3L, 2L, 2L, 1L, 2L, 2L, 2L, 3L, 1L, 2L, 2L, 2L, 3L, 2L, 2L, 3L, 2L, 2L, 1L, 2L, 2L, 1L), .Label = c('1 Extremely well', '2 Quite well', '3 Not too well', '4 Not well at all'), class = 'factor'), structure(c(1L, 2L, 3L, 1L, 4L, 3L, 4L, 2L, 2L, 4L, 2L, 2L, 2L, 4L, 2L, 3L, 2L, 4L, 4L, 4L, 3L, 2L, 3L, 3L, 1L, 1L, 3L, 2L, 3L, 2L, 2L, 2L, 2L, 1L, 3L, 2L, 1L, 1L, 4L, 4L, 1L, 1L, 3L, 2L, 4L, 3L, 2L, 3L, 1L, 1L, 3L, 3L, 4L, 2L, 1L, 4L, 4L, 4L, 2L, 3L, 2L, 2L, 3L, 2L, 4L, 3L, 1L, 2L, 3L, 1L, 3L, 2L, 3L, 4L, 2L, 4L, 2L, 3L, 3L, 3L, 4L, 1L, 2L, 2L, 2L, 4L, 2L, 3L, 2L, 4L, 2L, 2L, 2L, 3L, 3L, 3L, 1L, 3L, 2L, 2L, 3L, 4L, 4L, 3L, 2L, 1L, 3L, 2L, 2L, 2L, 3L, 1L, 2L, 2L, 2L, 2L, 4L, 3L, 3L, 3L, 2L, 4L, 2L, 3L, 2L, 2L, 3L, 3L, 3L, 3L, 2L, 3L, 2L, 2L, 3L, 3L, 2L, 2L, 4L, 3L, 3L, 3L, 3L, 2L, 3L, 2L, 2L, 2L, 3L, 4L, 3L, 2L, 2L, 3L, 2L, 1L, 4L, 3L, 2L, 1L, 3L, 3L, 3L, 3L, 2L, 1L, 3L, 2L, 2L, 4L, 3L, 4L, 4L, 3L, 2L, 2L, 1L, 2L, 3L, 2L, 3L, 2L, 2L, 3L, 3L, 4L, 3L, 3L, 2L, 4L, 4L, 2L, 2L, 4L, 3L, 1L, 2L, 2L, 2L, 2L), .Label = c('1 Extremely well', '2 Quite well', '3 Not too well', '4 Not well at all'), class = 'factor'), structure(c(2L, 2L, 2L, 2L, 4L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 2L, 2L, 2L, 4L, 2L, 4L, 3L, 2L, 3L, 2L, 1L, 1L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 3L, 3L, 2L, 4L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 3L, 4L, 1L, 2L, 1L, 2L, 4L, 4L, 2L, 1L, 2L, 2L, 2L, 1L, 2L, 2L, 1L, 2L, 2L, 1L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 4L, 2L, 3L, 2L, 2L, 3L, 2L, 2L, 2L, 4L, 2L, 2L, 2L, 2L, 3L, 2L, 1L, 2L, 1L, 1L, 2L, 2L, 3L, 2L, 2L, 1L, 3L, 3L, 2L, 3L, 2L, 1L, 2L, 3L, 3L, 2L, 2L, 4L, 2L, 4L, 3L, 3L, 3L, 3L, 2L, 2L, 3L, 2L, 3L, 2L, 3L, 2L, 1L, 2L, 3L, 3L, 1L, 2L, 2L, 2L, 2L, 3L, 1L, 2L, 3L, 1L, 2L, 2L, 2L, 4L, 1L, 2L, 2L, 3L, 2L, 2L, 3L, 4L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 3L, 2L, 2L, 4L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 3L, 3L, 2L, 2L, 2L, 3L, 3L, 2L, 2L, 2L, 3L, 2L, 2L, 2L, 2L, 2L), .Label = c('1 Extremely well', '2 Quite well', '3 Not too well', '4 Not well at all'), class = 'factor'));do.call('cbind', argv) [,1] [,2] [,3] [,4] [,5] [,6] [1,] 3 1 2 1 1 2 [2,] 1 2 2 2 2 2 [3,] 2 2 2 2 3 2 [4,] 2 4 2 1 1 2 [5,] 2 2 2 3 4 4 [6,] 2 2 2 2 3 2 [7,] 1 1 1 2 4 2 [8,] 2 2 2 3 2 2 [9,] 2 2 2 2 2 2 [10,] 2 3 2 2 4 2 [11,] 1 2 2 3 2 2 [12,] 2 3 2 2 2 2 [13,] 2 3 2 2 2 3 [14,] 1 1 1 4 4 3 [15,] 2 2 2 1 2 2 [16,] 3 3 2 4 3 2 [17,] 3 3 2 2 2 2 [18,] 2 2 1 4 4 4 [19,] 2 1 2 3 4 2 [20,] 2 4 1 2 4 4 [21,] 2 2 1 3 3 3 [22,] 4 3 3 2 2 2 [23,] 4 1 1 3 3 3 [24,] 3 3 2 1 3 2 [25,] 1 1 1 1 1 1 [26,] 2 4 3 1 1 1 [27,] 2 1 2 3 3 2 [28,] 1 1 2 1 2 2 [29,] 2 3 3 2 3 2 [30,] 3 4 2 2 2 1 [31,] 1 2 2 2 2 2 [32,] 1 1 3 2 2 2 [33,] 1 2 2 2 2 2 [34,] 4 3 1 2 1 2 [35,] 2 2 2 3 3 2 [36,] 2 3 2 2 2 2 [37,] 2 4 3 1 1 1 [38,] 2 4 4 1 1 1 [39,] 1 1 2 4 4 3 [40,] 1 4 2 3 4 3 [41,] 2 3 2 1 1 2 [42,] 1 1 2 4 1 4 [43,] 3 3 3 3 3 2 [44,] 3 3 2 1 2 2 [45,] 2 2 2 2 4 2 [46,] 2 3 2 2 3 2 [47,] 3 2 3 2 2 2 [48,] 2 2 1 2 3 2 [49,] 2 3 2 1 1 1 [50,] 1 1 3 1 1 1 [51,] 2 2 2 2 3 3 [52,] 2 2 1 2 3 4 [53,] 2 2 1 3 4 1 [54,] 2 3 3 2 2 2 [55,] 1 2 2 1 1 1 [56,] 1 1 2 3 4 2 [57,] 4 4 4 4 4 4 [58,] 2 2 2 2 4 4 [59,] 3 3 2 1 2 2 [60,] 2 4 2 2 3 1 [61,] 1 1 4 2 2 2 [62,] 3 3 2 2 2 2 [63,] 2 2 2 2 3 2 [64,] 3 3 2 1 2 1 [65,] 1 1 3 2 4 2 [66,] 2 2 3 2 3 2 [67,] 3 2 3 1 1 1 [68,] 4 4 4 2 2 2 [69,] 2 2 2 2 3 2 [70,] 4 4 1 1 1 1 [71,] 2 2 2 3 3 1 [72,] 3 3 2 1 2 2 [73,] 1 1 1 4 3 1 [74,] 1 1 1 2 4 2 [75,] 3 4 1 2 2 2 [76,] 4 4 2 4 4 2 [77,] 3 3 2 2 2 2 [78,] 1 2 1 2 3 2 [79,] 2 3 1 2 3 2 [80,] 2 2 2 3 3 2 [81,] 1 3 1 4 4 4 [82,] 2 3 2 2 1 2 [83,] 3 3 3 2 2 3 [84,] 1 2 2 1 2 2 [85,] 2 3 3 1 2 2 [86,] 2 2 2 3 4 3 [87,] 2 2 2 2 2 2 [88,] 2 3 4 1 3 2 [89,] 4 4 3 2 2 2 [90,] 2 2 2 4 4 4 [91,] 2 4 2 2 2 2 [92,] 2 2 2 1 2 2 [93,] 3 3 2 2 2 2 [94,] 1 1 1 2 3 2 [95,] 1 1 1 2 3 3 [96,] 1 1 1 2 3 2 [97,] 2 2 2 1 1 1 [98,] 2 3 2 2 3 2 [99,] 4 4 2 1 2 1 [100,] 1 3 1 1 2 1 [101,] 1 2 1 1 3 2 [102,] 1 1 1 3 4 2 [103,] 1 2 2 3 4 3 [104,] 2 1 2 2 3 2 [105,] 4 4 4 1 2 2 [106,] 3 3 3 1 1 1 [107,] 2 1 1 2 3 3 [108,] 3 2 2 3 2 3 [109,] 3 2 2 1 2 2 [110,] 2 2 2 2 2 3 [111,] 2 2 2 2 3 2 [112,] 2 2 2 3 1 1 [113,] 2 3 2 2 2 2 [114,] 2 4 2 2 2 3 [115,] 1 2 2 3 2 3 [116,] 2 3 2 2 2 2 [117,] 2 2 2 3 4 2 [118,] 2 1 1 3 3 4 [119,] 2 3 2 2 3 2 [120,] 2 2 2 3 3 4 [121,] 4 3 3 2 2 3 [122,] 2 3 2 2 4 3 [123,] 2 3 3 2 2 3 [124,] 1 1 2 3 3 3 [125,] 3 2 2 2 2 2 [126,] 2 2 2 2 2 2 [127,] 2 3 2 2 3 3 [128,] 1 2 1 2 3 2 [129,] 4 4 3 1 3 3 [130,] 1 1 2 2 3 2 [131,] 3 3 2 2 2 3 [132,] 2 3 2 2 3 2 [133,] 2 4 2 2 2 1 [134,] 3 3 3 2 2 2 [135,] 2 2 2 2 3 3 [136,] 1 2 2 2 3 3 [137,] 2 3 1 2 2 1 [138,] 1 2 1 1 2 2 [139,] 1 4 1 2 4 2 [140,] 2 4 2 4 3 2 [141,] 2 2 2 2 3 2 [142,] 1 1 1 2 3 3 [143,] 2 4 2 2 3 1 [144,] 3 3 2 2 2 2 [145,] 2 2 2 2 3 3 [146,] 1 4 3 2 2 1 [147,] 3 3 2 2 2 2 [148,] 1 4 2 1 2 2 [149,] 3 2 3 3 3 2 [150,] 1 2 1 3 4 4 [151,] 1 1 1 2 3 1 [152,] 1 2 4 3 2 2 [153,] 2 3 2 2 2 2 [154,] 1 1 1 2 3 3 [155,] 2 2 2 2 2 2 [156,] 1 3 1 2 1 2 [157,] 3 2 2 4 4 3 [158,] 1 1 1 2 3 4 [159,] 2 4 1 2 2 1 [160,] 1 3 2 1 1 1 [161,] 2 2 2 2 3 2 [162,] 2 3 2 2 3 2 [163,] 4 3 2 2 3 2 [164,] 2 2 2 2 3 2 [165,] 2 2 2 2 2 2 [166,] 2 1 1 1 1 1 [167,] 2 4 2 3 3 2 [168,] 1 2 2 2 2 2 [169,] 3 3 3 2 2 2 [170,] 1 2 1 1 4 2 [171,] 1 2 1 3 3 3 [172,] 1 2 2 2 4 2 [173,] 2 4 3 4 4 2 [174,] 2 2 1 3 3 4 [175,] 3 4 3 2 2 2 [176,] 2 2 2 2 2 2 [177,] 4 3 2 1 1 2 [178,] 3 3 2 1 2 2 [179,] 3 4 2 3 3 2 [180,] 4 4 3 2 2 2 [181,] 1 1 2 2 3 2 [182,] 3 3 2 1 2 1 [183,] 2 4 2 2 2 2 [184,] 2 3 2 2 3 2 [185,] 4 4 3 2 3 3 [186,] 2 2 2 3 4 3 [187,] 1 1 1 1 3 2 [188,] 2 2 2 2 3 2 [189,] 2 2 2 2 2 2 [190,] 2 2 2 2 4 3 [191,] 3 2 2 3 4 3 [192,] 2 3 2 2 2 2 [193,] 2 2 2 2 2 2 [194,] 1 2 2 3 4 2 [195,] 2 2 2 2 3 3 [196,] 3 3 2 2 1 2 [197,] 2 3 2 1 2 2 [198,] 1 2 2 2 2 2 [199,] 2 3 2 2 2 2 [200,] 2 2 2 1 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testcbind4#Ignored.OutputFormatting# #argv <- list(structure(list(Sepal.Length = c(5.1, 4.9, 4.7, 4.6, 5, 5.4, 4.6, 5, 4.4, 4.9, 5.4, 4.8, 4.8, 4.3, 5.8, 5.7, 5.4, 5.1, 5.7, 5.1, 5.4, 5.1, 4.6, 5.1, 4.8, 5, 5, 5.2, 5.2, 4.7, 4.8, 5.4, 5.2, 5.5, 4.9, 5, 5.5, 4.9, 4.4, 5.1, 5, 4.5, 4.4, 5, 5.1, 4.8, 5.1, 4.6, 5.3, 5, 7, 6.4, 6.9, 5.5, 6.5, 5.7, 6.3, 4.9, 6.6, 5.2, 5, 5.9, 6, 6.1, 5.6, 6.7, 5.6, 5.8, 6.2, 5.6, 5.9, 6.1, 6.3, 6.1, 6.4, 6.6, 6.8, 6.7, 6, 5.7, 5.5, 5.5, 5.8, 6, 5.4, 6, 6.7, 6.3, 5.6, 5.5, 5.5, 6.1, 5.8, 5, 5.6, 5.7, 5.7, 6.2, 5.1, 5.7, 6.3, 5.8, 7.1, 6.3, 6.5, 7.6, 4.9, 7.3, 6.7, 7.2, 6.5, 6.4, 6.8, 5.7, 5.8, 6.4, 6.5, 7.7, 7.7, 6, 6.9, 5.6, 7.7, 6.3, 6.7, 7.2, 6.2, 6.1, 6.4, 7.2, 7.4, 7.9, 6.4, 6.3, 6.1, 7.7, 6.3, 6.4, 6, 6.9, 6.7, 6.9, 5.8, 6.8, 6.7, 6.7, 6.3, 6.5, 6.2, 5.9), Sepal.Width = c(4, 3, 3, 3, 4, 4, 3, 3, 3, 3, 4, 3, 3, 3, 4, 4, 4, 4, 4, 4, 3, 4, 4, 3, 3, 3, 3, 4, 3, 3, 3, 3, 4, 4, 3, 3, 4, 4, 3, 3, 4, 2, 3, 4, 4, 3, 4, 3, 4, 3, 3, 3, 3, 2, 3, 3, 3, 2, 3, 3, 2, 3, 2, 3, 3, 3, 3, 3, 2, 2, 3, 3, 2, 3, 3, 3, 3, 3, 3, 3, 2, 2, 3, 3, 3, 3, 3, 2, 3, 2, 3, 3, 3, 2, 3, 3, 3, 3, 2, 3, 3, 3, 3, 3, 3, 3, 2, 3, 2, 4, 3, 3, 3, 2, 3, 3, 3, 4, 3, 2, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 4, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 2, 3, 3, 3), Petal.Length = c(1.4, 1.4, 1.3, 1.5, 1.4, 1.7, 1.4, 1.5, 1.4, 1.5, 1.5, 1.6, 1.4, 1.1, 1.2, 1.5, 1.3, 1.4, 1.7, 1.5, 1.7, 1.5, 1, 1.7, 1.9, 1.6, 1.6, 1.5, 1.4, 1.6, 1.6, 1.5, 1.5, 1.4, 1.5, 1.2, 1.3, 1.4, 1.3, 1.5, 1.3, 1.3, 1.3, 1.6, 1.9, 1.4, 1.6, 1.4, 1.5, 1.4, 4.7, 4.5, 4.9, 4, 4.6, 4.5, 4.7, 3.3, 4.6, 3.9, 3.5, 4.2, 4, 4.7, 3.6, 4.4, 4.5, 4.1, 4.5, 3.9, 4.8, 4, 4.9, 4.7, 4.3, 4.4, 4.8, 5, 4.5, 3.5, 3.8, 3.7, 3.9, 5.1, 4.5, 4.5, 4.7, 4.4, 4.1, 4, 4.4, 4.6, 4, 3.3, 4.2, 4.2, 4.2, 4.3, 3, 4.1, 6, 5.1, 5.9, 5.6, 5.8, 6.6, 4.5, 6.3, 5.8, 6.1, 5.1, 5.3, 5.5, 5, 5.1, 5.3, 5.5, 6.7, 6.9, 5, 5.7, 4.9, 6.7, 4.9, 5.7, 6, 4.8, 4.9, 5.6, 5.8, 6.1, 6.4, 5.6, 5.1, 5.6, 6.1, 5.6, 5.5, 4.8, 5.4, 5.6, 5.1, 5.1, 5.9, 5.7, 5.2, 5, 5.2, 5.4, 5.1), Petal.Width = c(0.2, 0.2, 0.2, 0.2, 0.2, 0.4, 0.3, 0.2, 0.2, 0.1, 0.2, 0.2, 0.1, 0.1, 0.2, 0.4, 0.4, 0.3, 0.3, 0.3, 0.2, 0.4, 0.2, 0.5, 0.2, 0.2, 0.4, 0.2, 0.2, 0.2, 0.2, 0.4, 0.1, 0.2, 0.2, 0.2, 0.2, 0.1, 0.2, 0.2, 0.3, 0.3, 0.2, 0.6, 0.4, 0.3, 0.2, 0.2, 0.2, 0.2, 1.4, 1.5, 1.5, 1.3, 1.5, 1.3, 1.6, 1, 1.3, 1.4, 1, 1.5, 1, 1.4, 1.3, 1.4, 1.5, 1, 1.5, 1.1, 1.8, 1.3, 1.5, 1.2, 1.3, 1.4, 1.4, 1.7, 1.5, 1, 1.1, 1, 1.2, 1.6, 1.5, 1.6, 1.5, 1.3, 1.3, 1.3, 1.2, 1.4, 1.2, 1, 1.3, 1.2, 1.3, 1.3, 1.1, 1.3, 2.5, 1.9, 2.1, 1.8, 2.2, 2.1, 1.7, 1.8, 1.8, 2.5, 2, 1.9, 2.1, 2, 2.4, 2.3, 1.8, 2.2, 2.3, 1.5, 2.3, 2, 2, 1.8, 2.1, 1.8, 1.8, 1.8, 2.1, 1.6, 1.9, 2, 2.2, 1.5, 1.4, 2.3, 2.4, 1.8, 1.8, 2.1, 2.4, 2.3, 1.9, 2.3, 2.5, 2.3, 1.9, 2, 2.3, 1.8), Species = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('setosa', 'versicolor', 'virginica'), class = 'factor')), .Names = c('Sepal.Length', 'Sepal.Width', 'Petal.Length', 'Petal.Width', 'Species'), row.names = c(NA, -150L), class = 'data.frame'), structure(c(3, 2, 2, 2, 3, 3, 2, 2, 2, 2, 3, 2, 2, 2, 3, 3, 3, 3, 3, 3, 2, 3, 3, 2, 2, 2, 2, 3, 2, 2, 2, 2, 3, 3, 2, 2, 3, 3, 2, 2, 3, 1, 2, 3, 3, 2, 3, 2, 3, 2, 2, 2, 2, 1, 2, 2, 2, 1, 2, 2, 1, 2, 1, 2, 2, 2, 2, 2, 1, 1, 2, 2, 1, 2, 2, 2, 2, 2, 2, 2, 1, 1, 2, 2, 2, 2, 2, 1, 2, 1, 2, 2, 2, 1, 2, 2, 2, 2, 1, 2, 2, 2, 2, 2, 2, 2, 1, 2, 1, 3, 2, 2, 2, 1, 2, 2, 2, 3, 2, 1, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 3, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 1, 2, 2, 2), .Names = c('4', '3', '3', '3', '4', '4', '3', '3', '3', '3', '4', '3', '3', '3', '4', '4', '4', '4', '4', '4', '3', '4', '4', '3', '3', '3', '3', '4', '3', '3', '3', '3', '4', '4', '3', '3', '4', '4', '3', '3', '4', '2', '3', '4', '4', '3', '4', '3', '4', '3', '3', '3', '3', '2', '3', '3', '3', '2', '3', '3', '2', '3', '2', '3', '3', '3', '3', '3', '2', '2', '3', '3', '2', '3', '3', '3', '3', '3', '3', '3', '2', '2', '3', '3', '3', '3', '3', '2', '3', '2', '3', '3', '3', '2', '3', '3', '3', '3', '2', '3', '3', '3', '3', '3', '3', '3', '2', '3', '2', '4', '3', '3', '3', '2', '3', '3', '3', '4', '3', '2', '3', '3', '3', '3', '3', '3', '3', '3', '3', '3', '3', '4', '3', '3', '3', '3', '3', '3', '3', '3', '3', '3', '3', '3', '3', '3', '2', '3', '3', '3')));do.call('cbind', argv) Sepal.Length Sepal.Width Petal.Length Petal.Width Species 1 5.1 4 1.4 0.2 setosa 2 4.9 3 1.4 0.2 setosa 3 4.7 3 1.3 0.2 setosa 4 4.6 3 1.5 0.2 setosa 5 5.0 4 1.4 0.2 setosa 6 5.4 4 1.7 0.4 setosa 7 4.6 3 1.4 0.3 setosa 8 5.0 3 1.5 0.2 setosa 9 4.4 3 1.4 0.2 setosa 10 4.9 3 1.5 0.1 setosa 11 5.4 4 1.5 0.2 setosa 12 4.8 3 1.6 0.2 setosa 13 4.8 3 1.4 0.1 setosa 14 4.3 3 1.1 0.1 setosa 15 5.8 4 1.2 0.2 setosa 16 5.7 4 1.5 0.4 setosa 17 5.4 4 1.3 0.4 setosa 18 5.1 4 1.4 0.3 setosa 19 5.7 4 1.7 0.3 setosa 20 5.1 4 1.5 0.3 setosa 21 5.4 3 1.7 0.2 setosa 22 5.1 4 1.5 0.4 setosa 23 4.6 4 1.0 0.2 setosa 24 5.1 3 1.7 0.5 setosa 25 4.8 3 1.9 0.2 setosa 26 5.0 3 1.6 0.2 setosa 27 5.0 3 1.6 0.4 setosa 28 5.2 4 1.5 0.2 setosa 29 5.2 3 1.4 0.2 setosa 30 4.7 3 1.6 0.2 setosa 31 4.8 3 1.6 0.2 setosa 32 5.4 3 1.5 0.4 setosa 33 5.2 4 1.5 0.1 setosa 34 5.5 4 1.4 0.2 setosa 35 4.9 3 1.5 0.2 setosa 36 5.0 3 1.2 0.2 setosa 37 5.5 4 1.3 0.2 setosa 38 4.9 4 1.4 0.1 setosa 39 4.4 3 1.3 0.2 setosa 40 5.1 3 1.5 0.2 setosa 41 5.0 4 1.3 0.3 setosa 42 4.5 2 1.3 0.3 setosa 43 4.4 3 1.3 0.2 setosa 44 5.0 4 1.6 0.6 setosa 45 5.1 4 1.9 0.4 setosa 46 4.8 3 1.4 0.3 setosa 47 5.1 4 1.6 0.2 setosa 48 4.6 3 1.4 0.2 setosa 49 5.3 4 1.5 0.2 setosa 50 5.0 3 1.4 0.2 setosa 51 7.0 3 4.7 1.4 versicolor 52 6.4 3 4.5 1.5 versicolor 53 6.9 3 4.9 1.5 versicolor 54 5.5 2 4.0 1.3 versicolor 55 6.5 3 4.6 1.5 versicolor 56 5.7 3 4.5 1.3 versicolor 57 6.3 3 4.7 1.6 versicolor 58 4.9 2 3.3 1.0 versicolor 59 6.6 3 4.6 1.3 versicolor 60 5.2 3 3.9 1.4 versicolor 61 5.0 2 3.5 1.0 versicolor 62 5.9 3 4.2 1.5 versicolor 63 6.0 2 4.0 1.0 versicolor 64 6.1 3 4.7 1.4 versicolor 65 5.6 3 3.6 1.3 versicolor 66 6.7 3 4.4 1.4 versicolor 67 5.6 3 4.5 1.5 versicolor 68 5.8 3 4.1 1.0 versicolor 69 6.2 2 4.5 1.5 versicolor 70 5.6 2 3.9 1.1 versicolor 71 5.9 3 4.8 1.8 versicolor 72 6.1 3 4.0 1.3 versicolor 73 6.3 2 4.9 1.5 versicolor 74 6.1 3 4.7 1.2 versicolor 75 6.4 3 4.3 1.3 versicolor 76 6.6 3 4.4 1.4 versicolor 77 6.8 3 4.8 1.4 versicolor 78 6.7 3 5.0 1.7 versicolor 79 6.0 3 4.5 1.5 versicolor 80 5.7 3 3.5 1.0 versicolor 81 5.5 2 3.8 1.1 versicolor 82 5.5 2 3.7 1.0 versicolor 83 5.8 3 3.9 1.2 versicolor 84 6.0 3 5.1 1.6 versicolor 85 5.4 3 4.5 1.5 versicolor 86 6.0 3 4.5 1.6 versicolor 87 6.7 3 4.7 1.5 versicolor 88 6.3 2 4.4 1.3 versicolor 89 5.6 3 4.1 1.3 versicolor 90 5.5 2 4.0 1.3 versicolor 91 5.5 3 4.4 1.2 versicolor 92 6.1 3 4.6 1.4 versicolor 93 5.8 3 4.0 1.2 versicolor 94 5.0 2 3.3 1.0 versicolor 95 5.6 3 4.2 1.3 versicolor 96 5.7 3 4.2 1.2 versicolor 97 5.7 3 4.2 1.3 versicolor 98 6.2 3 4.3 1.3 versicolor 99 5.1 2 3.0 1.1 versicolor 100 5.7 3 4.1 1.3 versicolor 101 6.3 3 6.0 2.5 virginica 102 5.8 3 5.1 1.9 virginica 103 7.1 3 5.9 2.1 virginica 104 6.3 3 5.6 1.8 virginica 105 6.5 3 5.8 2.2 virginica 106 7.6 3 6.6 2.1 virginica 107 4.9 2 4.5 1.7 virginica 108 7.3 3 6.3 1.8 virginica 109 6.7 2 5.8 1.8 virginica 110 7.2 4 6.1 2.5 virginica 111 6.5 3 5.1 2.0 virginica 112 6.4 3 5.3 1.9 virginica 113 6.8 3 5.5 2.1 virginica 114 5.7 2 5.0 2.0 virginica 115 5.8 3 5.1 2.4 virginica 116 6.4 3 5.3 2.3 virginica 117 6.5 3 5.5 1.8 virginica 118 7.7 4 6.7 2.2 virginica 119 7.7 3 6.9 2.3 virginica 120 6.0 2 5.0 1.5 virginica 121 6.9 3 5.7 2.3 virginica 122 5.6 3 4.9 2.0 virginica 123 7.7 3 6.7 2.0 virginica 124 6.3 3 4.9 1.8 virginica 125 6.7 3 5.7 2.1 virginica 126 7.2 3 6.0 1.8 virginica 127 6.2 3 4.8 1.8 virginica 128 6.1 3 4.9 1.8 virginica 129 6.4 3 5.6 2.1 virginica 130 7.2 3 5.8 1.6 virginica 131 7.4 3 6.1 1.9 virginica 132 7.9 4 6.4 2.0 virginica 133 6.4 3 5.6 2.2 virginica 134 6.3 3 5.1 1.5 virginica 135 6.1 3 5.6 1.4 virginica 136 7.7 3 6.1 2.3 virginica 137 6.3 3 5.6 2.4 virginica 138 6.4 3 5.5 1.8 virginica 139 6.0 3 4.8 1.8 virginica 140 6.9 3 5.4 2.1 virginica 141 6.7 3 5.6 2.4 virginica 142 6.9 3 5.1 2.3 virginica 143 5.8 3 5.1 1.9 virginica 144 6.8 3 5.9 2.3 virginica 145 6.7 3 5.7 2.5 virginica 146 6.7 3 5.2 2.3 virginica 147 6.3 2 5.0 1.9 virginica 148 6.5 3 5.2 2.0 virginica 149 6.2 3 5.4 2.3 virginica 150 5.9 3 5.1 1.8 virginica c("4" = 3, "3" = 2, "3" = 2, "3" = 2, "4" = 3, "4" = 3, "3" = 2, 1 3 2 2 3 2 4 2 5 3 6 3 7 2 8 2 9 2 10 2 11 3 12 2 13 2 14 2 15 3 16 3 17 3 18 3 19 3 20 3 21 2 22 3 23 3 24 2 25 2 26 2 27 2 28 3 29 2 30 2 31 2 32 2 33 3 34 3 35 2 36 2 37 3 38 3 39 2 40 2 41 3 42 1 43 2 44 3 45 3 46 2 47 3 48 2 49 3 50 2 51 2 52 2 53 2 54 1 55 2 56 2 57 2 58 1 59 2 60 2 61 1 62 2 63 1 64 2 65 2 66 2 67 2 68 2 69 1 70 1 71 2 72 2 73 1 74 2 75 2 76 2 77 2 78 2 79 2 80 2 81 1 82 1 83 2 84 2 85 2 86 2 87 2 88 1 89 2 90 1 91 2 92 2 93 2 94 1 95 2 96 2 97 2 98 2 99 1 100 2 101 2 102 2 103 2 104 2 105 2 106 2 107 1 108 2 109 1 110 3 111 2 112 2 113 2 114 1 115 2 116 2 117 2 118 3 119 2 120 1 121 2 122 2 123 2 124 2 125 2 126 2 127 2 128 2 129 2 130 2 131 2 132 3 133 2 134 2 135 2 136 2 137 2 138 2 139 2 140 2 141 2 142 2 143 2 144 2 145 2 146 2 147 1 148 2 149 2 150 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testcbind5# #argv <- list(structure(c(1, 223, 312, 712, 889, 1201, 1467), .Names = c('', '1th break', '2th break', '3th break', '4th break', '5th break', '6th break')), structure(c(222, 311, 711, 888, 1200, 1466, 1600), .Names = c('1th break', '2th break', '3th break', '4th break', '5th break', '6th break', '7th break')));do.call('cbind', argv) [,1] [,2] 1 222 1th break 223 311 2th break 312 711 3th break 712 888 4th break 889 1200 5th break 1201 1466 6th break 1467 1600 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testcbind6# #cbind2(3, 4) [,1] [,2] [1,] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cbind.testcbind6# #cbind2(matrix(1:10, 2, 2), matrix(11:20, 2, 2)) [,1] [,2] [,3] [,4] [1,] 1 3 11 13 [2,] 2 4 12 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testCeiling# #if (!any(R.version$engine == "FastR")) { 2+2i } else { { ceiling(1.1+1.9i); } } [1] 2+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testCeiling# #{ ceiling("aaa"); } Error in ceiling("aaa") : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testCeiling# #{ ceiling(c(0.2,-3.4,NA,0/0,1/0)) } [1] 1 -3 NA NaN Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testCeiling# #{ typeof(ceiling(42L)); } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testCeiling# #{ typeof(ceiling(TRUE)); } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testceiling1# #argv <- list(1001);ceiling(argv[[1]]); [1] 1001 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testceiling2# #argv <- list(13990.84);ceiling(argv[[1]]); [1] 13991 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testceiling3# #argv <- list(c(1, 4.5, 8, 11.5, 15));ceiling(argv[[1]]); [1] 1 5 8 12 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testceiling4# #argv <- list(c(1, 5.5, 10.5, 15.5, 20));ceiling(argv[[1]]); [1] 1 6 11 16 20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testceiling5# #argv <- list(-0.698970004336019);ceiling(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testceiling6# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));ceiling(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testceiling7# #argv <- list(1e+05);ceiling(argv[[1]]); [1] 1e+05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ceiling.testceiling9# #argv <- list(c(-2, -1.5, -1, -0.5, 0, 0.5, 1, 1.5, 2, 2.5, 3, 3.5, 4));do.call('ceiling', argv) [1] -2 -1 -1 0 0 1 1 2 2 3 3 4 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charToRaw.testcharToRaw1# #argv <- list(''); .Internal(charToRaw(argv[[1]])) raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_character.testcharacter1# #argv <- structure(list(length = 0L), .Names = 'length');do.call('character', argv) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch("", "")} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch("abc", "deeee")} [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch("abc", "deeee",c("3","4"))} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch("abc", "deeeec",c("3","4"))} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch("m", c("mean", "median", "mode"))} [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch("med", c("mean", "median", "mode"))} [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch('hello', c(''))} [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch(c("ole","ab"),c("ole","ab"))} [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch(c("ole","ab"),c("ole","ole"))} [1] 0 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch(c('', 'hello', '[', 'foo', '{', '(', ''), c('[', '(', '{', ''), nomatch = NA)} [1] 4 NA 1 NA 3 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch(matrix(c('h','l','e',6),2,2,byrow=T), "hello")} [1] 1 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch(matrix(c('h',3,'e',6),2,2,byrow=T), "hello")} [1] 1 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testCharMatch# #{charmatch(matrix(c(9,3,1,6),2,2,byrow=T), "hello")} [1] NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testcharmatch1# #argv <- list(c('x', 'y', 'z'), c('row.names', 'x', 'y', 'z'), 0L); .Internal(charmatch(argv[[1]], argv[[2]], argv[[3]])) [1] 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testcharmatch2# #argv <- list(character(0), c('row.names', 'height', 'weight'), 0L); .Internal(charmatch(argv[[1]], argv[[2]], argv[[3]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testcharmatch3# #argv <- list('package:methods', c('.GlobalEnv', 'CheckExEnv', 'package:stats', 'package:graphics', 'package:grDevices', 'package:utils', 'package:datasets', 'package:methods', 'Autoloads', 'package:base'), NA_integer_); .Internal(charmatch(argv[[1]], argv[[2]], argv[[3]])) [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testcharmatch4# #argv <- list('package:methods', c('.GlobalEnv', 'package:graphics', 'package:stats', 'Autoloads', 'package:base'), NA_integer_); .Internal(charmatch(argv[[1]], argv[[2]], argv[[3]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testcharmatch5# #argv <- list(c('0', '1'), c('0', '1'), 0); .Internal(charmatch(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testcharmatch6# #argv <- list(c('m', 'f'), c('male', 'female'), NA_integer_); .Internal(charmatch(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testcharmatch7# #argv <- list('me', c('mean', 'median', 'mode'), NA_integer_); .Internal(charmatch(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_charmatch.testcharmatch8# #argv <- list(character(0), c('semiTransparency', 'transparentBackground', 'rasterImage', 'capture', 'locator', 'events'), 0L); .Internal(charmatch(argv[[1]], argv[[2]], argv[[3]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.testchartr1# #argv <- list('.', '.', c('0.02', '0.06', '0.11', '0.22', '0.56', '1.1')); .Internal(chartr(argv[[1]], argv[[2]], argv[[3]])) [1] "0.02" "0.06" "0.11" "0.22" "0.56" "1.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.testchartr2# #argv <- list('iXs', 'why', 'MiXeD cAsE 123'); .Internal(chartr(argv[[1]], argv[[2]], argv[[3]])) [1] "MwheD cAyE 123" ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.testchartr3# #argv <- list('a-cX', 'D-Fw', 'MiXeD cAsE 123'); .Internal(chartr(argv[[1]], argv[[2]], argv[[3]])) [1] "MiweD FAsE 123" ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.testchartr4# #argv <- list('.', '.', character(0)); .Internal(chartr(argv[[1]], argv[[2]], argv[[3]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.testchartr6# #argv <- structure(list(old = 'NA', new = 'na', x = c('NA', NA, 'BANANA')), .Names = c('old', 'new', 'x'));do.call('chartr', argv) [1] "na" NA "Banana" ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.tests# #chartr('0-5', '0-', 'ah3g4t') Error in chartr("0-5", "0-", "ah3g4t") : 'old' is longer than 'new' ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.tests# #chartr('0-5', '0-3', 'ah3g4t') Error in chartr("0-5", "0-3", "ah3g4t") : 'old' is longer than 'new' ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.tests# #chartr('0-5', '045', 'ah3g4t') Error in chartr("0-5", "045", "ah3g4t") : 'old' is longer than 'new' ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.tests# #chartr(c('a','b'), c('c', 'e'), c('abc', 'efb')) [1] "cbc" "efb" Warning messages: 1: In chartr(c("a", "b"), c("c", "e"), c("abc", "efb")) : argument 'old' has length > 1 and only the first element will be used 2: In chartr(c("a", "b"), c("c", "e"), c("abc", "efb")) : argument 'new' has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.tests# #chartr(c('a','b'), c(3, 2), c('abc', 'efb')) Error in chartr(c("a", "b"), c(3, 2), c("abc", "efb")) : invalid 'new' argument In addition: Warning message: In chartr(c("a", "b"), c(3, 2), c("abc", "efb")) : argument 'old' has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.tests# #chartr(c('abq'), 'cd', c('agbc', 'efb')) Error in chartr(c("abq"), "cd", c("agbc", "efb")) : 'old' is longer than 'new' ##com.oracle.truffle.r.test.builtins.TestBuiltin_chartr.tests# #chartr(c(3, 2), c('q', 'c'), c('abc', 'efb')) Error in chartr(c(3, 2), c("q", "c"), c("abc", "efb")) : invalid 'old' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_chol.testChol# #chol(matrix(c(4,2,2,3), ncol=2), pivot=TRUE) [,1] [,2] [1,] 2 1.000000 [2,] 0 1.414214 attr(,"pivot") [1] 1 2 attr(,"rank") [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_chol.testChol# #{ chol(1) } [,1] [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_chol.testChol#Output.IgnoreErrorMessage# #{ m <- matrix(c(5,-5,-5,3),2,2) ; chol(m) } Error in chol.default(m) : the leading minor of order 2 is not positive definite ##com.oracle.truffle.r.test.builtins.TestBuiltin_chol.testChol# #{ m <- matrix(c(5,1,1,3),2) ; round( chol(m), digits=5 ) } [,1] [,2] [1,] 2.23607 0.44721 [2,] 0.00000 1.67332 ##com.oracle.truffle.r.test.builtins.TestBuiltin_chol.testChol# #{ round( chol(10), digits=5) } [,1] [1,] 3.16228 ##com.oracle.truffle.r.test.builtins.TestBuiltin_chol.testchol1# #argv <- structure(list(x = structure(c(1.66666666666667, -1.33333333333333, 1, -0.666666666666667, 0.333333333333333, -1.33333333333333, 2.66666666666667, -2, 1.33333333333333, -0.666666666666667, 1, -2, 3, -2, 1, -0.666666666666667, 1.33333333333333, -2, 2.66666666666667, -1.33333333333333, 0.333333333333333, -0.666666666666667, 1, -1.33333333333333, 1.66666666666667), .Dim = c(5L, 5L))), .Names = 'x');do.call('chol', argv) [,1] [,2] [,3] [,4] [,5] [1,] 1.290994 -1.032796 0.7745967 -0.5163978 0.2581989 [2,] 0.000000 1.264911 -0.9486833 0.6324555 -0.3162278 [3,] 0.000000 0.000000 1.2247449 -0.8164966 0.4082483 [4,] 0.000000 0.000000 0.0000000 1.1547005 -0.5773503 [5,] 0.000000 0.000000 0.0000000 0.0000000 1.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testWithNonNumericArgs# #.Internal(choose('hello', 3)) Error: non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testWithNonNumericArgs# #.Internal(choose(3, 'hello')) Error: non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchoose1# #.Internal(choose(-1, 3)) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchoose2# #.Internal(choose(-9L, c(-14, -13, -12, -11, -10, -9, -8, -7, -6, -5, -4, -3, -2, -1, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24))) [1] 0 0 0 0 0 0 0 0 [9] 0 0 0 0 0 0 1 -9 [17] 45 -165 495 -1287 3003 -6435 12870 -24310 [25] 43758 -75582 125970 -203490 319770 -490314 735471 -1081575 [33] 1562275 -2220075 3108105 -4292145 5852925 -7888725 10518300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchoose2# #.Internal(choose(9L, c(-14, -13, -12, -11, -10, -9, -8, -7, -6, -5, -4, -3, -2, -1, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24))) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 1 9 36 84 126 [20] 126 84 36 9 1 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [39] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchoose4# #.Internal(choose(0.5, 0:10)) [1] 1.000000000 0.500000000 -0.125000000 0.062500000 -0.039062500 [6] 0.027343750 -0.020507812 0.016113281 -0.013092041 0.010910034 [11] -0.009273529 ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchoose4#Output.IgnoreWarningMessage# #.Internal(choose(0:2, 1.2)) [1] 0 1 2 Warning messages: 1: 'k' (1.20) must be integer, rounded to 1 2: 'k' (1.20) must be integer, rounded to 1 3: 'k' (1.20) must be integer, rounded to 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchoose4#Output.IgnoreWarningMessage# #.Internal(choose(2, 1.2)) [1] 2 Warning message: 'k' (1.20) must be integer, rounded to 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchoose4# #.Internal(choose(47, structure(array(21:24, dim=c(2,2)), dimnames=list(a=c('a1','a2'),b=c('b1','b2'))))) b a b1 b2 a1 1.255176e+13 1.61238e+13 a2 1.483390e+13 1.61238e+13 ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchoose4# #.Internal(choose(structure(47, myattr='hello'), 2)) [1] 1081 attr(,"myattr") [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchoose4# #.Internal(choose(structure(array(21:24, dim=c(2,2)), dimnames=list(a=c('a1','a2'),b=c('b1','b2'))), 2)) b a b1 b2 a1 210 253 a2 231 276 ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchooseWithLogical# #.Internal(choose(1, NA)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchooseWithLogical# #.Internal(choose(FALSE, FALSE)) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchooseWithLogical# #.Internal(choose(NA, 1)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_choose.testchooseWithLogical# #.Internal(choose(logical(0), logical(0))) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClass# #{ gen<-function(object) 0; setGeneric("gen"); class(gen) } [1] "standardGeneric" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClass# #{x<-1;class(x)} [1] "numeric" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClass# #{x<-1L;class(x)} [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClass# #{x<-c(1,2,3);class(x)} [1] "numeric" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClass# #{x<-c(1L,2L,3L);class(x)} [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClass# #{x<-seq(1,10);class(x)} [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClass# #{x<-seq(1.1,10.1);class(x)} [1] "numeric" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClass# #{x<-seq(1L,10L);class(x)} [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClassFromMatrix# #{ m <- matrix(1:9, ncol=3); class(m) } [1] "matrix" "array" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClassFromMatrix# #{ v <- 1:9; attr(v, 'dim') <- c(3,3); class(v) } [1] "matrix" "array" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClassFromMatrix# #{ v <- 1:9; class(v) <- c('array') } Error in class(v) <- c("array") : cannot set class to "array" unless the dimension attribute has length > 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClassFromMatrix# #{ v <- 1:9; class(v) <- c('matrix') } Error in class(v) <- c("matrix") : invalid to set the class to matrix unless the dimension attribute is of length 2 (was 0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClassFromMatrix# #{ v <- 1:9; class(v) <- c('matrix', 'array') } ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClassFromMatrix# #{ v <- 1:9; dim(v) <- c(3,3); class(v) } [1] "matrix" "array" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testGetClassFromMatrix# #{ v <- as.double(1:9); dim(v) <- c(3,3); class(v) } [1] "matrix" "array" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClass# #{ x <- c(1,2,3); class(x) <- 'X'; attributes(x); x } [1] 1 2 3 attr(,"class") [1] "X" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClass# #{ x <- c(1,2,3); class(x) <- NULL; attributes(x); x } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClass# #{ x <- c(1,2,3); class(x) <- c('X', 'Y'); attributes(x); x } [1] 1 2 3 attr(,"class") [1] "X" "Y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ e <- new.env(); e$x <- 1:10; class(e) <- 'X'; class(e) } [1] "X" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ e <- new.env(); e$x <- 1:10; class(e) <- 42; class(e) } [1] "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ e <- new.env(); e$x <- 1:10; class(e) <- NULL; class(e) } [1] "environment" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ e <- new.env(); e$x <- 1:10; class(e) <- c('X', 'Y'); class(e) } [1] "X" "Y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ e <- new.env(); e$x <- 1:10; class(e) } [1] "environment" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ f <- function() NULL; class(f) <- 'X'; class(f) } [1] "X" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ f <- function() NULL; class(f) <- 42; class(f) } [1] "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ f <- function() NULL; class(f) <- NULL; class(f) } [1] "function" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ f <- function() NULL; class(f) <- c('X', 'Y'); class(f) } [1] "X" "Y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ f <- function() NULL; class(f) } [1] "function" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ set_class <- function(object, new_class) { class(object) <- new_class; object }; MyClass <- setClass('MyClass', slots=c(data='numeric')); a <- MyClass(); x <- set_class(a, 'X'); class(a); class(x) } [1] "X" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testSetClassOnOtherObjects# #{ set_class <- function(object, new_class) { class(object) <- new_class; object }; MyOtherClass <- setClass('MyOtherClass', slots=c(data='numeric')); b <- MyOtherClass(data=42); x <- set_class(b, 'X'); class(b); class(x) } [1] "X" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass1# #argv <- list(structure(function (x) standardGeneric('exp', .Primitive('exp')), generic = structure('exp', package = 'base'), package = 'base', group = list('Math'), valueClass = character(0), signature = 'x', default = .Primitive('exp'), skeleton = quote(.Primitive('exp')(x)), class = structure('standardGeneric', package = 'methods')));class(argv[[1]]); [1] "standardGeneric" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass10# #argv <- list(structure(list(time = 1:10, y = c(1, 1.4142135623731, 1.73205080756888, 2, 2.23606797749979, 2.44948974278318, 2.64575131106459, 2.82842712474619, 3, 3.16227766016838)), .Names = c('time', 'y'), row.names = c(NA, 10L), .S3Class = 'data.frame', date = structure(16045, class = 'Date'), class = structure('dataFrameD', package = '.GlobalEnv')));class(argv[[1]]); [1] "dataFrameD" attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass11# #argv <- list(structure(list(), .Names = character(0), row.names = integer(0), .S3Class = 'data.frame', class = structure('data.frame', package = 'methods')));class(argv[[1]]); [1] "data.frame" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass12# #argv <- list(structure(function (qr, y) .Call(sparseQR_resid_fitted, qr, y, TRUE), target = structure(c('sparseQR', 'ddenseMatrix'), .Names = c('qr', 'y'), package = c('Matrix', 'Matrix'), class = structure('signature', package = 'methods')), defined = structure(c('sparseQR', 'ddenseMatrix'), .Names = c('qr', 'y'), package = c('Matrix', 'Matrix'), class = structure('signature', package = 'methods')), generic = structure('qr.resid', package = 'base'), class = structure('MethodDefinition', package = 'methods')));class(argv[[1]]); [1] "MethodDefinition" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass13# #argv <- list(structure(c(3.1, 6.695, 8.14, 7.50090909091, 8.95, 9.26), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.'), class = c('summaryDefault', 'table')));class(argv[[1]]); [1] "summaryDefault" "table" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass14# #argv <- list(complex(0));class(argv[[1]]); [1] "complex" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass15# #argv <- list(structure(c(-0.00225540511921, -0.00045867962383, -8.86739505379e-06, -1.96554854754e-06, 0.000402346479421, 0.00193962597167), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.'), class = c('summaryDefault', 'table')));class(argv[[1]]); [1] "summaryDefault" "table" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass16# #argv <- list(c(FALSE, FALSE, FALSE, NA, NA, TRUE, TRUE, TRUE, NA, NA, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE));class(argv[[1]]); [1] "logical" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass17# #argv <- list(c(-10, -10, -10, NA, NA, 150, 170, 180, NA, NA, 310, 330, 340, 350, 370, 380));class(argv[[1]]); [1] "numeric" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass18# #argv <- list(structure(numeric(0), .Dim = 0L));class(argv[[1]]); [1] "array" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass19# #argv <- list(structure(c(0.5, 0, 0.5, 0, 0, 0.5, 0, 0, 0.0740740740740741, 0, 0, 0.5, 1, 0, 0, 0.5, 1, 0.5), unit = c('char', 'grobheight', 'char', 'grobheight', 'grobheight', 'char', 'mm', 'lines', 'null', 'mm', 'mm', 'char', 'grobheight', 'char', 'grobheight', 'char', 'grobheight', 'char'), valid.unit = c(18L, 22L, 18L, 22L, 22L, 18L, 7L, 3L, 5L, 7L, 7L, 18L, 22L, 18L, 22L, 18L, 22L, 18L), data = list(NULL, structure(list(label = '', x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), just = 'centre', hjust = NULL, vjust = NULL, rot = 0, check.overlap = FALSE, name = 'GRID.text.1', gp = structure(list(), class = 'gpar'), vp = NULL), .Names = c('label', 'x', 'y', 'just', 'hjust', 'vjust', 'rot', 'check.overlap', 'name', 'gp', 'vp'), class = c('text', 'grob', 'gDesc')), NULL, structure(list(label = '', x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), just = 'centre', hjust = NULL, vjust = NULL, rot = 0, check.overlap = FALSE, name = 'GRID.text.2', gp = structure(list(), class = 'gpar'), vp = NULL), .Names = c('label', 'x', 'y', 'just', 'hjust', 'vjust', 'rot', 'check.overlap', 'name', 'gp', 'vp'), class = c('text', 'grob', 'gDesc')), structure(list(label = '', x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), just = 'centre', hjust = NULL, vjust = NULL, rot = 0, check.overlap = FALSE, name = 'GRID.text.3', gp = structure(list(), class = 'gpar'), vp = NULL), .Names = c('label', 'x', 'y', 'just', 'hjust', 'vjust', 'rot', 'check.overlap', 'name', 'gp', 'vp'), class = c('text', 'grob', 'gDesc')), NULL, NULL, NULL, NULL, NULL, NULL, NULL, structure(list(label = 'Column', x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), just = 'centre', hjust = NULL, vjust = NULL, rot = 0, check.overlap = FALSE, name = 'plot_01.xlab', gp = structure(list(fontface = 1, alpha = 1, cex = 1, col = '#000000', lineheight = 1, font = 1L), .Names = c('fontface', 'alpha', 'cex', 'col', 'lineheight', 'font'), class = 'gpar'), vp = NULL), .Names = c('label', 'x', 'y', 'just', 'hjust', 'vjust', 'rot', 'check.overlap', 'name', 'gp', 'vp'), class = c('text', 'grob', 'gDesc')), NULL, structure(list(label = '', x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), just = 'centre', hjust = NULL, vjust = NULL, rot = 0, check.overlap = FALSE, name = 'GRID.text.5', gp = structure(list(), class = 'gpar'), vp = NULL), .Names = c('label', 'x', 'y', 'just', 'hjust', 'vjust', 'rot', 'check.overlap', 'name', 'gp', 'vp'), class = c('text', 'grob', 'gDesc')), NULL, structure(list(label = 'Dimensions: 4 x 54', x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), just = 'centre', hjust = NULL, vjust = NULL, rot = 0, check.overlap = FALSE, name = 'plot_01.sub', gp = structure(list(fontface = 2, alpha = 1, cex = 1, col = '#000000', lineheight = 1, font = 2L), .Names = c('fontface', 'alpha', 'cex', 'col', 'lineheight', 'font'), class = 'gpar'), vp = NULL), .Names = c('label', 'x', 'y', 'just', 'hjust', 'vjust', 'rot', 'check.overlap', 'name', 'gp', 'vp'), class = c('text', 'grob', 'gDesc')), NULL), class = 'unit'));class(argv[[1]]); [1] "unit" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass2# #argv <- list(structure(c(1, 0, 0, 0, 1, 0, 0, 0, 1), .Dim = c(3L, 3L), class = structure('mmat2', package = '.GlobalEnv')));class(argv[[1]]); [1] "mmat2" attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass20# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 0, 0, 0, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 0, 1, 1, 0, 0, 1, 1, 0, 0, 0, 1, 0, 1, 1, 1, 0, 0, 0, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1, 0, 1, 0, 0, 1, 0, 1, 1, 0, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1, 1, 1, 0, 1, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0, 0, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Dim = c(24L, 13L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24'), c('(Intercept)', 'block2', 'block3', 'block4', 'block5', 'block6', 'N1', 'P1', 'K1', 'N1:P1', 'N1:K1', 'P1:K1', 'N1:P1:K1')), assign = c(0L, 1L, 1L, 1L, 1L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L), contrasts = structure(list(block = 'contr.treatment', N = 'contr.treatment', P = 'contr.treatment', K = 'contr.treatment'), .Names = c('block', 'N', 'P', 'K'))));class(argv[[1]]); [1] "matrix" "array" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass21# #argv <- list(.Primitive('dimnames<-'));class(argv[[1]]); [1] "function" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass22# #argv <- list(c(17, 289, 4913, 83521, 1419857, 24137569, 410338673, 6975757441, 118587876497, 2015993900449, 34271896307633, 582622237229761, 9904578032905936, 168377826559400928, 2862423051509815808, 48661191875666870272, 8.27240261886337e+20, 1.40630844520677e+22, 2.39072435685151e+23, 4.06423140664757e+24, 6.90919339130087e+25, 1.17456287652115e+27, 1.99675689008595e+28, 3.39448671314612e+29, 5.7706274123484e+30, 9.81006660099228e+31, 1.66771132216869e+33, 2.83510924768677e+34, 4.81968572106751e+35, 8.19346572581477e+36, 1.39288917338851e+38, 2.36791159476047e+39, 4.02544971109279e+40, 6.84326450885775e+41, 1.16335496650582e+43, 1.97770344305989e+44, 3.36209585320181e+45, 5.71556295044308e+46, 9.71645701575324e+47, 1.65179769267805e+49, 2.80805607755269e+50, 4.77369533183957e+51, 8.11528206412726e+52, 1.37959795090163e+54, 2.34531651653278e+55, 3.98703807810572e+56, 6.77796473277973e+57, 1.15225400457255e+59, 1.95883180777334e+60, 3.33001407321468e+61, 5.66102392446496e+62, 9.62374067159043e+63, 1.63603591417037e+65, 2.78126105408963e+66, 4.72814379195238e+67, 8.03784444631904e+68, 1.36643355587424e+70, 2.3229370449862e+71, 3.94899297647655e+72, 6.71328806001013e+73, 1.14125897020172e+75, 1.94014024934293e+76, 3.29823842388298e+77, 5.60700532060106e+78, 9.5319090450218e+79, 1.62042453765371e+81, 2.7547217140113e+82, 4.68302691381921e+83, 7.96114575349266e+84, 1.35339477809375e+86, 2.30077112275938e+87, 3.91131090869094e+88, 6.6492285447746e+89, 1.13036885261168e+91, 1.92162704943986e+92, 3.26676598404776e+93, 5.5535021728812e+94, 9.44095369389803e+95, 1.60496212796267e+97, 2.72843561753653e+98, 4.6383405498121e+99, 7.88517893468058e+100, 1.3404804188957e+102, 2.27881671212269e+103, 3.87398841060857e+104, 6.58578029803456e+105, 1.11958265066588e+107, 1.90329050613199e+108, 3.23559386042438e+109, 5.50050956272145e+110, 9.35086625662646e+111, 1.5896472636265e+113, 2.70240034816505e+114, 4.59408059188058e+115, 7.80993700619699e+116, 1.32768929105349e+118, 2.25707179479093e+119, 3.83702205114458e+120, 6.52293748694579e+121, 1.10889937278078e+123, 5.5535021728812e+94, 3.33001407321468e+61, 1.95883180777334e+60, 1.15225400457255e+59, 6.77796473277973e+57, 3.98703807810572e+56, 2.34531651653278e+55, 1.37959795090163e+54, 8.11528206412726e+52, 4.77369533183957e+51, 2.80805607755269e+50, 1.65179769267805e+49, 2015993900449));class(argv[[1]]); [1] "numeric" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass23# #argv <- list(structure(function (a, b, ...) standardGeneric('solve'), generic = structure('solve', package = 'base'), package = 'base', group = list(), valueClass = character(0), signature = c('a', 'b'), default = structure(function (a, b, ...) UseMethod('solve'), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'a', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'a', package = 'methods'), generic = structure('solve', package = 'base'), class = structure('derivedDefaultMethod', package = 'methods')), skeleton = quote((function (a, b, ...) UseMethod('solve'))(a, b, ...)), class = structure('standardGeneric', package = 'methods')));class(argv[[1]]); [1] "standardGeneric" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass24# #argv <- list(c(-0.31833672642477-1.38507061859438i, 1.42379885362755+0.0383231810219i, 0.405090858049187-0.763030162361974i, -0.995386565684023+0.212306135525839i, -0.95881778764026+1.42553796686779i, -0.918087896319951+0.744479822333976i, 0.15096960188161+0.70022940298623i, 1.2230687888662-0.22935461345173i, 0.868824288637794+0.197093861895352i, 1.04248536490429+1.20715377387226i));class(argv[[1]]); [1] "complex" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass25# #argv <- list(structure(function (x, type, ...) .Call(dgeMatrix_norm, as(x, 'dgeMatrix'), type), target = structure(c('matrix', 'character'), .Names = c('x', 'type'), package = c('methods', 'methods'), class = structure('signature', package = 'methods')), defined = structure(c('matrix', 'character'), .Names = c('x', 'type'), package = c('methods', 'methods'), class = structure('signature', package = 'methods')), generic = structure('norm', package = 'base'), class = structure('MethodDefinition', package = 'methods')));class(argv[[1]]); [1] "MethodDefinition" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass26# #argv <- list(structure(function (x, mode = 'any') .Internal(as.vector(x, mode)), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), generic = character(0), class = structure('MethodDefinition', package = 'methods')));class(argv[[1]]); [1] "MethodDefinition" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass27# #argv <- list(structure(function (x, uplo) { if (uplo == x@uplo) x else t(x)}, target = structure(c('nsCMatrix', 'character'), .Names = c('x', 'uplo'), package = c('Matrix', 'methods'), class = structure('signature', package = 'methods')), defined = structure(c('nsCMatrix', 'character'), .Names = c('x', 'uplo'), package = c('Matrix', 'methods'), class = structure('signature', package = 'methods')), generic = structure('forceSymmetric', package = 'Matrix'), class = structure('MethodDefinition', package = 'methods')));class(argv[[1]]); [1] "MethodDefinition" attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass28# #argv <- list(c(1.1+0i, NA, 3+0i));class(argv[[1]]); [1] "complex" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass29# #argv <- list(structure(1:10, .Tsp = c(1959.25, 1961.5, 4), class = 'ts'));class(argv[[1]]); [1] "ts" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass3# #argv <- list(structure(3.14159265358979, comment = 'Start with pi', class = structure('num1', package = '.GlobalEnv')));class(argv[[1]]); [1] "num1" attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass31# #argv <- list(c(71.128, 69.70625, 70.9566666666667, 71.7, 71.435, 72.5766666666667, 70.6916666666667));do.call('class', argv) [1] "numeric" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass32# #argv <- list(structure(c(0.909297426825682, 0.141120008059867, -0.756802495307928), class = c('foo', 'bar')));do.call('class', argv) [1] "foo" "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass4# #argv <- list(structure(c(1+1i, 2+1.4142135623731i, 3+1.73205080756888i, 4+2i, 5+2.23606797749979i, 6+2.44948974278318i, 7+2.64575131106459i, 8+2.82842712474619i, 9+3i, 10+3.1622776601684i), id = character(0), class = structure('withId', package = '.GlobalEnv')));class(argv[[1]]); [1] "withId" attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass5# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')));class(argv[[1]]); c0 "integer(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass6# #argv <- list(structure(list(x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), width = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), height = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), justification = 'centre', gp = structure(list(), class = 'gpar'), clip = TRUE, xscale = c(-15.89, 356.89), yscale = c(0.683750615306643, 5.8340977374556), angle = 0, layout = NULL, layout.pos.row = c(21L, 21L), layout.pos.col = c(17L, 17L), valid.just = c(0.5, 0.5), valid.pos.row = c(21L, 21L), valid.pos.col = c(17L, 17L), name = 'plot_01.panel.3.1.vp'), .Names = c('x', 'y', 'width', 'height', 'justification', 'gp', 'clip', 'xscale', 'yscale', 'angle', 'layout', 'layout.pos.row', 'layout.pos.col', 'valid.just', 'valid.pos.row', 'valid.pos.col', 'name'), class = 'viewport'));class(argv[[1]]); [1] "viewport" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass7# #argv <- list(c(NA, '2', '3'));class(argv[[1]]); [1] "character" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass8# #argv <- list(c(325, 257, 303, 315, 380, 153, 263, 242, 206, 344, 258));class(argv[[1]]); [1] "numeric" ##com.oracle.truffle.r.test.builtins.TestBuiltin_class.testclass9# #argv <- list(structure(list(message = 'Choosing method ‘sparseMatrix#ANY’ from 2 ambiguous possibilities', call = NULL), .Names = c('message', 'call'), class = c('simpleCondition', 'condition')));class(argv[[1]]); [1] "simpleCondition" "condition" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{ a<-1; class(a)<-c('x','y'); b<-choose(a,1); class(b)[1]<-'z'; a; } [1] 1 attr(,"class") [1] "x" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{ foo <- function(x,y) { attributes(x) <- y; x }; list(before = foo(as.pairlist(1), list(class='ahoj')), after = foo(as.pairlist(1), list(class=NULL))) } $before [[1]] [1] 1 attr(,"class") [1] "ahoj" $after $after[[1]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{ x <- function() { }; class(x); class(x)<-"abc"; class(x); class(x)<-NULL; class(x) } [1] "function" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{ x <- function() { }; class(x); class(x)<-c("abc", "xyz"); class(x); class(x)<-NULL; class(x) } [1] "function" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{ x <- new.env(); class(x); class(x)<-"abc"; class(x); class(x)<-NULL; class(x) } [1] "environment" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{ x <- new.env(); class(x); class(x)<-c("abc", "xyz"); class(x); class(x)<-NULL; class(x) } [1] "environment" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{ x<-function() 42; class(x)<-"foo"; class(x)<-NULL; x } function() 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{ x=1;class(x)<-"character"; x} [1] "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass#Output.MayIgnoreErrorContext# #{`class<-`(, "foo") } Error in `class<-`(, "foo") : argument 1 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass#Output.MayIgnoreErrorContext# #{`class<-`(, ) } Error in `class<-`(, ) : argument 1 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass#Output.MayIgnoreErrorContext# #{`class<-`(NULL, "first") } Error: attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-"abc";class(x)<-"a";class(x)<-"character";x;} [1] "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1; class(x)<-"logical"; x; class(x)<-c(1,2,3); x; class(x)<-NULL; x;} [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;attr(x,"class")<-"b";x;} [1] 1 attr(,"class") [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;attr(x,"class")<-c("a","b");attr(x,"class")<-"numeric";x} [1] 1 attr(,"class") [1] "numeric" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;attr(x,"class")<-c("a","b");x;} [1] 1 attr(,"class") [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass#Output.IgnoreErrorContext# #{x<-1;attr(x,"class")<-c(1,2,3);} Error in attr(x, "class") <- c(1, 2, 3) : attempt to set invalid 'class' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;class(x)<-"a";class(x)<-"numeric";x;} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;class(x)<-"a";x} [1] 1 attr(,"class") [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;class(x)<-c(1,2,3); x;} [1] 1 attr(,"class") [1] "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;class(x)<-c(1,2,3);class(x)<-NULL; x;} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;class(x)<-c(1,2,3);class(x)<-c(); x;} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;class(x)<-c(1,2,3);y<-unclass(x);x;y} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;class(x)<-c(2+3i,4+5i); x;} [1] 1 attr(,"class") [1] "2+3i" "4+5i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;class(x)<-c(TRUE,FALSE); x;} [1] 1 attr(,"class") [1] "TRUE" "FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-1;y<-"b";attr(x,"class")<-y;x;} [1] 1 attr(,"class") [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-2+3i;class(x)<-"a";class(x)<-"complex";x;} [1] 2+3i ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-TRUE;class(x)<-"a";class(x)<-"logical";x;} [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-c(1,2);class(x)<-"a";class(x)<-"list";x;} [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-c(1,2,3,4); class(x)<-"array"; class(x)<-"matrix";} Error in class(x) <- "array" : cannot set class to "array" unless the dimension attribute has length > 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-c(1,2,3,4); dim(x)<-c(2,2); class(x);dim(x)<-c(2,2,1);class(x)} [1] "array" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-c(1,2,3,4); dim(x)<-c(2,2); class(x)<-"array"; x; class(x)<-"matrix"; x;} [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-c(1,2,3,4); dim(x)<-c(2,2); class(x)} [1] "matrix" "array" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-c(1,2,3,4); dim(x)<-c(2,2,1); class(x)} [1] "array" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x<-c(2+3i,4+5i);class(x)<-"a";class(x)<-"complex";x;} [1] 2+3i 4+5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass#Output.MayIgnoreErrorContext# #{x=1; `class<-`(x, ) } Error in `class<-`(x, ) : argument 2 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testUpdateClass# #{x=1; class(x)<-"first"; x;} [1] 1 attr(,"class") [1] "first" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign1#Ignored.OutputFormatting# #argv <- list(structure(function (x, mode = 'any') .Internal(as.vector(x, mode)), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), generic = character(0), class = structure('MethodDefinition', package = 'methods')), value = structure('MethodDefinition', package = 'methods'));`class<-`(argv[[1]],argv[[2]]); function (x, mode = 'any') .Internal(as.vector(x, mode)) attr(,"target") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"defined") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"generic") character(0) attr(,"class") [1] "MethodDefinition" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign10#Output.IgnoreWhitespace# #argv <- list(structure(c('o', 'p', 'v', 'i', 'r', 'w', 'b', 'm', 'f', 's'), date = structure(1224086400, class = c('POSIXct', 'POSIXt'), tzone = ''), class = 'stamped'), value = 'stamped');`class<-`(argv[[1]],argv[[2]]); [1] "o" "p" "v" "i" "r" "w" "b" "m" "f" "s" attr(,"date") [1] "2008-10-15 16:00:00 GMT" attr(,"class") [1] "stamped" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign11#Ignored.OutputFormatting# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')), structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));`class<-`(argv[[1]],argv[[2]]); [1] 3.141593 attr(,"class") [1] "3.14159265358979" attr(,"class") [1] "3.14159265358979" attr(,"class") [1] "testit" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign12# #argv <- list(structure(1, class = 'bar'), value = 'bar');`class<-`(argv[[1]],argv[[2]]); [1] 1 attr(,"class") [1] "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign13#Ignored.OutputFormatting# #argv <- list(structure(function (qr, y, k = qr$rank) standardGeneric('qr.fitted'), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'qr', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'qr', package = 'methods'), generic = character(0), class = structure('MethodDefinition', package = 'methods')), value = structure('MethodDefinition', package = 'methods'));`class<-`(argv[[1]],argv[[2]]); function (qr, y, k = qr$rank) standardGeneric('qr.fitted') attr(,"target") qr "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"defined") qr "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"generic") character(0) attr(,"class") [1] "MethodDefinition" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign14#Ignored.OutputFormatting# #argv <- list(structure(function (x = 1, nrow, ncol) standardGeneric('diag'), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), generic = character(0), class = structure('MethodDefinition', package = 'methods')), value = structure('MethodDefinition', package = 'methods'));`class<-`(argv[[1]],argv[[2]]); function (x = 1, nrow, ncol) standardGeneric('diag') attr(,"target") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"defined") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"generic") character(0) attr(,"class") [1] "MethodDefinition" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign15# #argv <- list(structure(1:6, class = 'A'), value = 'A');`class<-`(argv[[1]],argv[[2]]); [1] 1 2 3 4 5 6 attr(,"class") [1] "A" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign16#Ignored.OutputFormatting# #argv <- list(structure(function (x, y, ...) standardGeneric('plot'), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), generic = character(0), class = structure('MethodDefinition', package = 'methods')), value = structure('MethodDefinition', package = 'methods'));`class<-`(argv[[1]],argv[[2]]); function (x, y, ...) standardGeneric('plot') attr(,"target") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"defined") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"generic") character(0) attr(,"class") [1] "MethodDefinition" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign17#Ignored.OutputFormatting# #argv <- list(structure(function (x, logarithm = TRUE, ...) UseMethod('determinant'), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), generic = character(0), class = structure('MethodDefinition', package = 'methods')), value = structure('MethodDefinition', package = 'methods'));`class<-`(argv[[1]],argv[[2]]); function (x, logarithm = TRUE, ...) UseMethod('determinant') attr(,"target") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"defined") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"generic") character(0) attr(,"class") [1] "MethodDefinition" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign18#Output.IgnoreWhitespace# #argv <- list(structure(function (x, y = NULL) .Internal(crossprod(x, y)), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), generic = character(0), class = structure('MethodDefinition', package = 'methods')), value = structure('MethodDefinition', package = 'methods'));`class<-`(argv[[1]],argv[[2]]); function (x, y = NULL) .Internal(crossprod(x, y)) attr(,"target") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"defined") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"generic") character(0) attr(,"class") [1] "MethodDefinition" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign19#Ignored.OutputFormatting# #argv <- list(structure(function (obj, force = FALSE) standardGeneric('unname'), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'obj', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'obj', package = 'methods'), generic = character(0), class = structure('MethodDefinition', package = 'methods')), value = structure('MethodDefinition', package = 'methods'));`class<-`(argv[[1]],argv[[2]]); function (obj, force = FALSE) standardGeneric('unname') attr(,"target") obj "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"defined") obj "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"generic") character(0) attr(,"class") [1] "MethodDefinition" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign2#Ignored.OutputFormatting# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')));`class<-`(argv[[1]],argv[[2]]); $c0 factor(0) Levels: attr(,"row.names") character(0) attr(,"class") c0 "integer(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign3# #argv <- list(character(0), character(0));`class<-`(argv[[1]],argv[[2]]); character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign4# #argv <- list(structure(c(8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14), class = 'anyC'), value = 'anyC');`class<-`(argv[[1]],argv[[2]]); [1] 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 [26] 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 [51] 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 [76] 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 [101] 8 10 12 14 8 10 12 14 attr(,"class") [1] "anyC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign5#Ignored.OutputFormatting# #argv <- list(structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), value = structure('signature', package = 'methods'));`class<-`(argv[[1]],argv[[2]]); named character(0) attr(,"package") character(0) attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign6# #argv <- list(structure(list(par = 5.5, loglik = 0.970661978016996), .Names = c('par', 'loglik'), class = 'pfit'), value = 'pfit');`class<-`(argv[[1]],argv[[2]]); $par [1] 5.5 $loglik [1] 0.970662 attr(,"class") [1] "pfit" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign7# #argv <- list(structure(FALSE, class = 'FALSE'), FALSE);`class<-`(argv[[1]],argv[[2]]); [1] FALSE attr(,"class") [1] "FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign8# #argv <- list(1:3, value = 'numeric');`class<-`(argv[[1]],argv[[2]]); [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_classassign.testclassassign9#Ignored.OutputFormatting# #argv <- list(structure(c(1, 0, 0, 0, 1, 0, 0, 0, 1), .Dim = c(3L, 3L), class = structure('mmat2', package = '.GlobalEnv')), value = structure('mmat2', package = '.GlobalEnv'));`class<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] 1 0 0 [2,] 0 1 0 [3,] 0 0 1 attr(,"class") [1] "mmat2" attr(,"class")attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_clearPushBack.testclearPushBack1# #argv <- list(FALSE); .Internal(clearPushBack(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cnoquote.testcnoquote1#Ignored.ImplementationError# #argv <- structure(list(structure(c('.', '.', '|', '.', '.', '|', '.', '.'), .Dim = c(2L, 4L), .Dimnames = list(NULL, c('', '', '', '')), class = 'noquote')), .Names = '');do.call('c.noquote', argv) [1] . . | . . | . . ##com.oracle.truffle.r.test.builtins.TestBuiltin_col.testCasts0# #col(NULL) Error in col(NULL) : a matrix-like object is required as argument to 'col' ##com.oracle.truffle.r.test.builtins.TestBuiltin_col.testCol# #{ col(c(1,2,3)) } Error in col(c(1, 2, 3)) : a matrix-like object is required as argument to 'col' ##com.oracle.truffle.r.test.builtins.TestBuiltin_col.testCol# #{ ma <- cbind(x = 1:10, y = (-4:5)^2) ; col(ma) } [,1] [,2] [1,] 1 2 [2,] 1 2 [3,] 1 2 [4,] 1 2 [5,] 1 2 [6,] 1 2 [7,] 1 2 [8,] 1 2 [9,] 1 2 [10,] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_col.testCol# #{ ma <- matrix(1:12, 3, 4) ; col(ma) } [,1] [,2] [,3] [,4] [1,] 1 2 3 4 [2,] 1 2 3 4 [3,] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_col.testcol1# #argv <- list(c(2L, 2L)); .Internal(col(argv[[1]])) [,1] [,2] [1,] 1 2 [2,] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_col.testcol3# #argv <- list(c(1L, 0L)); .Internal(col(argv[[1]])) [1,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{ a = colSums(array(1:24,c(2,3,4))); colMeans(a)} [1] 7 19 31 43 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{ colMeans(matrix((1:6)*(1+1i), nrow=2)) } [1] 1.5+1.5i 3.5+3.5i 5.5+5.5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{ colMeans(matrix(as.complex(1:6), nrow=2)) } [1] 1.5+0i 3.5+0i 5.5+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{ m <- matrix(1:6, nrow=2) ; colMeans(m) } [1] 1.5 3.5 5.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{ m <- matrix(c(1,2,3,4,5,6), nrow=2) ; colMeans(m) } [1] 1.5 3.5 5.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{ m <- matrix(c(NA,2,3,4,NA,6), nrow=2) ; colMeans(m) } [1] NA 3.5 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{ m <- matrix(c(NA,2,3,4,NA,6), nrow=2) ; colMeans(m, na.rm = TRUE) } [1] 2.0 3.5 6.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(3+2i,4+5i,2+0i,5+10i)))} [1] 3.5+4.25i ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(3,4,2,5)))} [1] 3.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(3,4,NaN,5),ncol=2,nrow=2), na.rm = FALSE)} [1] 3.5 NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(3,4,NaN,5),ncol=2,nrow=2), na.rm = TRUE)} [1] 3.5 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(3L,4L,2L,5L)))} [1] 3.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(3L,NA,2L,5L),ncol=2,nrow=2), na.rm = FALSE)} [1] NA 3.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(3L,NA,2L,5L),ncol=2,nrow=2), na.rm = TRUE)} [1] 3.0 3.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(3L,NaN,2L,5L),ncol=2,nrow=2), na.rm = FALSE)} [1] NaN 3.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(3L,NaN,2L,5L),ncol=2,nrow=2), na.rm = TRUE)} [1] 3.0 3.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(NA,NaN,NaN,NA),ncol=2,nrow=2))} [1] NA NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(NaN,4+5i,2+0i,5+10i),nrow=2,ncol=2), na.rm = TRUE)} [1] 4.0+2.5i 3.5+5.0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(TRUE,FALSE,FALSE,NA),nrow=2,ncol=2), na.rm = FALSE)} [1] 0.5 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(TRUE,FALSE,FALSE,NA),nrow=2,ncol=2), na.rm = TRUE)} [1] 0.5 0.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(TRUE,FALSE,FALSE,NaN),nrow=2,ncol=2), na.rm = FALSE)} [1] 0.5 NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(TRUE,FALSE,FALSE,NaN),nrow=2,ncol=2), na.rm = TRUE)} [1] 0.5 0.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testColMeans# #{colMeans(matrix(c(TRUE,FALSE,FALSE,TRUE)))} [1] 0.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans1# #argv <- list(structure(1:5, .Dim = c(5L, 1L), .Dimnames = list(c('1', '2', '3', '4', '5'), 'a')), 5, 1, FALSE); .Internal(colMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans10#Ignored.ImplementationError# #argv <- list(structure(c(NA, 30.6929824561403, 25.6929824561403, 18.6929824561403, 6.69298245614035, -6.30701754385965, -13.3070175438597, -24.3070175438597, -21.3070175438597, 3.69298245614035, -2.30701754385965, -1.30701754385965, -20.3070175438597, -17.3070175438597, NA, NA, 12.6929824561403, 0.692982456140349, 0.692982456140349, -5.30701754385965, -11.3070175438597, -19.3070175438597, -10.3070175438597, -17.3070175438597, -20.3070175438597, -32.3070175438597, -24.3070175438597, -33.3070175438597, -31.3070175438597, -24.3070175438597, NA, -24.3070175438597, 2.69298245614035, 17.6929824561403, 18.6929824561403, 3.69298245614035, 14.6929824561403, 4.69298245614035, 14.6929824561403, 0.692982456140349, 14.6929824561403, 11.6929824561403, 22.6929824561403, 16.6929824561403, 19.6929824561403, 14.6929824561403, 10.6929824561403, 18.6929824561403, 22.6929824561403, 5.69298245614035, 6.69298245614035, 0.692982456140349, 3.69298245614035, -7.30701754385965, -8.30701754385965, -4.30701754385965, 0.692982456140349, 5.69298245614035, 4.69298245614035, 9.69298245614035, 14.6929824561403, 5.69298245614035, 4.69298245614035, 0.692982456140349, 15.6929824561403, 26.6929824561403, 14.6929824561403, 21.6929824561403, 22.6929824561403, 14.6929824561403, 5.69298245614035, 17.6929824561403, 19.6929824561403, 7.69298245614035, 5.69298245614035, 0.692982456140349, 23.6929824561403, 16.6929824561403, 12.6929824561403, 12.6929824561403, 14.6929824561403, 7.69298245614035, 12.6929824561403, 5.69298245614035, 6.69298245614035, -10.3070175438597, -0.307017543859651, -12.3070175438597, -12.3070175438597, -4.30701754385965, -18.3070175438597, -10.3070175438597, -20.3070175438597, -7.30701754385965, -21.3070175438597, -12.3070175438597, 2.69298245614035, 8.69298245614035, 8.69298245614035, -0.307017543859651, 9.69298245614035, -3.30701754385965, 4.69298245614035, -4.30701754385965, -5.30701754385965, -8.30701754385965, -2.30701754385965, -7.30701754385965, -7.30701754385965, 4.69298245614035, NA, NA, 11.6929824561403, -12.3070175438597, -16.3070175438597, -29.3070175438597, -28.3070175438597, -31.3070175438597, -32.3070175438597, -32.3070175438597), .Dim = c(120L, 1L), '`scaled:center`' = 56.3070175438597, .Dimnames = list(NULL, 'Series 1'), .Tsp = c(1, 120, 1), class = 'ts'), 120, 1, TRUE); .Internal(colMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] -2.929138e-14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans12# #argv <- structure(list(x = structure(list(a = 1:5), .Names = 'a', row.names = c(NA, 5L), class = 'data.frame')), .Names = 'x');do.call('colMeans', argv) a 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans13# #argv <- structure(list(x = structure(list(a = 6:10), .Names = 'a', row.names = 6:10, class = 'data.frame')), .Names = 'x');do.call('colMeans', argv) a 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans2# #argv <- list(structure(c(135L, 49L, 32L, NA, 64L, 40L, 77L, 97L, 97L, 85L, NA, 10L, 27L, NA, 7L, 48L, 35L, 61L, 79L, 63L, 16L, NA, NA, 80L, 108L, 20L, 52L, 82L, 50L, 64L, 59L), .Dim = c(31L, 1L)), 31, 1, TRUE); .Internal(colMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 59.11538 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans3# #argv <- list(structure(c(2, 1, 0, 1, 0, NA, NA, NA, 0), .Dim = c(3L, 3L)), 3, 3, TRUE); .Internal(colMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1.0 0.5 0.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans4# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)), 0, 0, FALSE); .Internal(colMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans5# #argv <- list(structure(c(3, 3, NA, 3, 3, 3, 3, 3, 4, 3, NA, NA, 2, 3, 4, 5), .Dim = c(8L, 2L), .Dimnames = list(NULL, c('x1', 'x2'))), 8, 2, FALSE); .Internal(colMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans6# #argv <- list(structure(c(2.72365184362824, -0.796449881281511, 0.796148249055565, 2.02271745300814, 1.2802770548002, 1.337056204255, 2.6107240701292, 2.10828628469836, 1.43875587381801, 0.595316954266145, 3.49563715531476, 1.48558049063486, 1.41226464164167, 2.44508400241911, 2.57984360481665, -1.20772288776711, 2.43688378444644, 0.533076425061003, 1.3034273968671, 3.70362282204711, 0.608593870458723, 0.953140512120224, 0.386257122548769, 3.75339780206139, 3.42482460204159, 0.619548124388308, 3.14887764228466, 0.751148471471006, 1.87137783412956, 1.62046400462005, 0.94345287218966, 1.64506447351138, 1.30606946576658, 2.45886447346843, 2.03431588373773, -0.338520676288604, 2.03487908340323, 1.29252851374035, 1.2267540180234, 2.05222753374982, 2.83569182599169, 3.48408642621763, 2.39258208808217, 1.92637187747015, 1.9464722888473, 0.936987622444041, -0.457825141151114, 0.770998483524033, 1.80682914026242, 0.916590155958594, 2.78096073652237, 1.55750387883765, 3.3880545417157, 3.65182127019008, 1.46303726963845, 2.58757002961928, 2.44326477189276, 0.94225036142597, 1.29219317072567, 2.94893881867, 1.24384829814308, 1.84885702049451, 1.32523566412607, 1.28973308890195, 0.395997063065922, 1.22892077218378, 1.7220093913143, 0.805646559888977, 1.01315020534677, 1.31726023805076, 1.72638291442835, 1.7933922500199, 1.62417301864782, 2.84632954278294, 1.06390349068226, 0.393286798351562, 2.85644316208756, 1.17640470313741, 0.528983054741685, 1.96126284937392, 0.917057889286139, 2.45214192885654, 2.46901056075969, 0.964752028993787, 1.15564656732576, 1.8050377493702, 3.92150679994132, 1.89242778597682, 1.79539660063946, 3.11975967552643, 3.60233448863085, 1.28811938153997, 2.49044833125605, 2.82723855540917, 0.488353198794268), .Dim = c(95L, 1L)), 95, 1, TRUE); .Internal(colMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1.716445 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans7# #argv <- list(structure(FALSE, .Dim = c(1L, 1L)), 1, 1, TRUE); .Internal(colMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans8# #argv <- list(structure(c(234.505586749024, 30.477338238484, 110.520869124744, 10.8182256360112, 147.313169560589, 97.6285379622695, 176.128082322087, 47.2454421006426, 1.90674769458181e-15, 30.477338238484, 416.975499504725, 31.7861370189749, 190.703952476833, 120.117506711705, 442.506661969244, 239.889830502368, 22.2127533877541, 8.96469890623342e-16, 110.520869124744, 31.7861370189749, 1515.40698347813, 93.4417828515041, 178.042033105564, 210.514489336906, 228.304319294085, 24.2402628282532, 9.78296809359315e-16, 10.8182256360112, 190.703952476833, 93.4417828515041, 1736.17011782569, 171.990208955525, 616.163154757563, 314.295577560061, 190.513839846008, 7.68882264110221e-15, 147.313169560589, 120.117506711705, 178.042033105564, 171.990208955525, 4391.22673539453, 270.845832643245, 258.906125067947, 151.459157745218, 6.11264043711995e-15, 97.6285379622695, 442.506661969244, 210.514489336906, 616.163154757563, 270.845832643245, 3843.51687278644, 444.735756817902, 537.305365376654, 2.16847535162432e-14, 176.128082322087, 239.889830502368, 228.304319294085, 314.295577560062, 258.906125067947, 444.735756817902, 5767.34674134268, 307.533224133396, 1.24115309340219e-14, 47.2454421006426, 22.2127533877541, 24.2402628282532, 190.513839846008, 151.459157745218, 537.305365376655, 307.533224133396, 264.760049944031, 1.06852765558369e-14, 1.90674769458181e-15, 8.96469890623341e-16, 9.78296809359316e-16, 7.6888226411022e-15, 6.11264043711995e-15, 2.16847535162432e-14, 1.24115309340219e-14, 1.06852765558369e-14, 4.31240042063952e-31), .Dim = c(9L, 9L)), 9, 9, FALSE); .Internal(colMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 9.495969e+01 1.660744e+02 2.658063e+02 3.693441e+02 6.322112e+02 [6] 7.181352e+02 8.596822e+02 1.716967e+02 6.929393e-15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colMeans.testcolMeans9# #argv <- list(structure(c(NA, 17.4716236802524, 0.424429400003, -2.45474630431729, -8.6855922903657, -11.7956139807344, -8.08147081196715, -13.3123167980156, -1.24650334752019, 21.281002075072, -5.32311940332657, 0.621869751489083, -19.2022951076469, -0.543162784063959, NA, NA, 15.344649382745, -9.74060313555005, 0.149375174081257, -5.85062482591874, -6.90563567110309, -9.96064651628744, 5.6326723568001, -8.78481137542338, -6.01565736147178, -15.543162784064, 2.34681552556734, -13.2465033475202, -3.82901961529671, 1.5226506664314, NA, -5.9777558474085, 22.7534966524798, 15.5010454558094, 4.13857256877024, -11.6855922903657, 11.6768805966734, -7.38893285382193, 10.8527157375375, -11.3889328538219, 14.1493751740813, -0.388932853821931, 13.0835617235859, -1.98225172690947, 5.96273742790618, -1.50975714950164, -1.38893285382193, 9.90772658272184, 7.3144077096343, -12.9822517269095, 2.02855087840155, -4.7956139807344, 3.14937517408126, -10.3231194033266, -2.25730595283121, 2.56685890630474, 4.27019946976097, 5.14937517408126, 0.0285508784015471, 5.85271573753749, 6.73189144185778, -6.38893285382193, 0.0285508784015471, -3.14728426246251, 15.1493751740813, 13.7869022870421, -7.27891116345324, 9.61106714617807, 4.84191313222647, -3.98225172690947, -6.38893285382193, 13.0285508784015, 5.13857256877024, -8.50975714950164, -0.619778839870337, -3.97144912159845, 23.1493751740813, -2.80641658604541, -1.03726257209382, 2.25939686444995, 4.25939686444995, -4.38893285382193, 6.38022116012966, -4.74060313555005, 2.02855087840155, -15.7956139807344, 8.21518862457662, -12.0264599667828, -2.1364816571515, 5.8635183428485, -14.729800530239, 4.80850749766416, -11.7848113754234, 9.45683721593604, -15.2573059528312, 5.28100207507198, 12.8635183428485, 6.50104545580937, 1.55605630099372, -7.44394369900628, 9.9735400332172, -11.2681085581422, 7.44603461062503, -8.14728426246251, -1.72980053023903, -3.90563567110309, 4.56685890630474, -5.37813024851092, -1.25730595283121, 10.7426940471688, NA, NA, 6.24343998511081, -21.9164382764141, -6.1364816571515, -15.8398222206077, -4.12567905184048, -7.94984391097642, -6.4773493335686, -5.65318447443266), .Dim = c(120L, 1L)), 120, 1, TRUE); .Internal(colMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] -0.4536633 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ a = colSums(array(1:24,c(2,3,4))); c(a[1,1],a[2,2],a[3,3],a[3,4]) } [1] 3 19 35 47 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ a = colSums(array(1:24,c(2,3,4))); d = dim(a); c(d[1],d[2]) } [1] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ a = colSums(array(1:24,c(2,3,4))); length(a) } [1] 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ a = colSums(matrix(1:12,3,4)); dim(a) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ a = colSums(matrix(1:12,3,4)); length(a) } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ colSums(matrix((1:6)*(1+1i), nrow=2)) } [1] 3+ 3i 7+ 7i 11+11i ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ colSums(matrix(1:12,3,4)) } [1] 6 15 24 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ colSums(matrix(as.complex(1:6), nrow=2)) } [1] 3+0i 7+0i 11+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ m <- matrix(1:6, nrow=2) ; colSums(na.rm = FALSE, x = m) } [1] 3 7 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ m <- matrix(c(1,2,3,4,5,6), nrow=2) ; colSums(m) } [1] 3 7 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ m <- matrix(c(NA,2,3,4,NA,6), nrow=2) ; colSums(m) } [1] NA 7 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ m <- matrix(c(NA,2,3,4,NA,6), nrow=2) ; colSums(na.rm = TRUE, m) } [1] 2 7 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testColSums# #{ o <- outer(1:3, 1:4, "<") ; colSums(o) } [1] 0 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testcolSums1# #argv <- list(structure(c(365, 365, 365, 366, 1, 0), .Dim = c(3L, 2L)), 3, 2, FALSE); .Internal(colSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1095 367 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testcolSums2# #argv <- list(structure(c(1L, 0L, 0L, 0L, 2L, 0L, 0L, 0L, 3L), .Dim = c(3L, 3L)), 3, 3, FALSE); .Internal(colSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testcolSums3# #argv <- list(structure(c(5, 29, 14, 16, 15, 54, 14, 10, 20, 84, 17, 94, 68, 119, 26, 7), .Dim = c(4L, 4L), .Dimnames = structure(list(Hair = c('Black', 'Brown', 'Red', 'Blond'), Eye = c('Green', 'Hazel', 'Blue', 'Brown')), .Names = c('Hair', 'Eye'))), 4, 4, FALSE); .Internal(colSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 64 93 215 220 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testcolSums4# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 7, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, 7, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 49, 7, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 21, 0, 0, 7, 0, 0, 0, 0, 0, 0, 0, 0, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, NA, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 21, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 9, 0, 0, 3, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Dim = c(16L, 16L), .Dimnames = list(NULL, NULL)), 16, 16, TRUE); .Internal(colSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 0 0 0 0 0 0 7 7 56 28 3 3 24 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testcolSums5# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, NA, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, NA, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(16L, 16L), .Dimnames = list(NULL, NULL)), 16, 16, FALSE); .Internal(colSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 0 0 0 0 0 0 1 NA 2 2 0 NA 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testcolSums6# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)), 0, 0, FALSE); .Internal(colSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testcolSums7#Ignored.ImplementationError# #argv <- list(structure(c(-7.5, -6.5, -5.5, -4.5, -3.5, -2.5, -1.5, -0.5, 0.5, 1.5, 2.5, 3.5, 4.5, 5.5, 6.5, 7.5, -421.875, -274.625, -166.375, -91.125, -42.875, -15.625, -3.375, -0.125, 0.125, 3.375, 15.625, 42.875, 91.125, 166.375, 274.625, 421.875, -9187.5, -2866.5, -445.499999999999, -4.5, -283.5, -562.5, -541.5, -220.5, 220.5, 541.5, 562.5, 283.5, 4.49999999999999, 445.5, 2866.5, 9187.5, -139741.875, -4844.38499999995, -10122.255, -28872.045, -28539.315, -15800.625, -4325.535, -178.605, 178.605, 4325.535, 15800.625, 28539.315, 28872.045, 10122.255, 4844.38500000001, 139741.875), .Dim = c(16L, 4L)), 16, 4, FALSE); .Internal(colSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0.000000e+00 0.000000e+00 1.013412e-12 6.002665e-11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testcolSums8# #argv <- list(structure(0:1, .Dim = 1:2, .Dimnames = list('strata(grp)', c('x', 'strata(grp)'))), 1, 2, FALSE); .Internal(colSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colSums.testcolSums9# #argv <- list(structure(c(0, 0, 0, 0, 0, -1.43884556914512e-134, 0, 0, 0, -7.95468296571581e-252, 1.76099882882167e-260, 0, -9.38724727098368e-323, -0.738228974836154, 0, 0, 0, 0, 0, 0, 0, 0, 0, -6.84657791618065e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.05931985100232e-174, 0, -3.41789378681991e-150, 0, 0, 0, 0, -1.07225492686949e-10, 0, 1.65068934474523e-67, 0, -6.49830035279282e-307, 0, 5.83184963977238e-90, 0, -9.81722610183938e-287, 6.25336419454196e-54, 0, 0, 0, -1.72840591500382e-274, 1.22894687952101e-13, 0.660132850077566, 0, 0, 7.79918925397516e-200, -2.73162827952857e-178, 1.32195942051179e-41, 0, 0, 0, 0, 2.036057023761e-45, -3.40425060445074e-186, 1.59974269220388e-26, 0, 6.67054294775317e-124, 0.158503117506202, 0, 0, 0, 0, 0, 0, 3.42455724859116e-97, 0, 0, -2.70246891320217e-272, 0, 0, -3.50562438899045e-06, 0, 0, 1.35101732326608e-274, 0, 0, 0, 0, 0, 0, 0, 7.24580295957621e-65, 0, -3.54887341172294e-149, 0, 0, 0, 0, 0, 0, 0, 0, 1.77584594753563e-133, 0, 0, 0, 2.88385135688311e-250, 1.44299633616158e-259, 0, 1.56124744085834e-321, 1.63995835868977, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2.01050064173383e-122, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.64868196850938e-172, 0, 6.28699823828692e-149, 0, 0, 0, 0, 5.0552295590188e-09, 0, 2.30420733561404e-66, 0, 7.0823279075443e-306, 0, 2.05009901740696e-88, 0, 7.41800724282869e-285, 7.18347043784483e-53, 0, 0, 0, 1.04251223075649e-273, 9.75816316577433e-13, 4.29519957592147, 0, 0, 1.33541454912682e-198, 2.34606233784019e-176, 8.38236726536896e-41, 0, 0, 0, 0, 1.35710537434521e-43, 1.15710503176511e-185, 1.25601735272233e-25, 0, 4.46811655846376e-123, 4.4196641795634, 0, 0, 0, 0, 0, 0, 3.74179015251531e-93, 0, 0, 3.62662047836582e-271, 0, 0, 1.26220330674453e-05, 0, 0, 1.72715562657338e-273, 0, 0, 0, 0, 0, 0, 0, 5.46372806810809e-64, 0, 2.47081972486962e-148, 0, 0, 0), .Dim = c(100L, 2L)), 100, 2, FALSE); .Internal(colSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0.08040349 10.35483474 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colnames.testcolnames1# #argv <- structure(list(x = structure(c(1.00000000000001, 2, 3, 4, 5, 6, 7, 8, 9, 10, 0.999999999999998, 4, 9, 16, 25, 36, 49, 64, 81, 100, 5.39416105805496e-14, 2, 6, 12, 20, 30, 42, 56, 72, 90, 1, 0.999999999999999, 1, 1, 1, 1, 1, 1, 1, 1), .Dim = c(10L, 4L), .Dimnames = list(NULL, c('', 'B', 'C', 'D')))), .Names = 'x');do.call('colnames', argv) [1] "" "B" "C" "D" ##com.oracle.truffle.r.test.builtins.TestBuiltin_colnames.testcolnames2# #argv <- structure(list(x = structure(list(x = 1:6, CC = 11:16, f = structure(c(1L, 1L, 2L, 2L, 3L, 3L), .Label = c('1', '2', '3'), class = 'factor')), .Names = c('x', 'CC', 'f'), row.names = c(NA, -6L), class = 'data.frame')), .Names = 'x');do.call('colnames', argv) [1] "x" "CC" "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_colnamesassign_.testcolnamesassign_1# #argv <- structure(list(x = structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Dim = c(200L, 5L)), value = c('X1', 'X2', 'X3', 'X4', 'X5')), .Names = c('x', 'value'));do.call('colnames<-', argv) X1 X2 X3 X4 X5 [1,] 0 0 0 0 0 [2,] 0 0 0 0 0 [3,] 0 0 0 0 0 [4,] 0 0 0 0 0 [5,] 0 0 0 0 0 [6,] 0 0 0 0 0 [7,] 0 0 0 0 0 [8,] 0 0 0 0 0 [9,] 0 0 0 0 0 [10,] 0 0 0 0 0 [11,] 0 0 0 0 0 [12,] 0 0 0 0 0 [13,] 0 0 0 0 0 [14,] 0 0 0 0 0 [15,] 0 0 0 0 0 [16,] 0 0 0 0 0 [17,] 0 0 0 0 0 [18,] 0 0 0 0 0 [19,] 0 0 0 0 0 [20,] 0 0 0 0 0 [21,] 0 0 0 0 0 [22,] 0 0 0 0 0 [23,] 0 0 0 0 0 [24,] 0 0 0 0 0 [25,] 0 0 0 0 0 [26,] 0 0 0 0 0 [27,] 0 0 0 0 0 [28,] 0 0 0 0 0 [29,] 0 0 0 0 0 [30,] 0 0 0 0 0 [31,] 0 0 0 0 0 [32,] 0 0 0 0 0 [33,] 0 0 0 0 0 [34,] 0 0 0 0 0 [35,] 0 0 0 0 0 [36,] 0 0 0 0 0 [37,] 0 0 0 0 0 [38,] 0 0 0 0 0 [39,] 0 0 0 0 0 [40,] 0 0 0 0 0 [41,] 0 0 0 0 0 [42,] 0 0 0 0 0 [43,] 0 0 0 0 0 [44,] 0 0 0 0 0 [45,] 0 0 0 0 0 [46,] 0 0 0 0 0 [47,] 0 0 0 0 0 [48,] 0 0 0 0 0 [49,] 0 0 0 0 0 [50,] 0 0 0 0 0 [51,] 0 0 0 0 0 [52,] 0 0 0 0 0 [53,] 0 0 0 0 0 [54,] 0 0 0 0 0 [55,] 0 0 0 0 0 [56,] 0 0 0 0 0 [57,] 0 0 0 0 0 [58,] 0 0 0 0 0 [59,] 0 0 0 0 0 [60,] 0 0 0 0 0 [61,] 0 0 0 0 0 [62,] 0 0 0 0 0 [63,] 0 0 0 0 0 [64,] 0 0 0 0 0 [65,] 0 0 0 0 0 [66,] 0 0 0 0 0 [67,] 0 0 0 0 0 [68,] 0 0 0 0 0 [69,] 0 0 0 0 0 [70,] 0 0 0 0 0 [71,] 0 0 0 0 0 [72,] 0 0 0 0 0 [73,] 0 0 0 0 0 [74,] 0 0 0 0 0 [75,] 0 0 0 0 0 [76,] 0 0 0 0 0 [77,] 0 0 0 0 0 [78,] 0 0 0 0 0 [79,] 0 0 0 0 0 [80,] 0 0 0 0 0 [81,] 0 0 0 0 0 [82,] 0 0 0 0 0 [83,] 0 0 0 0 0 [84,] 0 0 0 0 0 [85,] 0 0 0 0 0 [86,] 0 0 0 0 0 [87,] 0 0 0 0 0 [88,] 0 0 0 0 0 [89,] 0 0 0 0 0 [90,] 0 0 0 0 0 [91,] 0 0 0 0 0 [92,] 0 0 0 0 0 [93,] 0 0 0 0 0 [94,] 0 0 0 0 0 [95,] 0 0 0 0 0 [96,] 0 0 0 0 0 [97,] 0 0 0 0 0 [98,] 0 0 0 0 0 [99,] 0 0 0 0 0 [100,] 0 0 0 0 0 [101,] 0 0 0 0 0 [102,] 0 0 0 0 0 [103,] 0 0 0 0 0 [104,] 0 0 0 0 0 [105,] 0 0 0 0 0 [106,] 0 0 0 0 0 [107,] 0 0 0 0 0 [108,] 0 0 0 0 0 [109,] 0 0 0 0 0 [110,] 0 0 0 0 0 [111,] 0 0 0 0 0 [112,] 0 0 0 0 0 [113,] 0 0 0 0 0 [114,] 0 0 0 0 0 [115,] 0 0 0 0 0 [116,] 0 0 0 0 0 [117,] 0 0 0 0 0 [118,] 0 0 0 0 0 [119,] 0 0 0 0 0 [120,] 0 0 0 0 0 [121,] 0 0 0 0 0 [122,] 0 0 0 0 0 [123,] 0 0 0 0 0 [124,] 0 0 0 0 0 [125,] 0 0 0 0 0 [126,] 0 0 0 0 0 [127,] 0 0 0 0 0 [128,] 0 0 0 0 0 [129,] 0 0 0 0 0 [130,] 0 0 0 0 0 [131,] 0 0 0 0 0 [132,] 0 0 0 0 0 [133,] 0 0 0 0 0 [134,] 0 0 0 0 0 [135,] 0 0 0 0 0 [136,] 0 0 0 0 0 [137,] 0 0 0 0 0 [138,] 0 0 0 0 0 [139,] 0 0 0 0 0 [140,] 0 0 0 0 0 [141,] 0 0 0 0 0 [142,] 0 0 0 0 0 [143,] 0 0 0 0 0 [144,] 0 0 0 0 0 [145,] 0 0 0 0 0 [146,] 0 0 0 0 0 [147,] 0 0 0 0 0 [148,] 0 0 0 0 0 [149,] 0 0 0 0 0 [150,] 0 0 0 0 0 [151,] 0 0 0 0 0 [152,] 0 0 0 0 0 [153,] 0 0 0 0 0 [154,] 0 0 0 0 0 [155,] 0 0 0 0 0 [156,] 0 0 0 0 0 [157,] 0 0 0 0 0 [158,] 0 0 0 0 0 [159,] 0 0 0 0 0 [160,] 0 0 0 0 0 [161,] 0 0 0 0 0 [162,] 0 0 0 0 0 [163,] 0 0 0 0 0 [164,] 0 0 0 0 0 [165,] 0 0 0 0 0 [166,] 0 0 0 0 0 [167,] 0 0 0 0 0 [168,] 0 0 0 0 0 [169,] 0 0 0 0 0 [170,] 0 0 0 0 0 [171,] 0 0 0 0 0 [172,] 0 0 0 0 0 [173,] 0 0 0 0 0 [174,] 0 0 0 0 0 [175,] 0 0 0 0 0 [176,] 0 0 0 0 0 [177,] 0 0 0 0 0 [178,] 0 0 0 0 0 [179,] 0 0 0 0 0 [180,] 0 0 0 0 0 [181,] 0 0 0 0 0 [182,] 0 0 0 0 0 [183,] 0 0 0 0 0 [184,] 0 0 0 0 0 [185,] 0 0 0 0 0 [186,] 0 0 0 0 0 [187,] 0 0 0 0 0 [188,] 0 0 0 0 0 [189,] 0 0 0 0 0 [190,] 0 0 0 0 0 [191,] 0 0 0 0 0 [192,] 0 0 0 0 0 [193,] 0 0 0 0 0 [194,] 0 0 0 0 0 [195,] 0 0 0 0 0 [196,] 0 0 0 0 0 [197,] 0 0 0 0 0 [198,] 0 0 0 0 0 [199,] 0 0 0 0 0 [200,] 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:-0.2 [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:-1.1 [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:-1L [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:-2.999999999 [1] -0.2 -1.2 -2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:-30L [1] -0.2 -1.2 -2.2 -3.2 -4.2 -5.2 -6.2 -7.2 -8.2 -9.2 -10.2 -11.2 [13] -12.2 -13.2 -14.2 -15.2 -16.2 -17.2 -18.2 -19.2 -20.2 -21.2 -22.2 -23.2 [25] -24.2 -25.2 -26.2 -27.2 -28.2 -29.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:-33.3 [1] -0.2 -1.2 -2.2 -3.2 -4.2 -5.2 -6.2 -7.2 -8.2 -9.2 -10.2 -11.2 [13] -12.2 -13.2 -14.2 -15.2 -16.2 -17.2 -18.2 -19.2 -20.2 -21.2 -22.2 -23.2 [25] -24.2 -25.2 -26.2 -27.2 -28.2 -29.2 -30.2 -31.2 -32.2 -33.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:-5 [1] -0.2 -1.2 -2.2 -3.2 -4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:0.2 [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:0L [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:1.1 [1] -0.2 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:1L [1] -0.2 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:2.3 [1] -0.2 0.8 1.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:2.999999999 [1] -0.2 0.8 1.8 2.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:2L [1] -0.2 0.8 1.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:30L [1] -0.2 0.8 1.8 2.8 3.8 4.8 5.8 6.8 7.8 8.8 9.8 10.8 11.8 12.8 13.8 [16] 14.8 15.8 16.8 17.8 18.8 19.8 20.8 21.8 22.8 23.8 24.8 25.8 26.8 27.8 28.8 [31] 29.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:33.3 [1] -0.2 0.8 1.8 2.8 3.8 4.8 5.8 6.8 7.8 8.8 9.8 10.8 11.8 12.8 13.8 [16] 14.8 15.8 16.8 17.8 18.8 19.8 20.8 21.8 22.8 23.8 24.8 25.8 26.8 27.8 28.8 [31] 29.8 30.8 31.8 32.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:5 [1] -0.2 0.8 1.8 2.8 3.8 4.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:FALSE [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-0.2:TRUE [1] -0.2 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:-0.2 [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:-1.1 [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:-1L [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:-2.999999999 [1] -1.1 -2.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:-30L [1] -1.1 -2.1 -3.1 -4.1 -5.1 -6.1 -7.1 -8.1 -9.1 -10.1 -11.1 -12.1 [13] -13.1 -14.1 -15.1 -16.1 -17.1 -18.1 -19.1 -20.1 -21.1 -22.1 -23.1 -24.1 [25] -25.1 -26.1 -27.1 -28.1 -29.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:-33.3 [1] -1.1 -2.1 -3.1 -4.1 -5.1 -6.1 -7.1 -8.1 -9.1 -10.1 -11.1 -12.1 [13] -13.1 -14.1 -15.1 -16.1 -17.1 -18.1 -19.1 -20.1 -21.1 -22.1 -23.1 -24.1 [25] -25.1 -26.1 -27.1 -28.1 -29.1 -30.1 -31.1 -32.1 -33.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:-5 [1] -1.1 -2.1 -3.1 -4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:0.2 [1] -1.1 -0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:0L [1] -1.1 -0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:1.1 [1] -1.1 -0.1 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:1L [1] -1.1 -0.1 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:2.3 [1] -1.1 -0.1 0.9 1.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:2.999999999 [1] -1.1 -0.1 0.9 1.9 2.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:2L [1] -1.1 -0.1 0.9 1.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:30L [1] -1.1 -0.1 0.9 1.9 2.9 3.9 4.9 5.9 6.9 7.9 8.9 9.9 10.9 11.9 12.9 [16] 13.9 14.9 15.9 16.9 17.9 18.9 19.9 20.9 21.9 22.9 23.9 24.9 25.9 26.9 27.9 [31] 28.9 29.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:33.3 [1] -1.1 -0.1 0.9 1.9 2.9 3.9 4.9 5.9 6.9 7.9 8.9 9.9 10.9 11.9 12.9 [16] 13.9 14.9 15.9 16.9 17.9 18.9 19.9 20.9 21.9 22.9 23.9 24.9 25.9 26.9 27.9 [31] 28.9 29.9 30.9 31.9 32.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:5 [1] -1.1 -0.1 0.9 1.9 2.9 3.9 4.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:FALSE [1] -1.1 -0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1.1:TRUE [1] -1.1 -0.1 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:-0.2 [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:-1.1 [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:-1L [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:-2.999999999 [1] -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:-30L [1] -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 [20] -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:-33.3 [1] -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 [20] -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:-5 [1] -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:0.2 [1] -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:0L [1] -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:1.1 [1] -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:1L [1] -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:2.3 [1] -1 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:2.999999999 [1] -1 0 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:2L [1] -1 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:30L [1] -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 [26] 24 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:33.3 [1] -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 [26] 24 25 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:5 [1] -1 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:FALSE [1] -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-1L:TRUE [1] -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:-0.2 [1] -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:-1.1 [1] -3 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:-1L [1] -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:-2.999999999 [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:-30L [1] -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 [20] -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:-33.3 [1] -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 [20] -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:-5 [1] -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:0.2 [1] -3e+00 -2e+00 -1e+00 1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:0L [1] -3e+00 -2e+00 -1e+00 1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:1.1 [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:1L [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:2.3 [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 2e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:2.999999999 [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 2e+00 3e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:2L [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 2e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:30L [1] -3.0e+00 -2.0e+00 -1.0e+00 1.0e-09 1.0e+00 2.0e+00 3.0e+00 4.0e+00 [9] 5.0e+00 6.0e+00 7.0e+00 8.0e+00 9.0e+00 1.0e+01 1.1e+01 1.2e+01 [17] 1.3e+01 1.4e+01 1.5e+01 1.6e+01 1.7e+01 1.8e+01 1.9e+01 2.0e+01 [25] 2.1e+01 2.2e+01 2.3e+01 2.4e+01 2.5e+01 2.6e+01 2.7e+01 2.8e+01 [33] 2.9e+01 3.0e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:33.3 [1] -3.0e+00 -2.0e+00 -1.0e+00 1.0e-09 1.0e+00 2.0e+00 3.0e+00 4.0e+00 [9] 5.0e+00 6.0e+00 7.0e+00 8.0e+00 9.0e+00 1.0e+01 1.1e+01 1.2e+01 [17] 1.3e+01 1.4e+01 1.5e+01 1.6e+01 1.7e+01 1.8e+01 1.9e+01 2.0e+01 [25] 2.1e+01 2.2e+01 2.3e+01 2.4e+01 2.5e+01 2.6e+01 2.7e+01 2.8e+01 [33] 2.9e+01 3.0e+01 3.1e+01 3.2e+01 3.3e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:5 [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 2e+00 3e+00 4e+00 5e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:FALSE [1] -3e+00 -2e+00 -1e+00 1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-2.999999999:TRUE [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:-0.2 [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:-1.1 [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:-1L [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:-2.999999999 [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:-30L [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:-33.3 [1] -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:-5 [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:0.2 [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:0L [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:1.1 [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:1L [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:2.3 [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:2.999999999 [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:2L [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:30L [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 [39] 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 [58] 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:33.3 [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 [39] 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 [58] 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:5 [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:FALSE [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-30L:TRUE [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:-0.2 [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:-1.1 [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:-1L [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:-2.999999999 [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:-30L [1] -33.3 -32.3 -31.3 -30.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:-33.3 [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:-5 [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:0.2 [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:0L [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:1.1 [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:1L [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:2.3 [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:2.999999999 [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:2L [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:30L [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 3.7 4.7 5.7 6.7 7.7 8.7 9.7 10.7 11.7 12.7 13.7 [49] 14.7 15.7 16.7 17.7 18.7 19.7 20.7 21.7 22.7 23.7 24.7 25.7 [61] 26.7 27.7 28.7 29.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:33.3 [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 3.7 4.7 5.7 6.7 7.7 8.7 9.7 10.7 11.7 12.7 13.7 [49] 14.7 15.7 16.7 17.7 18.7 19.7 20.7 21.7 22.7 23.7 24.7 25.7 [61] 26.7 27.7 28.7 29.7 30.7 31.7 32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:5 [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 3.7 4.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:FALSE [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-33.3:TRUE [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:-0.2 [1] -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:-1.1 [1] -5 -4 -3 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:-1L [1] -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:-2.999999999 [1] -5 -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:-30L [1] -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 [20] -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:-33.3 [1] -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 [20] -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:-5 [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:0.2 [1] -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:0L [1] -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:1.1 [1] -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:1L [1] -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:2.3 [1] -5 -4 -3 -2 -1 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:2.999999999 [1] -5 -4 -3 -2 -1 0 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:2L [1] -5 -4 -3 -2 -1 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:30L [1] -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 [26] 20 21 22 23 24 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:33.3 [1] -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 [26] 20 21 22 23 24 25 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:5 [1] -5 -4 -3 -2 -1 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:FALSE [1] -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #-5:TRUE [1] -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:-0.2 [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:-1.1 [1] 0.2 -0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:-1L [1] 0.2 -0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:-2.999999999 [1] 0.2 -0.8 -1.8 -2.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:-30L [1] 0.2 -0.8 -1.8 -2.8 -3.8 -4.8 -5.8 -6.8 -7.8 -8.8 -9.8 -10.8 [13] -11.8 -12.8 -13.8 -14.8 -15.8 -16.8 -17.8 -18.8 -19.8 -20.8 -21.8 -22.8 [25] -23.8 -24.8 -25.8 -26.8 -27.8 -28.8 -29.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:-33.3 [1] 0.2 -0.8 -1.8 -2.8 -3.8 -4.8 -5.8 -6.8 -7.8 -8.8 -9.8 -10.8 [13] -11.8 -12.8 -13.8 -14.8 -15.8 -16.8 -17.8 -18.8 -19.8 -20.8 -21.8 -22.8 [25] -23.8 -24.8 -25.8 -26.8 -27.8 -28.8 -29.8 -30.8 -31.8 -32.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:-5 [1] 0.2 -0.8 -1.8 -2.8 -3.8 -4.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:0.2 [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:0L [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:1.1 [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:1L [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:2.3 [1] 0.2 1.2 2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:2.999999999 [1] 0.2 1.2 2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:2L [1] 0.2 1.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:30L [1] 0.2 1.2 2.2 3.2 4.2 5.2 6.2 7.2 8.2 9.2 10.2 11.2 12.2 13.2 14.2 [16] 15.2 16.2 17.2 18.2 19.2 20.2 21.2 22.2 23.2 24.2 25.2 26.2 27.2 28.2 29.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:33.3 [1] 0.2 1.2 2.2 3.2 4.2 5.2 6.2 7.2 8.2 9.2 10.2 11.2 12.2 13.2 14.2 [16] 15.2 16.2 17.2 18.2 19.2 20.2 21.2 22.2 23.2 24.2 25.2 26.2 27.2 28.2 29.2 [31] 30.2 31.2 32.2 33.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:5 [1] 0.2 1.2 2.2 3.2 4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:FALSE [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0.2:TRUE [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:-0.2 [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:-1.1 [1] 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:-1L [1] 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:-2.999999999 [1] 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:-30L [1] 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 [20] -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:-33.3 [1] 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 [20] -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:-5 [1] 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:0.2 [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:0L [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:1.1 [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:1L [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:2.3 [1] 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:2.999999999 [1] 0 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:2L [1] 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:30L [1] 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 [26] 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:33.3 [1] 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 [26] 25 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:5 [1] 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:FALSE [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #0L:TRUE [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:-0.2 [1] 1.1 0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:-1.1 [1] 1.1 0.1 -0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:-1L [1] 1.1 0.1 -0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:-2.999999999 [1] 1.1 0.1 -0.9 -1.9 -2.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:-30L [1] 1.1 0.1 -0.9 -1.9 -2.9 -3.9 -4.9 -5.9 -6.9 -7.9 -8.9 -9.9 [13] -10.9 -11.9 -12.9 -13.9 -14.9 -15.9 -16.9 -17.9 -18.9 -19.9 -20.9 -21.9 [25] -22.9 -23.9 -24.9 -25.9 -26.9 -27.9 -28.9 -29.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:-33.3 [1] 1.1 0.1 -0.9 -1.9 -2.9 -3.9 -4.9 -5.9 -6.9 -7.9 -8.9 -9.9 [13] -10.9 -11.9 -12.9 -13.9 -14.9 -15.9 -16.9 -17.9 -18.9 -19.9 -20.9 -21.9 [25] -22.9 -23.9 -24.9 -25.9 -26.9 -27.9 -28.9 -29.9 -30.9 -31.9 -32.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:-5 [1] 1.1 0.1 -0.9 -1.9 -2.9 -3.9 -4.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:0.2 [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:0L [1] 1.1 0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:1.1 [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:1L [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:2.3 [1] 1.1 2.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:2.999999999 [1] 1.1 2.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:2L [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:30L [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 11.1 12.1 13.1 14.1 15.1 [16] 16.1 17.1 18.1 19.1 20.1 21.1 22.1 23.1 24.1 25.1 26.1 27.1 28.1 29.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:33.3 [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 11.1 12.1 13.1 14.1 15.1 [16] 16.1 17.1 18.1 19.1 20.1 21.1 22.1 23.1 24.1 25.1 26.1 27.1 28.1 29.1 30.1 [31] 31.1 32.1 33.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:5 [1] 1.1 2.1 3.1 4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:FALSE [1] 1.1 0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1.1:TRUE [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:-0.2 [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:-1.1 [1] 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:-1L [1] 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:-2.999999999 [1] 1 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:-30L [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 [20] -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:-33.3 [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 [20] -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:-5 [1] 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:0.2 [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:0L [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:1.1 [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:1L [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:2.3 [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:2.999999999 [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:2L [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:30L [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:33.3 [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:5 [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:FALSE [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #1L:TRUE [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:-0.2 [1] 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:-1.1 [1] 2.3 1.3 0.3 -0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:-1L [1] 2.3 1.3 0.3 -0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:-2.999999999 [1] 2.3 1.3 0.3 -0.7 -1.7 -2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:-30L [1] 2.3 1.3 0.3 -0.7 -1.7 -2.7 -3.7 -4.7 -5.7 -6.7 -7.7 -8.7 [13] -9.7 -10.7 -11.7 -12.7 -13.7 -14.7 -15.7 -16.7 -17.7 -18.7 -19.7 -20.7 [25] -21.7 -22.7 -23.7 -24.7 -25.7 -26.7 -27.7 -28.7 -29.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:-33.3 [1] 2.3 1.3 0.3 -0.7 -1.7 -2.7 -3.7 -4.7 -5.7 -6.7 -7.7 -8.7 [13] -9.7 -10.7 -11.7 -12.7 -13.7 -14.7 -15.7 -16.7 -17.7 -18.7 -19.7 -20.7 [25] -21.7 -22.7 -23.7 -24.7 -25.7 -26.7 -27.7 -28.7 -29.7 -30.7 -31.7 -32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:-5 [1] 2.3 1.3 0.3 -0.7 -1.7 -2.7 -3.7 -4.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:0.2 [1] 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:0L [1] 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:1.1 [1] 2.3 1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:1L [1] 2.3 1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:2.3 [1] 2.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:2.999999999 [1] 2.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:2L [1] 2.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:30L [1] 2.3 3.3 4.3 5.3 6.3 7.3 8.3 9.3 10.3 11.3 12.3 13.3 14.3 15.3 16.3 [16] 17.3 18.3 19.3 20.3 21.3 22.3 23.3 24.3 25.3 26.3 27.3 28.3 29.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:33.3 [1] 2.3 3.3 4.3 5.3 6.3 7.3 8.3 9.3 10.3 11.3 12.3 13.3 14.3 15.3 16.3 [16] 17.3 18.3 19.3 20.3 21.3 22.3 23.3 24.3 25.3 26.3 27.3 28.3 29.3 30.3 31.3 [31] 32.3 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:5 [1] 2.3 3.3 4.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:FALSE [1] 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.3:TRUE [1] 2.3 1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:-0.2 [1] 3e+00 2e+00 1e+00 -1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:-1.1 [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:-1L [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:-2.999999999 [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 -2e+00 -3e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:-30L [1] 3.0e+00 2.0e+00 1.0e+00 -1.0e-09 -1.0e+00 -2.0e+00 -3.0e+00 -4.0e+00 [9] -5.0e+00 -6.0e+00 -7.0e+00 -8.0e+00 -9.0e+00 -1.0e+01 -1.1e+01 -1.2e+01 [17] -1.3e+01 -1.4e+01 -1.5e+01 -1.6e+01 -1.7e+01 -1.8e+01 -1.9e+01 -2.0e+01 [25] -2.1e+01 -2.2e+01 -2.3e+01 -2.4e+01 -2.5e+01 -2.6e+01 -2.7e+01 -2.8e+01 [33] -2.9e+01 -3.0e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:-33.3 [1] 3.0e+00 2.0e+00 1.0e+00 -1.0e-09 -1.0e+00 -2.0e+00 -3.0e+00 -4.0e+00 [9] -5.0e+00 -6.0e+00 -7.0e+00 -8.0e+00 -9.0e+00 -1.0e+01 -1.1e+01 -1.2e+01 [17] -1.3e+01 -1.4e+01 -1.5e+01 -1.6e+01 -1.7e+01 -1.8e+01 -1.9e+01 -2.0e+01 [25] -2.1e+01 -2.2e+01 -2.3e+01 -2.4e+01 -2.5e+01 -2.6e+01 -2.7e+01 -2.8e+01 [33] -2.9e+01 -3.0e+01 -3.1e+01 -3.2e+01 -3.3e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:-5 [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 -2e+00 -3e+00 -4e+00 -5e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:0.2 [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:0L [1] 3e+00 2e+00 1e+00 -1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:1.1 [1] 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:1L [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:2.3 [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:2.999999999 [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:2L [1] 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:30L [1] 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 [26] 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:33.3 [1] 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 [26] 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:5 [1] 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:FALSE [1] 3e+00 2e+00 1e+00 -1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2.999999999:TRUE [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:-0.2 [1] 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:-1.1 [1] 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:-1L [1] 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:-2.999999999 [1] 2 1 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:-30L [1] 2 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 [20] -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:-33.3 [1] 2 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 [20] -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:-5 [1] 2 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:0.2 [1] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:0L [1] 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:1.1 [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:1L [1] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:2.3 [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:2.999999999 [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:2L [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:30L [1] 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 [26] 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:33.3 [1] 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 [26] 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:5 [1] 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:FALSE [1] 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #2L:TRUE [1] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:-0.2 [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:-1.1 [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:-1L [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:-2.999999999 [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:-30L [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 [20] 11 10 9 8 7 6 5 4 3 2 1 0 -1 -2 -3 -4 -5 -6 -7 [39] -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 [58] -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:-33.3 [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 [20] 11 10 9 8 7 6 5 4 3 2 1 0 -1 -2 -3 -4 -5 -6 -7 [39] -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 [58] -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:-5 [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:0.2 [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:0L [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:1.1 [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:1L [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:2.3 [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:2.999999999 [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:2L [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:30L [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:33.3 [1] 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:5 [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:FALSE [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #30L:TRUE [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:-0.2 [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:-1.1 [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:-1L [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:-2.999999999 [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 -1.7 -2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:-30L [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 [13] 21.3 20.3 19.3 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 [25] 9.3 8.3 7.3 6.3 5.3 4.3 3.3 2.3 1.3 0.3 -0.7 -1.7 [37] -2.7 -3.7 -4.7 -5.7 -6.7 -7.7 -8.7 -9.7 -10.7 -11.7 -12.7 -13.7 [49] -14.7 -15.7 -16.7 -17.7 -18.7 -19.7 -20.7 -21.7 -22.7 -23.7 -24.7 -25.7 [61] -26.7 -27.7 -28.7 -29.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:-33.3 [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 [13] 21.3 20.3 19.3 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 [25] 9.3 8.3 7.3 6.3 5.3 4.3 3.3 2.3 1.3 0.3 -0.7 -1.7 [37] -2.7 -3.7 -4.7 -5.7 -6.7 -7.7 -8.7 -9.7 -10.7 -11.7 -12.7 -13.7 [49] -14.7 -15.7 -16.7 -17.7 -18.7 -19.7 -20.7 -21.7 -22.7 -23.7 -24.7 -25.7 [61] -26.7 -27.7 -28.7 -29.7 -30.7 -31.7 -32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:-5 [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 -1.7 -2.7 -3.7 -4.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:0.2 [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:0L [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:1.1 [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:1L [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:2.3 [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:2.999999999 [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:2L [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:30L [1] 33.3 32.3 31.3 30.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:33.3 [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:5 [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:FALSE [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #33.3:TRUE [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:-0.2 [1] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:-1.1 [1] 5 4 3 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:-1L [1] 5 4 3 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:-2.999999999 [1] 5 4 3 2 1 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:-30L [1] 5 4 3 2 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 [20] -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:-33.3 [1] 5 4 3 2 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 [20] -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 [39] -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:-5 [1] 5 4 3 2 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:0.2 [1] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:0L [1] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:1.1 [1] 5 4 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:1L [1] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:2.3 [1] 5 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:2.999999999 [1] 5 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:2L [1] 5 4 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:30L [1] 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 [26] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:33.3 [1] 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 [26] 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:5 [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:FALSE [1] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #5:TRUE [1] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:-0.2 [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:-1.1 [1] 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:-1L [1] 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:-2.999999999 [1] 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:-30L [1] 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 [20] -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:-33.3 [1] 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 [20] -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:-5 [1] 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:0.2 [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:0L [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:1.1 [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:1L [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:2.3 [1] 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:2.999999999 [1] 0 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:2L [1] 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:30L [1] 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 [26] 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:33.3 [1] 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 [26] 25 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:5 [1] 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:FALSE [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #FALSE:TRUE [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:-0.2 [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:-1.1 [1] 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:-1L [1] 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:-2.999999999 [1] 1 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:-30L [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 [20] -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:-33.3 [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 [20] -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:-5 [1] 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:0.2 [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:0L [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:1.1 [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:1L [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:2.3 [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:2.999999999 [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:2L [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:30L [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:33.3 [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:5 [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:FALSE [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_colon.testOne# #TRUE:TRUE [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_comment.testCommentS4# #{ setClass('CommentS4Test', representation(f='numeric')); x <- new('CommentS4Test'); attr(x, 'comment') <- 'comment ABC'; comment(x); } [1] "comment ABC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_comment.testcomment1# #argv <- list(NULL); .Internal(comment(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_comment.testcomment2# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0'))); .Internal(comment(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_comment.testcomment3# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L))); .Internal(comment(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_comment.testcomment4# #argv <- list(structure(1:12, .Dim = 3:4, comment = c('This is my very important data from experiment #0234', 'Jun 5, 1998'))); .Internal(comment(argv[[1]])) [1] "This is my very important data from experiment #0234" [2] "Jun 5, 1998" ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testCommentAssign# #{ x <- matrix(1:12, 3, 4); comment(x) <- c('This is my very important data from experiment #0234', 'Jun 5, 1998'); print(x); comment(x) } [,1] [,2] [,3] [,4] [1,] 1 4 7 10 [2,] 2 5 8 11 [3,] 3 6 9 12 [1] "This is my very important data from experiment #0234" [2] "Jun 5, 1998" ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testCommentAssignS4# #{ setClass('CommentAssignS4Test', representation(f='numeric')); x <- new('CommentAssignS4Test'); comment(x) <- 'comment CDE'; attr(x, 'comment'); } [1] "comment CDE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign1# #argv <- list(structure(1:12, .Dim = 3:4, comment = c('This is my very important data from experiment #0234', 'Jun 5, 1998')), c('This is my very important data from experiment #0234', 'Jun 5, 1998')); .Internal(`comment<-`(argv[[1]], argv[[2]])) [,1] [,2] [,3] [,4] [1,] 1 4 7 10 [2,] 2 5 8 11 [3,] 3 6 9 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign2# #argv <- list(character(0), NULL); .Internal(`comment<-`(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign3# #argv <- list(logical(0), NULL); .Internal(`comment<-`(argv[[1]], argv[[2]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4# #foo <- function(x) 3*x; bar <- foo; comment(foo) <- 'hello'; comment(foo); comment(bar) [1] "hello" NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4# #foo <- function(x) 3*x; comment(foo) <- 'hello'; bar <- foo; comment(foo) <- NULL; comment(foo); comment(bar) NULL [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4# #x <- c(1,2); comment(x) <- 'hello'; y <- x; comment(x) <- NULL; comment(x); comment(y) NULL [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4# #x <- c(1,2); y <- x; comment(x) <- 'hello'; comment(x); comment(y) [1] "hello" NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4# #x<-42; comment(x) <- 'a' ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4#Output.IgnoreErrorContext# #x<-42; comment(x) <- 1 Error in `comment<-`(`*tmp*`, value = 1) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4#Output.IgnoreErrorContext# #x<-42; comment(x) <- NA Error in `comment<-`(`*tmp*`, value = NA) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4# #x<-42; comment(x) <- NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4# #x<-42; comment(x) <- c('a', 'b') ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4# #x<-42; comment(x) <- c('a', NA) ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4#Output.IgnoreErrorContext# #x<-42; comment(x) <- c(1, 2) Error in `comment<-`(`*tmp*`, value = c(1, 2)) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4#Output.IgnoreErrorContext# #x<-42; comment(x) <- c(NA) Error in `comment<-`(`*tmp*`, value = NA) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4# #x<-42; comment(x) <- c(NA, 'a', NA) ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4#Output.IgnoreErrorContext# #x<-42; comment(x) <- c(NA, NA) Error in `comment<-`(`*tmp*`, value = c(NA, NA)) : attempt to set invalid 'comment' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4# #x<-NA; comment(x) <- 'a' ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4#Output.IgnoreErrorContext# #x<-NULL; comment(x) <- 'a' Error in `comment<-`(`*tmp*`, value = "a") : attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_commentassign.testcommentassign4#Output.IgnoreErrorContext# #x<-c(); comment(x) <- 'a' Error in `comment<-`(`*tmp*`, value = "a") : attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testComplex# #{ complex(3) } [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testComplex#Output.IgnoreErrorMessage# #{ complex(3, 3, new.env()) } Error in complex(3, 3, new.env()) : environments cannot be coerced to other types ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testComplex# #{ complex(3, c(1,2), c(4,5,6)) } [1] 1+4i 2+5i 1+6i ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testComplex# #{ complex(3, c(1,2,3), c(4,5)) } [1] 1+4i 2+5i 3+4i ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testComplex# #{ complex(3, c(1,2,3), c(4,5,6)) } [1] 1+4i 2+5i 3+6i ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testComplex#Output.IgnoreErrorMessage# #{ complex(3, new.env()) } Error in complex(3, new.env()) : environments cannot be coerced to other types ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testComplex#Output.IgnoreErrorMessage# #{ complex(new.env()) } Error in complex(new.env()) : invalid length ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testComplex# #{ complex(real=1,imag=2) } [1] 1+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testComplex# #{ complex(real=1,imaginary=2) } [1] 1+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testcomplex1# #argv <- list(0, numeric(0), numeric(0)); .Internal(complex(argv[[1]], argv[[2]], argv[[3]])) complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testcomplex2# #argv <- list(FALSE, FALSE, numeric(0)); .Internal(complex(argv[[1]], argv[[2]], argv[[3]])) [1] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testcomplex3# #argv <- list(0L, 1:10, c(1, 1.4142135623731, 1.73205080756888, 2, 2.23606797749979, 2.44948974278318, 2.64575131106459, 2.82842712474619, 3, 3.16227766016838)); .Internal(complex(argv[[1]], argv[[2]], argv[[3]])) [1] 1+1.000000i 2+1.414214i 3+1.732051i 4+2.000000i 5+2.236068i [6] 6+2.449490i 7+2.645751i 8+2.828427i 9+3.000000i 10+3.162278i ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testcomplex4# #argv <- list(0L, NA_real_, NA_real_); .Internal(complex(argv[[1]], argv[[2]], argv[[3]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testcomplex5# #argv <- list(0L, c(-0.560475646552213, -0.23017748948328, 1.55870831414912, 0.070508391424576, 0.129287735160946, 1.71506498688328, 0.460916205989202, -1.26506123460653, -0.686852851893526, -0.445661970099958, 1.22408179743946, 0.359813827057364, 0.400771450594052, 0.11068271594512, -0.555841134754075, 1.78691313680308, 0.497850478229239, -1.96661715662964, 0.701355901563686, -0.472791407727934, -1.06782370598685, -0.217974914658295, -1.02600444830724, -0.72889122929114, -0.625039267849257, -1.68669331074241, 0.837787044494525, 0.153373117836515, -1.13813693701195, 1.25381492106993, 0.426464221476814, -0.295071482992271, 0.895125661045022, 0.878133487533042, 0.821581081637487, 0.688640254100091, 0.553917653537589, -0.0619117105767217, -0.305962663739917, -0.380471001012383, -0.694706978920513, -0.207917278019599, -1.26539635156826, 2.16895596533851, 1.20796199830499, -1.12310858320335, -0.402884835299076, -0.466655353623219, 0.779965118336318, -0.0833690664718293, 0.253318513994755, -0.028546755348703, -0.0428704572913161, 1.36860228401446, -0.225770985659268, 1.51647060442954, -1.54875280423022, 0.584613749636069, 0.123854243844614, 0.215941568743973, 0.379639482759882, -0.502323453109302, -0.33320738366942, -1.01857538310709, -1.07179122647558, 0.303528641404258, 0.448209778629426, 0.0530042267305041, 0.922267467879738, 2.05008468562714, -0.491031166056535, -2.30916887564081, 1.00573852446226, -0.709200762582393, -0.688008616467358, 1.0255713696967, -0.284773007051009, -1.22071771225454, 0.18130347974915, -0.138891362439045, 0.00576418589988693, 0.38528040112633, -0.370660031792409, 0.644376548518833, -0.220486561818751, 0.331781963915697, 1.09683901314935, 0.435181490833803, -0.325931585531227, 1.14880761845109, 0.993503855962119, 0.54839695950807, 0.238731735111441, -0.627906076039371, 1.36065244853001, -0.600259587147127, 2.18733299301658, 1.53261062618519, -0.235700359100477, -1.02642090030678), c(-0.710406563699301, 0.25688370915653, -0.246691878462374, -0.347542599397733, -0.951618567265016, -0.0450277248089203, -0.784904469457076, -1.66794193658814, -0.380226520287762, 0.918996609060766, -0.575346962608392, 0.607964322225033, -1.61788270828916, -0.0555619655245394, 0.519407203943462, 0.301153362166714, 0.105676194148943, -0.640706008305376, -0.849704346033582, -1.02412879060491, 0.117646597100126, -0.947474614184802, -0.490557443700668, -0.256092192198247, 1.84386200523221, -0.651949901695459, 0.235386572284857, 0.0779608495637108, -0.961856634130129, -0.0713080861235987, 1.44455085842335, 0.451504053079215, 0.0412329219929399, -0.422496832339625, -2.05324722154052, 1.13133721341418, -1.46064007092482, 0.739947510877334, 1.90910356921748, -1.4438931609718, 0.701784335374711, -0.262197489402468, -1.57214415914549, -1.51466765378175, -1.60153617357459, -0.530906522170303, -1.4617555849959, 0.687916772975828, 2.10010894052567, -1.28703047603518, 0.787738847475178, 0.76904224100091, 0.332202578950118, -1.00837660827701, -0.119452606630659, -0.280395335170247, 0.56298953322048, -0.372438756103829, 0.976973386685621, -0.374580857767014, 1.05271146557933, -1.04917700666607, -1.26015524475811, 3.2410399349424, -0.416857588160432, 0.298227591540715, 0.636569674033849, -0.483780625708744, 0.516862044313609, 0.368964527385086, -0.215380507641693, 0.0652930335253153, -0.034067253738464, 2.12845189901618, -0.741336096272828, -1.09599626707466, 0.0377883991710788, 0.310480749443137, 0.436523478910183, -0.458365332711106, -1.06332613397119, 1.26318517608949, -0.349650387953555, -0.865512862653374, -0.236279568941097, -0.197175894348552, 1.10992028971364, 0.0847372921971965, 0.754053785184521, -0.499292017172261, 0.214445309581601, -0.324685911490835, 0.0945835281735714, -0.895363357977542, -1.31080153332797, 1.99721338474797, 0.600708823672418, -1.25127136162494, -0.611165916680421, -1.18548008459731)); .Internal(complex(argv[[1]], argv[[2]], argv[[3]])) [1] -0.5604756-0.7104066i -0.2301775+0.2568837i 1.5587083-0.2466919i [4] 0.0705084-0.3475426i 0.1292877-0.9516186i 1.7150650-0.0450277i [7] 0.4609162-0.7849045i -1.2650612-1.6679419i -0.6868529-0.3802265i [10] -0.4456620+0.9189966i 1.2240818-0.5753470i 0.3598138+0.6079643i [13] 0.4007715-1.6178827i 0.1106827-0.0555620i -0.5558411+0.5194072i [16] 1.7869131+0.3011534i 0.4978505+0.1056762i -1.9666172-0.6407060i [19] 0.7013559-0.8497043i -0.4727914-1.0241288i -1.0678237+0.1176466i [22] -0.2179749-0.9474746i -1.0260044-0.4905574i -0.7288912-0.2560922i [25] -0.6250393+1.8438620i -1.6866933-0.6519499i 0.8377870+0.2353866i [28] 0.1533731+0.0779608i -1.1381369-0.9618566i 1.2538149-0.0713081i [31] 0.4264642+1.4445509i -0.2950715+0.4515041i 0.8951257+0.0412329i [34] 0.8781335-0.4224968i 0.8215811-2.0532472i 0.6886403+1.1313372i [37] 0.5539177-1.4606401i -0.0619117+0.7399475i -0.3059627+1.9091036i [40] -0.3804710-1.4438932i -0.6947070+0.7017843i -0.2079173-0.2621975i [43] -1.2653964-1.5721442i 2.1689560-1.5146677i 1.2079620-1.6015362i [46] -1.1231086-0.5309065i -0.4028848-1.4617556i -0.4666554+0.6879168i [49] 0.7799651+2.1001089i -0.0833691-1.2870305i 0.2533185+0.7877388i [52] -0.0285468+0.7690422i -0.0428705+0.3322026i 1.3686023-1.0083766i [55] -0.2257710-0.1194526i 1.5164706-0.2803953i -1.5487528+0.5629895i [58] 0.5846137-0.3724388i 0.1238542+0.9769734i 0.2159416-0.3745809i [61] 0.3796395+1.0527115i -0.5023235-1.0491770i -0.3332074-1.2601552i [64] -1.0185754+3.2410399i -1.0717912-0.4168576i 0.3035286+0.2982276i [67] 0.4482098+0.6365697i 0.0530042-0.4837806i 0.9222675+0.5168620i [70] 2.0500847+0.3689645i -0.4910312-0.2153805i -2.3091689+0.0652930i [73] 1.0057385-0.0340673i -0.7092008+2.1284519i -0.6880086-0.7413361i [76] 1.0255714-1.0959963i -0.2847730+0.0377884i -1.2207177+0.3104807i [79] 0.1813035+0.4365235i -0.1388914-0.4583653i 0.0057642-1.0633261i [82] 0.3852804+1.2631852i -0.3706600-0.3496504i 0.6443765-0.8655129i [85] -0.2204866-0.2362796i 0.3317820-0.1971759i 1.0968390+1.1099203i [88] 0.4351815+0.0847373i -0.3259316+0.7540538i 1.1488076-0.4992920i [91] 0.9935039+0.2144453i 0.5483970-0.3246859i 0.2387317+0.0945835i [94] -0.6279061-0.8953634i 1.3606524-1.3108015i -0.6002596+1.9972134i [97] 2.1873330+0.6007088i 1.5326106-1.2512714i -0.2357004-0.6111659i [100] -1.0264209-1.1854801i ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testcomplex6# #argv <- list(0L, numeric(0), numeric(0)); .Internal(complex(argv[[1]], argv[[2]], argv[[3]])) complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_complex.testcomplex7# #argv <- list(0L, NULL, numeric(0)); .Internal(complex(argv[[1]], argv[[2]], argv[[3]])) complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testCopyDDFattr# #{ x<-7; attr(x, "foo")<-"foo"; y<-42; z<-.Internal(copyDFattr(x, y)); attributes(z) } $foo [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testCopyDDFattr# #{ x<-data.frame(a=c(1,2), b=c(11,12)); y<-7; attr(y, "foo")<-"foo"; z<-.Internal(copyDFattr(y, x)); attributes(z) } $foo [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testCopyDDFattr# #{ x<-data.frame(a=c(1,2), b=c(11,12)); y<-7; z<-.Internal(copyDFattr(y, x)); attributes(z) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testCopyDDFattr# #{ x<-data.frame(c(1,2), c(11,12)); attr(x, "dim")<-c(1,2); attr(x, "dimnames")<-list("a", c("b", "c")); y<-c(7, 42); z<-.Internal(copyDFattr(x, y)); attributes(z) } $names [1] "c.1..2." "c.11..12." $class [1] "data.frame" $row.names [1] 1 2 $dim [1] 1 2 $dimnames $dimnames[[1]] [1] "a" $dimnames[[2]] [1] "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testCopyDDFattrAltersItsSecondArg#Ignored.ImplementationError# #{ x<-7; attr(x, "foo")<-"foo"; y<-42; .Internal(copyDFattr(x, y)); y } [1] 42 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr1# #argv <- list(structure(list(size = 1056, isdir = FALSE, mode = structure(420L, class = 'octmode'), mtime = structure(1395082115.08988, class = c('POSIXct', 'POSIXt')), ctime = structure(1395082122.18188, class = c('POSIXct', 'POSIXt')), atime = structure(1395082175.70988, class = c('POSIXct', 'POSIXt')), uid = 1001L, gid = 1001L, uname = 'roman', grname = 'roman'), .Names = c('size', 'isdir', 'mode', 'mtime', 'ctime', 'atime', 'uid', 'gid', 'uname', 'grname'), class = 'data.frame', row.names = '/home/roman/r-instrumented/tests/myLib/pkgA/R/pkgA'), structure(list( size = NULL, isdir = NULL, mode = NULL, mtime = NULL, ctime = NULL, atime = NULL, uid = NULL, gid = NULL, uname = NULL, grname = NULL), .Names = c('size', 'isdir', 'mode', 'mtime', 'ctime', 'atime', 'uid', 'gid', 'uname', 'grname'), class = 'data.frame', row.names = '/home/roman/r-instrumented/tests/myLib/pkgA/R/pkgA')); .Internal(copyDFattr(argv[[1]], argv[[2]])) size isdir mode mtime ctime /home/roman/r-instrumented/tests/myLib/pkgA/R/pkgA NULL NULL NULL NULL NULL atime uid gid uname grname /home/roman/r-instrumented/tests/myLib/pkgA/R/pkgA NULL NULL NULL NULL NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr10#Output.IgnoreErrorContext# #argv <- list(structure(list(Df = c(1, 1, 1, 1, 16), `Sum Sq` = c(309.6845, 0.420500000000001, 4.90050000000001, 3.9605, 64.924), `Mean Sq` = c(309.6845, 0.420500000000001, 4.90050000000001, 3.9605, 4.05775), `F value` = c(76.3192656028586, 0.103628858357464, 1.20768899020393, 0.976033516111146, NA), `Pr(>F)` = c(1.73825946976405e-07, 0.751685166772039, 0.288052080502172, 0.337885793589305, NA)), .Names = c('Df', 'Sum Sq', 'Mean Sq', 'F value', 'Pr(>F)'), class = c('anova', 'data.frame'), row.names = c('(Intercept) ', 'rate ', 'additive ', 'rate:additive', 'Residuals ')), structure(list(Df = NULL, `Sum Sq` = NULL, `Mean Sq` = NULL, `F value` = NULL, `Pr(>F)` = NULL), .Names = c('Df', 'Sum Sq', 'Mean Sq', 'F value', 'Pr(>F)'), class = c('anova', 'data.frame'), row.names = c('(Intercept) ', 'rate ', 'additive ', 'rate:additive', 'Residuals '))); .Internal(copyDFattr(argv[[1]], argv[[2]])) Error in `[[<-.data.frame`(`*tmp*`, i, value = numeric(0)) : replacement has 0 rows, data has 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr11# #argv <- list(structure(list(srcfile = c(NA, '/home/lzhao/hg/r-instrumented/library/stats/R/stats', '/home/lzhao/hg/r-instrumented/library/stats/R/stats', '/home/lzhao/hg/r-instrumented/library/stats/R/stats'), frow = c(NA, 2228L, 2369L, 2379L), lrow = c(NA, 2228L, 2369L, 2380L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 4L), class = 'data.frame'), structure(list(srcfile = NULL, frow = NULL, lrow = NULL), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 4L), class = 'data.frame')); .Internal(copyDFattr(argv[[1]], argv[[2]])) srcfile frow lrow 1 NULL NULL NULL 2 3 4 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr12# #argv <- list(structure(list(y = c(73, 73, 70, 74, 75, 115, 105, 107, 124, 107, 116, 125, 102, 144, 178, 149, 177, 124, 157, 128, 169, 165, 186, 152, 181, 139, 173, 151, 138, 181, 152, 188, 173, 196, 180, 171, 188, 174, 198, 172, 176, 162, 188, 182, 182, 141, 191, 190, 159, 170, 163, 197), x = c(1, 1, 1, 1, 1, 2, 2, 3, 3, 3, 3, 3, 3, 4, 4, 4, 5, 5, 5, 5, 6, 6, 6, 6, 6, 6, 7, 7, 7, 7, 7, 7, 7, 7, 7, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 9, 9, 9, 9, 9, 11, 12)), .Names = c('y', 'x'), class = 'data.frame', row.names = c(NA, 52L), terms = quote(~y + x)), structure(list(y = NULL, x = NULL), .Names = c('y', 'x'), class = 'data.frame', row.names = c(NA, 52L), terms = quote(~y + x))); .Internal(copyDFattr(argv[[1]], argv[[2]])) y x 1 NULL NULL 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr13#Ignored.ImplementationError# #argv <- list(structure(list(x = 1:10, y = c(-0.626453810742332, 0.183643324222082, -0.835628612410047, 1.59528080213779, 0.329507771815361, -0.820468384118015, 0.487429052428485, 0.738324705129217, 0.575781351653492, -0.305388387156356), z = structure(c(9L, 3L, 6L, 2L, 10L, 5L, 1L, 4L, 8L, 7L), .Label = c('a', 'c', 'f', 'h', 'i', 'p', 'v', 'x', 'y', 'z'), class = 'factor')), .Names = c('x', 'y', 'z'), row.names = c(NA, 10L), .S3Class = 'data.frame', timestamps = structure(1386392033.84327, class = c('POSIXct', 'POSIXt')), class = structure('myFrame', package = '.GlobalEnv')), structure(list(x = NULL, y = NULL, z = NULL), .Names = c('x', 'y', 'z'), row.names = c(NA, 10L), .S3Class = 'data.frame', timestamps = structure(1386392033.84327, class = c('POSIXct', 'POSIXt')), class = structure('myFrame', package = '.GlobalEnv'))); .Internal(copyDFattr(argv[[1]], argv[[2]])) $x NULL $y NULL $z NULL attr(,"row.names") [1] 1 2 3 4 5 6 7 8 9 10 attr(,".S3Class") [1] "data.frame" attr(,"timestamps") [1] "2013-12-07 04:53:53 GMT" attr(,"class") [1] "myFrame" attr(,"class")attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr14# #argv <- list(structure(list(y = c(-0.667819876370237, 0.170711734013213, 0.552921941721332, -0.253162069270378, -0.00786394222146348, 0.0246733498130512, 0.0730305465518564, -1.36919169254062, 0.0881443844426084, -0.0834190388782434)), .Names = 'y', class = 'data.frame', row.names = c(NA, 10L), terms = quote(y ~ 0)), structure(list(y = NULL), .Names = 'y', class = 'data.frame', row.names = c(NA, 10L), terms = quote(y ~ 0))); .Internal(copyDFattr(argv[[1]], argv[[2]])) y 1 NULL 2 3 4 5 6 7 8 9 10 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr15# #argv <- list(structure(list(`cbind(w = weight, w2 = weight^2)` = structure(c(4.17, 5.58, 5.18, 6.11, 4.5, 4.61, 5.17, 4.53, 5.33, 5.14, 4.81, 4.17, 4.41, 3.59, 5.87, 3.83, 6.03, 4.89, 4.32, 4.69, 17.3889, 31.1364, 26.8324, 37.3321, 20.25, 21.2521, 26.7289, 20.5209, 28.4089, 26.4196, 23.1361, 17.3889, 19.4481, 12.8881, 34.4569, 14.6689, 36.3609, 23.9121, 18.6624, 21.9961), .Dim = c(20L, 2L), .Dimnames = list(NULL, c('w', 'w2'))), group = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Ctl', 'Trt'), class = 'factor')), .Names = c('cbind(w = weight, w2 = weight^2)', 'group'), class = 'data.frame', row.names = c(NA, 20L), terms = quote(cbind(w = weight, w2 = weight^2) ~ group)), structure(list(`cbind(w = weight, w2 = weight^2)` = NULL, group = NULL), .Names = c('cbind(w = weight, w2 = weight^2)', 'group'), class = 'data.frame', row.names = c(NA, 20L), terms = quote(cbind(w = weight, w2 = weight^2) ~ group))); .Internal(copyDFattr(argv[[1]], argv[[2]])) cbind(w = weight, w2 = weight^2) group 1 NULL NULL 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr16# #argv <- list(structure(list(Y = c(130L, 157L, 174L, 117L, 114L, 161L, 141L, 105L, 140L, 118L, 156L, 61L, 91L, 97L, 100L, 70L, 108L, 126L, 149L, 96L, 124L, 121L, 144L, 68L, 64L, 112L, 86L, 60L, 102L, 89L, 96L, 89L, 129L, 132L, 124L, 74L, 89L, 81L, 122L, 64L, 103L, 132L, 133L, 70L, 89L, 104L, 117L, 62L, 90L, 100L, 116L, 80L, 82L, 94L, 126L, 63L, 70L, 109L, 99L, 53L, 74L, 118L, 113L, 89L, 82L, 86L, 104L, 97L, 99L, 119L, 121L), B = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L), .Label = c('I', 'II', 'III', 'IV', 'V', 'VI'), class = 'factor'), V = structure(c(3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L), .Label = c('Golden.rain', 'Marvellous', 'Victory'), class = 'factor'), N = structure(c(2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt'), class = 'factor')), .Names = c('Y', 'B', 'V', 'N'), terms = quote(Y ~ B + V + N + V:N), row.names = 2:72, class = 'data.frame'), structure(list(Y = NULL, B = NULL, V = NULL, N = NULL), .Names = c('Y', 'B', 'V', 'N'), terms = quote(Y ~ B + V + N + V:N), row.names = 2:72, class = 'data.frame')); .Internal(copyDFattr(argv[[1]], argv[[2]])) Y B V N 2 NULL NULL NULL NULL 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr17# #argv <- list(structure(list(Fr = c(32, 53, 10, 3, 11, 50, 10, 30, 10, 25, 7, 5, 3, 15, 7, 8, 36, 66, 16, 4, 9, 34, 7, 64, 5, 29, 7, 5, 2, 14, 7, 8), Hair = structure(c(1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('Black', 'Brown', 'Red', 'Blond'), class = 'factor'), Eye = structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L), .Label = c('Brown', 'Blue', 'Hazel', 'Green'), class = 'factor'), Sex = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Male', 'Female'), class = 'factor')), .Names = c('Fr', 'Hair', 'Eye', 'Sex'), class = 'data.frame', row.names = c(NA, 32L), terms = quote(Fr ~ (Hair + Eye + Sex)^2)), structure(list(Fr = NULL, Hair = NULL, Eye = NULL, Sex = NULL), .Names = c('Fr', 'Hair', 'Eye', 'Sex'), class = 'data.frame', row.names = c(NA, 32L), terms = quote(Fr ~ (Hair + Eye + Sex)^2))); .Internal(copyDFattr(argv[[1]], argv[[2]])) Fr Hair Eye Sex 1 NULL NULL NULL NULL 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr18# #argv <- list(structure(list(Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551), GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962), .Names = c('Employed', 'GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year'), class = 'data.frame', row.names = 1947:1962, terms = quote(Employed ~ GNP.deflator + GNP + Unemployed + Armed.Forces + Population + Year)), structure(list(Employed = NULL, GNP.deflator = NULL, GNP = NULL, Unemployed = NULL, Armed.Forces = NULL, Population = NULL, Year = NULL), .Names = c('Employed', 'GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year'), class = 'data.frame', row.names = 1947:1962, terms = quote(Employed ~ GNP.deflator + GNP + Unemployed + Armed.Forces + Population + Year))); .Internal(copyDFattr(argv[[1]], argv[[2]])) Employed GNP.deflator GNP Unemployed Armed.Forces Population Year 1947 NULL NULL NULL NULL NULL NULL NULL 1948 1949 1950 1951 1952 1953 1954 1955 1956 1957 1958 1959 1960 1961 1962 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr19#Output.IgnoreErrorContext# #argv <- list(structure(list(Df = c(NA, 1, 1, 2), Deviance = c(12.2441566485997, 32.825622681839, 8.44399377410362, 11.9670615295804), AIC = c(73.9421143635373, 92.5235803967766, 72.1419514890412, 77.665019244518)), .Names = c('Df', 'Deviance', 'AIC'), row.names = c('', '- M.user', '+ Temp', '+ Soft'), class = c('anova', 'data.frame')), structure(list(Df = NULL, Deviance = NULL, AIC = NULL), .Names = c('Df', 'Deviance', 'AIC'), row.names = c('', '- M.user', '+ Temp', '+ Soft'), class = c('anova', 'data.frame'))); .Internal(copyDFattr(argv[[1]], argv[[2]])) Error in `[[<-.data.frame`(`*tmp*`, i, value = numeric(0)) : replacement has 0 rows, data has 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr2# #argv <- list(structure(list(y = c(2.30923841792462, 3.23011719303818, 2.9161246695212, 3.35931329373059, 5.3777049208621, 5.63518136825043, 7.37725908636056, 7.75621985157329, 10.1175871700049, 8.86877085545769), x1 = 1:10, x2 = 1:10, x3 = c(0.1, 0.4, 0.9, 1.6, 2.5, 3.6, 4.9, 6.4, 8.1, 10)), .Names = c('y', 'x1', 'x2', 'x3'), class = 'data.frame', row.names = c(NA, 10L), terms = quote(y ~ x1 + x2 + x3)), structure(list(y = NULL, x1 = NULL, x2 = NULL, x3 = NULL), .Names = c('y', 'x1', 'x2', 'x3'), class = 'data.frame', row.names = c(NA, 10L), terms = quote(y ~ x1 + x2 + x3))); .Internal(copyDFattr(argv[[1]], argv[[2]])) y x1 x2 x3 1 NULL NULL NULL NULL 2 3 4 5 6 7 8 9 10 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr20# #argv <- list(structure(list(`cbind(X, M)` = structure(c(68, 42, 37, 24, 66, 33, 47, 23, 63, 29, 57, 19, 42, 30, 52, 43, 50, 23, 55, 47, 53, 27, 49, 29), .Dim = c(12L, 2L), .Dimnames = list(NULL, c('X', 'M'))), M.user = structure(c(1L, 1L, 2L, 2L, 1L, 1L, 2L, 2L, 1L, 1L, 2L, 2L), .Label = c('N', 'Y'), class = 'factor'), Temp = structure(c(2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L), .Label = c('High', 'Low'), class = 'factor'), Soft = structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L), .Label = c('Hard', 'Medium', 'Soft'), class = 'factor')), .Names = c('cbind(X, M)', 'M.user', 'Temp', 'Soft'), class = 'data.frame', row.names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), terms = quote(cbind(X, M) ~ M.user + Temp + Soft)), structure(list(`cbind(X, M)` = NULL, M.user = NULL, Temp = NULL, Soft = NULL), .Names = c('cbind(X, M)', 'M.user', 'Temp', 'Soft'), class = 'data.frame', row.names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), terms = quote(cbind(X, M) ~ M.user + Temp + Soft))); .Internal(copyDFattr(argv[[1]], argv[[2]])) cbind(X, M) M.user Temp Soft 1 NULL NULL NULL NULL 3 5 7 9 11 13 15 17 19 21 23 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr3# #argv <- list(structure(list(y = c(-0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861), x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE), z = 1:10), .Names = c('y', 'x', 'z'), class = 'data.frame', row.names = c(NA, 10L), terms = quote(y ~ x * z)), structure(list(y = NULL, x = NULL, z = NULL), .Names = c('y', 'x', 'z'), class = 'data.frame', row.names = c(NA, 10L), terms = quote(y ~ x * z))); .Internal(copyDFattr(argv[[1]], argv[[2]])) y x z 1 NULL NULL NULL 2 3 4 5 6 7 8 9 10 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr4# #argv <- list(structure(list(surname = structure(integer(0), .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(integer(0), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(integer(0), .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = integer(0), class = 'data.frame'), structure(list(surname = NULL, nationality = NULL, deceased = NULL), .Names = c('surname', 'nationality', 'deceased'), row.names = integer(0), class = 'data.frame')); .Internal(copyDFattr(argv[[1]], argv[[2]])) [1] surname nationality deceased <0 rows> (or 0-length row.names) ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr5# #argv <- list(structure(list(A = 0:10, B = 10:20, `NA` = 20:30), .Names = c('A', 'B', NA), row.names = c(NA, -11L), class = 'data.frame'), structure(list(A = NULL, B = NULL, `NA` = NULL), .Names = c('A', 'B', NA), row.names = c(NA, -11L), class = 'data.frame')); .Internal(copyDFattr(argv[[1]], argv[[2]])) A B NA 1 NULL NULL NULL 2 3 4 5 6 7 8 9 10 11 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr6# #argv <- list(structure(list(`Surv(stop, status * as.numeric(event), type = 'mstate')` = structure(c(760, 2160, 5441, 277, 1815, 2587, 547, 1125, 2010, 2422, 6155, 1767, 61, 60, 7807, 7732, 6126, 7921, 3590, 5231, 5384, 5934, 6415, 6789, 6778, 3561, 4505, 3987, 4726, 5550, 5216, 5757, 2345, 6931, 6760, 5796, 4810, 5143, 3091, 3316, 700, 1706, 5088, 944, 2466, 1706, 7364, 1857, 9510, 9603, 31, 7479, 2006, 2588, 2983, 8761, 3932, 4201, 5293, 273, 2223, 4249, 5308, 8327, 499, 5789, 7417, 3242, 3275, 10359, 10852, 362, 9993, 1795, 3562, 4139, 4840, 4959, 547, 4119, 8308, 1674, 2953, 3776, 1369, 7911, 7519, 9318, 4370, 7301, 1642, 4169, 7417, 6117, 4536, 7235, 6723, 7397, 7428, 2084, 4066, 1673, 2860, 0, 3773, 4810, 4206, 2314, 4065, 8961, 6143, 517, 3837, 7498, 2815, 8806, 7668, 12457, 8600, 7003, 2435, 1826, 2403, 3805, 4901, 365, 6642, 3318, 3012, 1431, 2223, 4962, 5982, 638, 3346, 4996, 6800, 7454, 8887, 5024, 2833, 4232, 5238, 3186, 3380, 3382, 8100, 1766, 7184, 8059, 6008, 5047, 2236, 8165, 4224, 2844, 6256, 7370, 3560, 4939, 4941, 2230, 3068, 152, 10122, 3226, 3943, 518, 8569, 845, 2099, 8006, 8052, 9560, 0, 7965, 7470, 8133, 809, 153, 1851, 3010, 2121, 7085, 5068, 7093, 5930, 6878, 8080, 791, 6626, 3962, 1116, 1249, 9257, 1077, 566, 174, 4627, 5022, 2070, 3012, 1625, 6607, 8381, 8389, 1005, 3895, 4236, 6970, 8497, 2861, 8487, 3227, 8030, 8023, 31, 2435, 518, 4758, 7958, 7884, 4453, 6349, 7862, 1392, 3167, 6025, 4656, 1767, 7736, 2678, 2191, 3658, 7758, 8009, 2556, 3511, 7954, 822, 4321, 5151, 7545, 7576, 32, 7875, 5236, 7106, 2802, 7898, 3014, 7867, 5354, 2989, 7555, 6089, 8697, 6479, 1826, 5917, 792, 1431, 1434, 4763, 2910, 6209, 5824, 2400, 1400, 3027, 7198, 7247, 2557, 3855, 61, 7410, 1492, 7160, 7899, 5181, 7280, 3448, 7381, 2434, 6763, 7065, 1218, 1554, 7533, 7288, 2922, 5988, 2495, 5234, 9598, 2953, 2961, 4539, 3775, 6524, 2, 1, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 0, 0, 1, 2, 1, 2, 2, 1, 2, 1, 2, 1, 2, 1, 2, 2, 2, 2, 2, 2, 2, 2, 1, 2, 1, 2, 1, 2, 2, 1, 2, 2, 0, 2, 1, 2, 2, 0, 2, 1, 2, 0, 2, 1, 2, 2, 2, 2, 2, 2, 2, 2, 0, 1, 2, 1, 2, 2, 0, 1, 2, 1, 2, 2, 2, 2, 0, 2, 1, 2, 2, 0, 1, 2, 2, 0, 1, 2, 0, 2, 1, 2, 2, 1, 2, 1, 2, 2, 2, 2, 1, 2, 2, 1, 2, 0, 2, 2, 1, 0, 2, 2, 0, 0, 2, 0, 2, 1, 2, 1, 2, 2, 2, 2, 2, 1, 2, 1, 2, 2, 1, 2, 1, 0, 0, 2, 2, 1, 2, 2, 1, 2, 0, 2, 1, 2, 2, 2, 2, 0, 2, 2, 2, 0, 2, 1, 2, 1, 2, 2, 0, 2, 2, 2, 0, 2, 2, 1, 2, 0, 2, 0, 0, 0, 2, 2, 2, 2, 2, 2, 2, 0, 2, 2, 0, 2, 2, 2, 1, 2, 0, 2, 2, 2, 1, 2, 1, 2, 2, 2, 0, 0, 2, 1, 2, 1, 0, 1, 0, 2, 0, 0, 2, 2, 2, 2, 0, 0, 2, 2, 0, 2, 2, 2, 2, 2, 0, 2, 1, 2, 0, 0, 1, 2, 0, 2, 1, 2, 1, 2, 2, 0, 1, 2, 1, 0, 2, 0, 2, 2, 0, 2, 2, 2, 2, 2, 2, 1, 2, 2, 2, 2, 2, 2, 1, 2, 0, 0, 1, 2, 2, 0, 2, 0, 2, 2, 0, 2, 0, 2, 2, 0, 1, 2, 0, 0, 1, 2, 1, 2, 0, 1, 2, 2, 1, 2), .Dim = c(300L, 2L), .Dimnames = list(NULL, c('time', 'status')), type = 'mright', states = c('1', '2'), class = 'Surv')), .Names = 'Surv(stop, status * as.numeric(event), type = \'mstate\')', class = 'data.frame', row.names = c(NA, 300L)), structure(list(`Surv(stop, status * as.numeric(event), type = 'mstate')` = NULL), .Names = 'Surv(stop, status * as.numeric(event), type = \'mstate\')', class = 'data.frame', row.names = c(NA, 300L))); .Internal(copyDFattr(argv[[1]], argv[[2]])) Surv(stop, status * as.numeric(event), type = 'mstate') 1 NULL 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 73 74 75 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 91 92 93 94 95 96 97 98 99 100 101 102 103 104 105 106 107 108 109 110 111 112 113 114 115 116 117 118 119 120 121 122 123 124 125 126 127 128 129 130 131 132 133 134 135 136 137 138 139 140 141 142 143 144 145 146 147 148 149 150 151 152 153 154 155 156 157 158 159 160 161 162 163 164 165 166 167 168 169 170 171 172 173 174 175 176 177 178 179 180 181 182 183 184 185 186 187 188 189 190 191 192 193 194 195 196 197 198 199 200 201 202 203 204 205 206 207 208 209 210 211 212 213 214 215 216 217 218 219 220 221 222 223 224 225 226 227 228 229 230 231 232 233 234 235 236 237 238 239 240 241 242 243 244 245 246 247 248 249 250 251 252 253 254 255 256 257 258 259 260 261 262 263 264 265 266 267 268 269 270 271 272 273 274 275 276 277 278 279 280 281 282 283 284 285 286 287 288 289 290 291 292 293 294 295 296 297 298 299 300 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr7# #argv <- list(structure(list(size = 284, isdir = FALSE, mode = structure(436L, class = 'octmode'), mtime = structure(1386397148.36693, class = c('POSIXct', 'POSIXt')), ctime = structure(1386397148.36693, class = c('POSIXct', 'POSIXt')), atime = structure(1386397148.36793, class = c('POSIXct', 'POSIXt')), uid = 501L, gid = 501L, uname = 'lzhao', grname = 'lzhao'), .Names = c('size', 'isdir', 'mode', 'mtime', 'ctime', 'atime', 'uid', 'gid', 'uname', 'grname'), class = 'data.frame', row.names = '/home/lzhao/tmp/RtmpvWhahC/Rex4eb8743f75cc'), structure(list( size = NULL, isdir = NULL, mode = NULL, mtime = NULL, ctime = NULL, atime = NULL, uid = NULL, gid = NULL, uname = NULL, grname = NULL), .Names = c('size', 'isdir', 'mode', 'mtime', 'ctime', 'atime', 'uid', 'gid', 'uname', 'grname'), class = 'data.frame', row.names = '/home/lzhao/tmp/RtmpvWhahC/Rex4eb8743f75cc')); .Internal(copyDFattr(argv[[1]], argv[[2]])) size isdir mode mtime ctime atime /home/lzhao/tmp/RtmpvWhahC/Rex4eb8743f75cc NULL NULL NULL NULL NULL NULL uid gid uname grname /home/lzhao/tmp/RtmpvWhahC/Rex4eb8743f75cc NULL NULL NULL NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr8# #argv <- list(structure(list(File = character(0), Title = character(0), PDF = character(0), Depends = list(), Keywords = list()), .Names = c('File', 'Title', 'PDF', 'Depends', 'Keywords'), row.names = integer(0), class = 'data.frame'), structure(list(File = NULL, Title = NULL, PDF = NULL, Depends = NULL, Keywords = NULL), .Names = c('File', 'Title', 'PDF', 'Depends', 'Keywords'), row.names = integer(0), class = 'data.frame')); .Internal(copyDFattr(argv[[1]], argv[[2]])) [1] File Title PDF Depends Keywords <0 rows> (or 0-length row.names) ##com.oracle.truffle.r.test.builtins.TestBuiltin_copyDFattr.testcopyDFattr9#Ignored.ImplementationError# #argv <- list(structure(list(Version = c('2.11.0', '2.11.0', '2.11.0', '2.11.0', '2.11.0', '2.11.0', '2.11.0', '2.11.0', '2.11.0'), Date = c(NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_), Category = c('BUG FIXES', 'BUG FIXES', 'BUG FIXES', 'BUG FIXES', 'BUG FIXES', 'BUG FIXES', 'BUG FIXES', 'BUG FIXES', 'BUG FIXES'), Text = c('Using with(), eval() etc with a list with some unnamed elements now\n works. (PR#14035)', 'cor(A, B) where A is n x 1 and B a 1-dimensional array segfaulted or\n gave an internal error. (The case cor(B, A) was PR#7116.)', 'cut.POSIXt() applied to a start value after the DST transition on a\n DST-change day could give the wrong time for argument breaks in\n units of days or longer. (PR#14208)', 'do_par() UNPROTECTed too early (PR#14214)', 'Subassignment x[[....]] <- y didn\'t check for a zero-length right\n hand side, and inserted a rubbish value. (PR#14217)', 'Extreme tail behavior of, pbeta() {and hence pf()}, e.g., pbeta(x,\n 3, 2200, lower.tail=FALSE, log.p=TRUE) now returns finite values\n instead of jumping to -Inf too early. (PR#14230).', 'read.fwf() misread multi-line records when n was specified.\n (PR#14241)', 'gzcon( ), an error, no longer damages the\n connection (in a way to have it segfault). (PR#14237)', 'If xy[z].coords (used internally by many graphics functions) are\n given a list as x, they now check that the list has suitable names\n and give a more informative error message. (PR#13936)')), .Names = c('Version', 'Date', 'Category', 'Text'), bad = c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), package = 'R', row.names = c(1473L, 1483L, 1484L, 1485L, 1486L, 1493L, 1499L, 1503L, 1505L), class = c('news_db_from_Rd', 'news_db', 'data.frame')), structure(list(Version = NULL, Date = NULL, Category = NULL, Text = NULL), .Names = c('Version', 'Date', 'Category', 'Text'), bad = c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), package = 'R', row.names = c(1473L, 1483L, 1484L, 1485L, 1486L, 1493L, 1499L, 1503L, 1505L), class = c('news_db_from_Rd', 'news_db', 'data.frame'))); .Internal(copyDFattr(argv[[1]], argv[[2]])) Error in split.default(x = seq_len(nrow(x)), f = f, drop = drop, ...) : group length is 0 but data length > 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cos.testTrigExp# #{ cos() } Error in cos() : 0 arguments passed to 'cos' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cos.testTrigExp# #{ cos(1.2) } [1] 0.3623578 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cos.testTrigExp# #{ cos(c(0.3,0.6,0.9)) } [1] 0.9553365 0.8253356 0.6216100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cos.testcos1# #argv <- list(c(-6.28318530717959, -6.1261056745001, -5.96902604182061, -5.81194640914112, -5.65486677646163, -5.49778714378214, -5.34070751110265, -5.18362787842316, -5.02654824574367, -4.86946861306418, -4.71238898038469, -4.5553093477052, -4.39822971502571, -4.24115008234622, -4.08407044966673, -3.92699081698724, -3.76991118430775, -3.61283155162826, -3.45575191894877, -3.29867228626928, -3.14159265358979, -2.9845130209103, -2.82743338823081, -2.67035375555132, -2.51327412287183, -2.35619449019234, -2.19911485751286, -2.04203522483337, -1.88495559215388, -1.72787595947439, -1.5707963267949, -1.41371669411541, -1.25663706143592, -1.09955742875643, -0.942477796076938, -0.785398163397448, -0.628318530717959, -0.471238898038469, -0.314159265358979, -0.15707963267949, 0, 0.15707963267949, 0.314159265358979, 0.471238898038469, 0.628318530717959, 0.785398163397448, 0.942477796076938, 1.09955742875643, 1.25663706143592, 1.41371669411541, 1.5707963267949, 1.72787595947439, 1.88495559215388, 2.04203522483337, 2.19911485751286, 2.35619449019234, 2.51327412287183, 2.67035375555133, 2.82743338823081, 2.9845130209103, 3.14159265358979, 3.29867228626928, 3.45575191894877, 3.61283155162826, 3.76991118430775, 3.92699081698724, 4.08407044966673, 4.24115008234622, 4.39822971502571, 4.5553093477052, 4.71238898038469, 4.86946861306418, 5.02654824574367, 5.18362787842316, 5.34070751110265, 5.49778714378214, 5.65486677646163, 5.81194640914112, 5.96902604182061, 6.1261056745001, 6.28318530717959, 6.44026493985908, 6.59734457253857, 6.75442420521805, 6.91150383789754, 7.06858347057704, 7.22566310325652, 7.38274273593601, 7.5398223686155, 7.69690200129499, 7.85398163397448, 8.01106126665397, 8.16814089933346, 8.32522053201295, 8.48230016469244, 8.63937979737193, 8.79645943005142, 8.95353906273091, 9.1106186954104, 9.26769832808989, 9.42477796076938));cos(argv[[1]]); [1] 1.000000e+00 9.876883e-01 9.510565e-01 8.910065e-01 8.090170e-01 [6] 7.071068e-01 5.877853e-01 4.539905e-01 3.090170e-01 1.564345e-01 [11] -1.836970e-16 -1.564345e-01 -3.090170e-01 -4.539905e-01 -5.877853e-01 [16] -7.071068e-01 -8.090170e-01 -8.910065e-01 -9.510565e-01 -9.876883e-01 [21] -1.000000e+00 -9.876883e-01 -9.510565e-01 -8.910065e-01 -8.090170e-01 [26] -7.071068e-01 -5.877853e-01 -4.539905e-01 -3.090170e-01 -1.564345e-01 [31] -3.491481e-15 1.564345e-01 3.090170e-01 4.539905e-01 5.877853e-01 [36] 7.071068e-01 8.090170e-01 8.910065e-01 9.510565e-01 9.876883e-01 [41] 1.000000e+00 9.876883e-01 9.510565e-01 8.910065e-01 8.090170e-01 [46] 7.071068e-01 5.877853e-01 4.539905e-01 3.090170e-01 1.564345e-01 [51] -3.491481e-15 -1.564345e-01 -3.090170e-01 -4.539905e-01 -5.877853e-01 [56] -7.071068e-01 -8.090170e-01 -8.910065e-01 -9.510565e-01 -9.876883e-01 [61] -1.000000e+00 -9.876883e-01 -9.510565e-01 -8.910065e-01 -8.090170e-01 [66] -7.071068e-01 -5.877853e-01 -4.539905e-01 -3.090170e-01 -1.564345e-01 [71] -1.836970e-16 1.564345e-01 3.090170e-01 4.539905e-01 5.877853e-01 [76] 7.071068e-01 8.090170e-01 8.910065e-01 9.510565e-01 9.876883e-01 [81] 1.000000e+00 9.876883e-01 9.510565e-01 8.910065e-01 8.090170e-01 [86] 7.071068e-01 5.877853e-01 4.539905e-01 3.090170e-01 1.564345e-01 [91] 2.970697e-15 -1.564345e-01 -3.090170e-01 -4.539905e-01 -5.877853e-01 [96] -7.071068e-01 -8.090170e-01 -8.910065e-01 -9.510565e-01 -9.876883e-01 [101] -1.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cos.testcos2# #argv <- list(c(0-3i, 0-2.96984924623116i, 0-2.93969849246231i, 0-2.90954773869347i, 0-2.87939698492462i, 0-2.84924623115578i, 0-2.81909547738693i, 0-2.78894472361809i, 0-2.75879396984925i, 0-2.7286432160804i, 0-2.69849246231156i, 0-2.66834170854271i, 0-2.63819095477387i, 0-2.60804020100502i, 0-2.57788944723618i, 0-2.54773869346734i, 0-2.51758793969849i, 0-2.48743718592965i, 0-2.4572864321608i, 0-2.42713567839196i, 0-2.39698492462312i, 0-2.36683417085427i, 0-2.33668341708543i, 0-2.30653266331658i, 0-2.27638190954774i, 0-2.24623115577889i, 0-2.21608040201005i, 0-2.18592964824121i, 0-2.15577889447236i, 0-2.12562814070352i, 0-2.09547738693467i, 0-2.06532663316583i, 0-2.03517587939699i, 0-2.00502512562814i, 0-1.9748743718593i, 0-1.94472361809045i, 0-1.91457286432161i, 0-1.88442211055276i, 0-1.85427135678392i, 0-1.82412060301508i, 0-1.79396984924623i, 0-1.76381909547739i, 0-1.73366834170854i, 0-1.7035175879397i, 0-1.67336683417085i, 0-1.64321608040201i, 0-1.61306532663317i, 0-1.58291457286432i, 0-1.55276381909548i, 0-1.52261306532663i, 0-1.49246231155779i, 0-1.46231155778894i, 0-1.4321608040201i, 0-1.40201005025126i, 0-1.37185929648241i, 0-1.34170854271357i, 0-1.31155778894472i, 0-1.28140703517588i, 0-1.25125628140704i, 0-1.22110552763819i, 0-1.19095477386935i, 0-1.1608040201005i, 0-1.13065326633166i, 0-1.10050251256281i, 0-1.07035175879397i, 0-1.04020100502513i, 0-1.01005025125628i, 0-0.979899497487437i, 0-0.949748743718593i, 0-0.919597989949749i, 0-0.889447236180905i, 0-0.859296482412061i, 0-0.829145728643216i, 0-0.798994974874372i, 0-0.768844221105528i, 0-0.738693467336684i, 0-0.70854271356784i, 0-0.678391959798995i, 0-0.648241206030151i, 0-0.618090452261307i, 0-0.587939698492463i, 0-0.557788944723618i, 0-0.527638190954774i, 0-0.49748743718593i, 0-0.467336683417086i, 0-0.437185929648241i, 0-0.407035175879397i, 0-0.376884422110553i, 0-0.346733668341709i, 0-0.316582914572864i, 0-0.28643216080402i, 0-0.256281407035176i, 0-0.226130653266332i, 0-0.195979899497488i, 0-0.165829145728643i, 0-0.135678391959799i, 0-0.105527638190955i, 0-0.0753768844221105i, 0-0.0452261306532664i, 0-0.0150753768844223i, 0+0.0150753768844218i, 0+0.0452261306532664i, 0+0.0753768844221105i, 0+0.105527638190955i, 0+0.135678391959799i, 0+0.165829145728643i, 0+0.195979899497488i, 0+0.226130653266332i, 0+0.256281407035176i, 0+0.28643216080402i, 0+0.316582914572864i, 0+0.346733668341709i, 0+0.376884422110553i, 0+0.407035175879397i, 0+0.437185929648241i, 0+0.467336683417085i, 0+0.49748743718593i, 0+0.527638190954774i, 0+0.557788944723618i, 0+0.587939698492462i, 0+0.618090452261306i, 0+0.648241206030151i, 0+0.678391959798995i, 0+0.708542713567839i, 0+0.738693467336683i, 0+0.768844221105527i, 0+0.798994974874372i, 0+0.829145728643216i, 0+0.85929648241206i, 0+0.889447236180904i, 0+0.919597989949748i, 0+0.949748743718593i, 0+0.979899497487437i, 0+1.01005025125628i, 0+1.04020100502513i, 0+1.07035175879397i, 0+1.10050251256281i, 0+1.13065326633166i, 0+1.1608040201005i, 0+1.19095477386935i, 0+1.22110552763819i, 0+1.25125628140704i, 0+1.28140703517588i, 0+1.31155778894472i, 0+1.34170854271357i, 0+1.37185929648241i, 0+1.40201005025126i, 0+1.4321608040201i, 0+1.46231155778894i, 0+1.49246231155779i, 0+1.52261306532663i, 0+1.55276381909548i, 0+1.58291457286432i, 0+1.61306532663317i, 0+1.64321608040201i, 0+1.67336683417085i, 0+1.7035175879397i, 0+1.73366834170854i, 0+1.76381909547739i, 0+1.79396984924623i, 0+1.82412060301507i, 0+1.85427135678392i, 0+1.88442211055276i, 0+1.91457286432161i, 0+1.94472361809045i, 0+1.9748743718593i, 0+2.00502512562814i, 0+2.03517587939698i, 0+2.06532663316583i, 0+2.09547738693467i, 0+2.12562814070352i, 0+2.15577889447236i, 0+2.18592964824121i, 0+2.21608040201005i, 0+2.24623115577889i, 0+2.27638190954774i, 0+2.30653266331658i, 0+2.33668341708543i, 0+2.36683417085427i, 0+2.39698492462312i, 0+2.42713567839196i, 0+2.4572864321608i, 0+2.48743718592965i, 0+2.51758793969849i, 0+2.54773869346734i, 0+2.57788944723618i, 0+2.60804020100502i, 0+2.63819095477387i, 0+2.66834170854271i, 0+2.69849246231156i, 0+2.7286432160804i, 0+2.75879396984925i, 0+2.78894472361809i, 0+2.81909547738693i, 0+2.84924623115578i, 0+2.87939698492462i, 0+2.90954773869347i, 0+2.93969849246231i, 0+2.96984924623116i, 0+3i));cos(argv[[1]]); [1] 10.067662+0i 9.770146+0i 9.481513+0i 9.201499+0i 8.929851+0i [6] 8.666322+0i 8.410671+0i 8.162667+0i 7.922084+0i 7.688703+0i [11] 7.462312+0i 7.242705+0i 7.029683+0i 6.823052+0i 6.622624+0i [16] 6.428217+0i 6.239654+0i 6.056764+0i 5.879380+0i 5.707341+0i [21] 5.540491+0i 5.378678+0i 5.221756+0i 5.069580+0i 4.922013+0i [26] 4.778921+0i 4.640174+0i 4.505645+0i 4.375213+0i 4.248758+0i [31] 4.126166+0i 4.007325+0i 3.892128+0i 3.780469+0i 3.672247+0i [36] 3.567363+0i 3.465723+0i 3.367233+0i 3.271805+0i 3.179351+0i [41] 3.089788+0i 3.003034+0i 2.919010+0i 2.837639+0i 2.758849+0i [46] 2.682566+0i 2.608723+0i 2.537251+0i 2.468086+0i 2.401165+0i [51] 2.336426+0i 2.273812+0i 2.213265+0i 2.154731+0i 2.098155+0i [56] 2.043486+0i 1.990676+0i 1.939675+0i 1.890438+0i 1.842919+0i [61] 1.797076+0i 1.752867+0i 1.710251+0i 1.669190+0i 1.629647+0i [66] 1.591585+0i 1.554970+0i 1.519769+0i 1.485949+0i 1.453481+0i [71] 1.422333+0i 1.392479+0i 1.363891+0i 1.336543+0i 1.310410+0i [76] 1.285468+0i 1.261695+0i 1.239069+0i 1.217570+0i 1.197177+0i [81] 1.177873+0i 1.159640+0i 1.142461+0i 1.126320+0i 1.111204+0i [86] 1.097098+0i 1.083989+0i 1.071866+0i 1.060717+0i 1.050532+0i [91] 1.041303+0i 1.033020+0i 1.025677+0i 1.019266+0i 1.013781+0i [96] 1.009218+0i 1.005573+0i 1.002842+0i 1.001023+0i 1.000114+0i [101] 1.000114+0i 1.001023+0i 1.002842+0i 1.005573+0i 1.009218+0i [106] 1.013781+0i 1.019266+0i 1.025677+0i 1.033020+0i 1.041303+0i [111] 1.050532+0i 1.060717+0i 1.071866+0i 1.083989+0i 1.097098+0i [116] 1.111204+0i 1.126320+0i 1.142461+0i 1.159640+0i 1.177873+0i [121] 1.197177+0i 1.217570+0i 1.239069+0i 1.261695+0i 1.285468+0i [126] 1.310410+0i 1.336543+0i 1.363891+0i 1.392479+0i 1.422333+0i [131] 1.453481+0i 1.485949+0i 1.519769+0i 1.554970+0i 1.591585+0i [136] 1.629647+0i 1.669190+0i 1.710251+0i 1.752867+0i 1.797076+0i [141] 1.842919+0i 1.890438+0i 1.939675+0i 1.990676+0i 2.043486+0i [146] 2.098155+0i 2.154731+0i 2.213265+0i 2.273812+0i 2.336426+0i [151] 2.401165+0i 2.468086+0i 2.537251+0i 2.608723+0i 2.682566+0i [156] 2.758849+0i 2.837639+0i 2.919010+0i 3.003034+0i 3.089788+0i [161] 3.179351+0i 3.271805+0i 3.367233+0i 3.465723+0i 3.567363+0i [166] 3.672247+0i 3.780469+0i 3.892128+0i 4.007325+0i 4.126166+0i [171] 4.248758+0i 4.375213+0i 4.505645+0i 4.640174+0i 4.778921+0i [176] 4.922013+0i 5.069580+0i 5.221756+0i 5.378678+0i 5.540491+0i [181] 5.707341+0i 5.879380+0i 6.056764+0i 6.239654+0i 6.428217+0i [186] 6.622624+0i 6.823052+0i 7.029683+0i 7.242705+0i 7.462312+0i [191] 7.688703+0i 7.922084+0i 8.162667+0i 8.410671+0i 8.666322+0i [196] 8.929851+0i 9.201499+0i 9.481513+0i 9.770146+0i 10.067662+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_cos.testcos3# #argv <- list(structure(c(2, 3, 4, 5, 6, 2, 5, 10, 17, 26, 5, 15, 31, 53, 81), .Dim = c(5L, 3L)));cos(argv[[1]]); [,1] [,2] [,3] [1,] -0.4161468 -0.4161468 0.2836622 [2,] -0.9899925 0.2836622 -0.7596879 [3,] -0.6536436 -0.8390715 0.9147424 [4,] 0.2836622 -0.2751633 -0.9182828 [5,] 0.9601703 0.6469193 0.7766860 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cos.testcos4#Output.MissingWarning# #argv <- list(Inf);cos(argv[[1]]); [1] NaN Warning message: In cos(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_cos.testcos5# #argv <- list(c(3.14159265358979, 6.28318530717959, 1.5707963267949, 3.14159265358979, 4.71238898038469, 6.28318530717959, 3.14159265358979, 6.28318530717959, 3.14159265358979, 6.28318530717959, 0.785398163397448, 1.5707963267949, 2.35619449019234, 3.14159265358979, 3.92699081698724, 4.71238898038469, 5.49778714378214, 6.28318530717959, 2.0943951023932, 4.18879020478639, 6.28318530717959, 3.14159265358979, 6.28318530717959, 0.897597901025655, 1.79519580205131, 2.69279370307697, 3.59039160410262, 4.48798950512828, 5.38558740615393, 6.28318530717959, 2.0943951023932, 4.18879020478639, 6.28318530717959, 1.25663706143592, 2.51327412287183, 3.76991118430775, 5.02654824574367, 6.28318530717959, 3.14159265358979, 6.28318530717959, 3.14159265358979, 6.28318530717959, 2.0943951023932, 4.18879020478639, 6.28318530717959, 3.14159265358979, 6.28318530717959, 3.14159265358979, 6.28318530717959, 3.14159265358979, 6.28318530717959, 3.14159265358979, 6.28318530717959, 1.25663706143592, 2.51327412287183, 3.76991118430775, 5.02654824574367, 6.28318530717959, 3.14159265358979, 6.28318530717959, 2.0943951023932, 4.18879020478639, 6.28318530717959, 3.14159265358979, 6.28318530717959, 3.14159265358979, 6.28318530717959, 3.14159265358979, 6.28318530717959, 3.14159265358979, 6.28318530717959, 3.14159265358979, 6.28318530717959));cos(argv[[1]]); [1] -1.000000e+00 1.000000e+00 -3.491481e-15 -1.000000e+00 -1.836970e-16 [6] 1.000000e+00 -1.000000e+00 1.000000e+00 -1.000000e+00 1.000000e+00 [11] 7.071068e-01 -3.491481e-15 -7.071068e-01 -1.000000e+00 -7.071068e-01 [16] -1.836970e-16 7.071068e-01 1.000000e+00 -5.000000e-01 -5.000000e-01 [21] 1.000000e+00 -1.000000e+00 1.000000e+00 6.234898e-01 -2.225209e-01 [26] -9.009689e-01 -9.009689e-01 -2.225209e-01 6.234898e-01 1.000000e+00 [31] -5.000000e-01 -5.000000e-01 1.000000e+00 3.090170e-01 -8.090170e-01 [36] -8.090170e-01 3.090170e-01 1.000000e+00 -1.000000e+00 1.000000e+00 [41] -1.000000e+00 1.000000e+00 -5.000000e-01 -5.000000e-01 1.000000e+00 [46] -1.000000e+00 1.000000e+00 -1.000000e+00 1.000000e+00 -1.000000e+00 [51] 1.000000e+00 -1.000000e+00 1.000000e+00 3.090170e-01 -8.090170e-01 [56] -8.090170e-01 3.090170e-01 1.000000e+00 -1.000000e+00 1.000000e+00 [61] -5.000000e-01 -5.000000e-01 1.000000e+00 -1.000000e+00 1.000000e+00 [66] -1.000000e+00 1.000000e+00 -1.000000e+00 1.000000e+00 -1.000000e+00 [71] 1.000000e+00 -1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cos.testcos6# #argv <- list(logical(0));cos(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cosh.testcosh1# #argv <- list(logical(0));cosh(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cosh.testcosh2# #argv <- list(FALSE);cosh(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cosh.testcosh3# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));cosh(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_cosh.testcosh4# #argv <- list(c(-3, -2.96984924623116, -2.93969849246231, -2.90954773869347, -2.87939698492462, -2.84924623115578, -2.81909547738693, -2.78894472361809, -2.75879396984925, -2.7286432160804, -2.69849246231156, -2.66834170854271, -2.63819095477387, -2.60804020100502, -2.57788944723618, -2.54773869346734, -2.51758793969849, -2.48743718592965, -2.4572864321608, -2.42713567839196, -2.39698492462312, -2.36683417085427, -2.33668341708543, -2.30653266331658, -2.27638190954774, -2.24623115577889, -2.21608040201005, -2.18592964824121, -2.15577889447236, -2.12562814070352, -2.09547738693467, -2.06532663316583, -2.03517587939699, -2.00502512562814, -1.9748743718593, -1.94472361809045, -1.91457286432161, -1.88442211055276, -1.85427135678392, -1.82412060301508, -1.79396984924623, -1.76381909547739, -1.73366834170854, -1.7035175879397, -1.67336683417085, -1.64321608040201, -1.61306532663317, -1.58291457286432, -1.55276381909548, -1.52261306532663, -1.49246231155779, -1.46231155778894, -1.4321608040201, -1.40201005025126, -1.37185929648241, -1.34170854271357, -1.31155778894472, -1.28140703517588, -1.25125628140704, -1.22110552763819, -1.19095477386935, -1.1608040201005, -1.13065326633166, -1.10050251256281, -1.07035175879397, -1.04020100502513, -1.01005025125628, -0.979899497487437, -0.949748743718593, -0.919597989949749, -0.889447236180905, -0.859296482412061, -0.829145728643216, -0.798994974874372, -0.768844221105528, -0.738693467336684, -0.708542713567839, -0.678391959798995, -0.648241206030151, -0.618090452261307, -0.587939698492463, -0.557788944723618, -0.527638190954774, -0.49748743718593, -0.467336683417086, -0.437185929648241, -0.407035175879397, -0.376884422110553, -0.346733668341709, -0.316582914572864, -0.28643216080402, -0.256281407035176, -0.226130653266332, -0.195979899497488, -0.165829145728643, -0.135678391959799, -0.105527638190955, -0.0753768844221105, -0.0452261306532664, -0.0150753768844223, 0.0150753768844218, 0.0452261306532664, 0.0753768844221105, 0.105527638190955, 0.135678391959799, 0.165829145728643, 0.195979899497488, 0.226130653266332, 0.256281407035176, 0.28643216080402, 0.316582914572864, 0.346733668341709, 0.376884422110553, 0.407035175879397, 0.437185929648241, 0.467336683417085, 0.49748743718593, 0.527638190954774, 0.557788944723618, 0.587939698492462, 0.618090452261306, 0.648241206030151, 0.678391959798995, 0.708542713567839, 0.738693467336683, 0.768844221105527, 0.798994974874372, 0.829145728643216, 0.85929648241206, 0.889447236180904, 0.919597989949748, 0.949748743718593, 0.979899497487437, 1.01005025125628, 1.04020100502513, 1.07035175879397, 1.10050251256281, 1.13065326633166, 1.1608040201005, 1.19095477386935, 1.22110552763819, 1.25125628140704, 1.28140703517588, 1.31155778894472, 1.34170854271357, 1.37185929648241, 1.40201005025126, 1.4321608040201, 1.46231155778894, 1.49246231155779, 1.52261306532663, 1.55276381909548, 1.58291457286432, 1.61306532663317, 1.64321608040201, 1.67336683417085, 1.7035175879397, 1.73366834170854, 1.76381909547739, 1.79396984924623, 1.82412060301507, 1.85427135678392, 1.88442211055276, 1.91457286432161, 1.94472361809045, 1.9748743718593, 2.00502512562814, 2.03517587939698, 2.06532663316583, 2.09547738693467, 2.12562814070352, 2.15577889447236, 2.18592964824121, 2.21608040201005, 2.24623115577889, 2.27638190954774, 2.30653266331658, 2.33668341708543, 2.36683417085427, 2.39698492462312, 2.42713567839196, 2.4572864321608, 2.48743718592965, 2.51758793969849, 2.54773869346734, 2.57788944723618, 2.60804020100502, 2.63819095477387, 2.66834170854271, 2.69849246231156, 2.7286432160804, 2.75879396984925, 2.78894472361809, 2.81909547738693, 2.84924623115578, 2.87939698492462, 2.90954773869347, 2.93969849246231, 2.96984924623116, 3));cosh(argv[[1]]); [1] 10.067662 9.770146 9.481513 9.201499 8.929851 8.666322 8.410671 [8] 8.162667 7.922084 7.688703 7.462312 7.242705 7.029683 6.823052 [15] 6.622624 6.428217 6.239654 6.056764 5.879380 5.707341 5.540491 [22] 5.378678 5.221756 5.069580 4.922013 4.778921 4.640174 4.505645 [29] 4.375213 4.248758 4.126166 4.007325 3.892128 3.780469 3.672247 [36] 3.567363 3.465723 3.367233 3.271805 3.179351 3.089788 3.003034 [43] 2.919010 2.837639 2.758849 2.682566 2.608723 2.537251 2.468086 [50] 2.401165 2.336426 2.273812 2.213265 2.154731 2.098155 2.043486 [57] 1.990676 1.939675 1.890438 1.842919 1.797076 1.752867 1.710251 [64] 1.669190 1.629647 1.591585 1.554970 1.519769 1.485949 1.453481 [71] 1.422333 1.392479 1.363891 1.336543 1.310410 1.285468 1.261695 [78] 1.239069 1.217570 1.197177 1.177873 1.159640 1.142461 1.126320 [85] 1.111204 1.097098 1.083989 1.071866 1.060717 1.050532 1.041303 [92] 1.033020 1.025677 1.019266 1.013781 1.009218 1.005573 1.002842 [99] 1.001023 1.000114 1.000114 1.001023 1.002842 1.005573 1.009218 [106] 1.013781 1.019266 1.025677 1.033020 1.041303 1.050532 1.060717 [113] 1.071866 1.083989 1.097098 1.111204 1.126320 1.142461 1.159640 [120] 1.177873 1.197177 1.217570 1.239069 1.261695 1.285468 1.310410 [127] 1.336543 1.363891 1.392479 1.422333 1.453481 1.485949 1.519769 [134] 1.554970 1.591585 1.629647 1.669190 1.710251 1.752867 1.797076 [141] 1.842919 1.890438 1.939675 1.990676 2.043486 2.098155 2.154731 [148] 2.213265 2.273812 2.336426 2.401165 2.468086 2.537251 2.608723 [155] 2.682566 2.758849 2.837639 2.919010 3.003034 3.089788 3.179351 [162] 3.271805 3.367233 3.465723 3.567363 3.672247 3.780469 3.892128 [169] 4.007325 4.126166 4.248758 4.375213 4.505645 4.640174 4.778921 [176] 4.922013 5.069580 5.221756 5.378678 5.540491 5.707341 5.879380 [183] 6.056764 6.239654 6.428217 6.622624 6.823052 7.029683 7.242705 [190] 7.462312 7.688703 7.922084 8.162667 8.410671 8.666322 8.929851 [197] 9.201499 9.481513 9.770146 10.067662 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cosh.testcosh5# #argv <- list(c(0-3i, 0-2.96984924623116i, 0-2.93969849246231i, 0-2.90954773869347i, 0-2.87939698492462i, 0-2.84924623115578i, 0-2.81909547738693i, 0-2.78894472361809i, 0-2.75879396984925i, 0-2.7286432160804i, 0-2.69849246231156i, 0-2.66834170854271i, 0-2.63819095477387i, 0-2.60804020100502i, 0-2.57788944723618i, 0-2.54773869346734i, 0-2.51758793969849i, 0-2.48743718592965i, 0-2.4572864321608i, 0-2.42713567839196i, 0-2.39698492462312i, 0-2.36683417085427i, 0-2.33668341708543i, 0-2.30653266331658i, 0-2.27638190954774i, 0-2.24623115577889i, 0-2.21608040201005i, 0-2.18592964824121i, 0-2.15577889447236i, 0-2.12562814070352i, 0-2.09547738693467i, 0-2.06532663316583i, 0-2.03517587939699i, 0-2.00502512562814i, 0-1.9748743718593i, 0-1.94472361809045i, 0-1.91457286432161i, 0-1.88442211055276i, 0-1.85427135678392i, 0-1.82412060301508i, 0-1.79396984924623i, 0-1.76381909547739i, 0-1.73366834170854i, 0-1.7035175879397i, 0-1.67336683417085i, 0-1.64321608040201i, 0-1.61306532663317i, 0-1.58291457286432i, 0-1.55276381909548i, 0-1.52261306532663i, 0-1.49246231155779i, 0-1.46231155778894i, 0-1.4321608040201i, 0-1.40201005025126i, 0-1.37185929648241i, 0-1.34170854271357i, 0-1.31155778894472i, 0-1.28140703517588i, 0-1.25125628140704i, 0-1.22110552763819i, 0-1.19095477386935i, 0-1.1608040201005i, 0-1.13065326633166i, 0-1.10050251256281i, 0-1.07035175879397i, 0-1.04020100502513i, 0-1.01005025125628i, 0-0.979899497487437i, 0-0.949748743718593i, 0-0.919597989949749i, 0-0.889447236180905i, 0-0.859296482412061i, 0-0.829145728643216i, 0-0.798994974874372i, 0-0.768844221105528i, 0-0.738693467336684i, 0-0.70854271356784i, 0-0.678391959798995i, 0-0.648241206030151i, 0-0.618090452261307i, 0-0.587939698492463i, 0-0.557788944723618i, 0-0.527638190954774i, 0-0.49748743718593i, 0-0.467336683417086i, 0-0.437185929648241i, 0-0.407035175879397i, 0-0.376884422110553i, 0-0.346733668341709i, 0-0.316582914572864i, 0-0.28643216080402i, 0-0.256281407035176i, 0-0.226130653266332i, 0-0.195979899497488i, 0-0.165829145728643i, 0-0.135678391959799i, 0-0.105527638190955i, 0-0.0753768844221105i, 0-0.0452261306532664i, 0-0.0150753768844223i, 0+0.0150753768844218i, 0+0.0452261306532664i, 0+0.0753768844221105i, 0+0.105527638190955i, 0+0.135678391959799i, 0+0.165829145728643i, 0+0.195979899497488i, 0+0.226130653266332i, 0+0.256281407035176i, 0+0.28643216080402i, 0+0.316582914572864i, 0+0.346733668341709i, 0+0.376884422110553i, 0+0.407035175879397i, 0+0.437185929648241i, 0+0.467336683417085i, 0+0.49748743718593i, 0+0.527638190954774i, 0+0.557788944723618i, 0+0.587939698492462i, 0+0.618090452261306i, 0+0.648241206030151i, 0+0.678391959798995i, 0+0.708542713567839i, 0+0.738693467336683i, 0+0.768844221105527i, 0+0.798994974874372i, 0+0.829145728643216i, 0+0.85929648241206i, 0+0.889447236180904i, 0+0.919597989949748i, 0+0.949748743718593i, 0+0.979899497487437i, 0+1.01005025125628i, 0+1.04020100502513i, 0+1.07035175879397i, 0+1.10050251256281i, 0+1.13065326633166i, 0+1.1608040201005i, 0+1.19095477386935i, 0+1.22110552763819i, 0+1.25125628140704i, 0+1.28140703517588i, 0+1.31155778894472i, 0+1.34170854271357i, 0+1.37185929648241i, 0+1.40201005025126i, 0+1.4321608040201i, 0+1.46231155778894i, 0+1.49246231155779i, 0+1.52261306532663i, 0+1.55276381909548i, 0+1.58291457286432i, 0+1.61306532663317i, 0+1.64321608040201i, 0+1.67336683417085i, 0+1.7035175879397i, 0+1.73366834170854i, 0+1.76381909547739i, 0+1.79396984924623i, 0+1.82412060301507i, 0+1.85427135678392i, 0+1.88442211055276i, 0+1.91457286432161i, 0+1.94472361809045i, 0+1.9748743718593i, 0+2.00502512562814i, 0+2.03517587939698i, 0+2.06532663316583i, 0+2.09547738693467i, 0+2.12562814070352i, 0+2.15577889447236i, 0+2.18592964824121i, 0+2.21608040201005i, 0+2.24623115577889i, 0+2.27638190954774i, 0+2.30653266331658i, 0+2.33668341708543i, 0+2.36683417085427i, 0+2.39698492462312i, 0+2.42713567839196i, 0+2.4572864321608i, 0+2.48743718592965i, 0+2.51758793969849i, 0+2.54773869346734i, 0+2.57788944723618i, 0+2.60804020100502i, 0+2.63819095477387i, 0+2.66834170854271i, 0+2.69849246231156i, 0+2.7286432160804i, 0+2.75879396984925i, 0+2.78894472361809i, 0+2.81909547738693i, 0+2.84924623115578i, 0+2.87939698492462i, 0+2.90954773869347i, 0+2.93969849246231i, 0+2.96984924623116i, 0+3i));cosh(argv[[1]]); [1] -0.98999250+0i -0.98528832+0i -0.97968851+0i -0.97319816+0i -0.96582319+0i [6] -0.95757027+0i -0.94844693+0i -0.93846145+0i -0.92762291+0i -0.91594116+0i [11] -0.90342682+0i -0.89009127+0i -0.87594663+0i -0.86100575+0i -0.84528221+0i [16] -0.82879032+0i -0.81154506+0i -0.79356210+0i -0.77485780+0i -0.75544915+0i [21] -0.73535379+0i -0.71459001+0i -0.69317666+0i -0.67113321+0i -0.64847970+0i [26] -0.62523673+0i -0.60142542+0i -0.57706741+0i -0.55218485+0i -0.52680035+0i [31] -0.50093699+0i -0.47461828+0i -0.44786815+0i -0.42071090+0i -0.39317122+0i [36] -0.36527415+0i -0.33704505+0i -0.30850958+0i -0.27969367+0i -0.25062352+0i [41] -0.22132555+0i -0.19182640+0i -0.16215288+0i -0.13233196+0i -0.10239075+0i [46] -0.07235647+0i -0.04225641+0i -0.01211795+0i 0.01803153+0i 0.04816462+0i [51] 0.07825393+0i 0.10827210+0i 0.13819186+0i 0.16798600+0i 0.19762744+0i [56] 0.22708923+0i 0.25634461+0i 0.28536696+0i 0.31412992+0i 0.34260734+0i [61] 0.37077332+0i 0.39860227+0i 0.42606889+0i 0.45314822+0i 0.47981564+0i [66] 0.50604690+0i 0.53181817+0i 0.55710601+0i 0.58188745+0i 0.60613995+0i [71] 0.62984147+0i 0.65297046+0i 0.67550591+0i 0.69742732+0i 0.71871477+0i [76] 0.73934891+0i 0.75931098+0i 0.77858284+0i 0.79714696+0i 0.81498649+0i [81] 0.83208519+0i 0.84842752+0i 0.86399864+0i 0.87878438+0i 0.89277130+0i [86] 0.90594670+0i 0.91829860+0i 0.92981576+0i 0.94048772+0i 0.95030477+0i [91] 0.95925801+0i 0.96733927+0i 0.97454123+0i 0.98085733+0i 0.98628183+0i [96] 0.99080980+0i 0.99443712+0i 0.99716051+0i 0.99897747+0i 0.99988637+0i [101] 0.99988637+0i 0.99897747+0i 0.99716051+0i 0.99443712+0i 0.99080980+0i [106] 0.98628183+0i 0.98085733+0i 0.97454123+0i 0.96733927+0i 0.95925801+0i [111] 0.95030477+0i 0.94048772+0i 0.92981576+0i 0.91829860+0i 0.90594670+0i [116] 0.89277130+0i 0.87878438+0i 0.86399864+0i 0.84842752+0i 0.83208519+0i [121] 0.81498649+0i 0.79714696+0i 0.77858284+0i 0.75931098+0i 0.73934891+0i [126] 0.71871477+0i 0.69742732+0i 0.67550591+0i 0.65297046+0i 0.62984147+0i [131] 0.60613995+0i 0.58188745+0i 0.55710601+0i 0.53181817+0i 0.50604690+0i [136] 0.47981564+0i 0.45314822+0i 0.42606889+0i 0.39860227+0i 0.37077332+0i [141] 0.34260734+0i 0.31412992+0i 0.28536696+0i 0.25634461+0i 0.22708923+0i [146] 0.19762744+0i 0.16798600+0i 0.13819186+0i 0.10827210+0i 0.07825393+0i [151] 0.04816462+0i 0.01803153+0i -0.01211795+0i -0.04225641+0i -0.07235647+0i [156] -0.10239075+0i -0.13233196+0i -0.16215288+0i -0.19182640+0i -0.22132555+0i [161] -0.25062352+0i -0.27969367+0i -0.30850958+0i -0.33704505+0i -0.36527415+0i [166] -0.39317122+0i -0.42071090+0i -0.44786815+0i -0.47461828+0i -0.50093699+0i [171] -0.52680035+0i -0.55218485+0i -0.57706741+0i -0.60142542+0i -0.62523673+0i [176] -0.64847970+0i -0.67113321+0i -0.69317666+0i -0.71459001+0i -0.73535379+0i [181] -0.75544915+0i -0.77485780+0i -0.79356210+0i -0.81154506+0i -0.82879032+0i [186] -0.84528221+0i -0.86100575+0i -0.87594663+0i -0.89009127+0i -0.90342682+0i [191] -0.91594116+0i -0.92762291+0i -0.93846145+0i -0.94844693+0i -0.95757027+0i [196] -0.96582319+0i -0.97319816+0i -0.97968851+0i -0.98528832+0i -0.98999250+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testTrigExp# #{ cospi() } Error in cospi() : 0 arguments passed to 'cospi' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testTrigExp# #{ cospi(1.2) } [1] -0.809017 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testTrigExp# #{ cospi(c(0,0.5,-0.5,1,-1,1.5,-1.5)) } [1] 1 0 0 -1 -1 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testTrigExp# #{ cospi(c(0.3,0.6,0.9)) } [1] 0.5877853 -0.3090170 -0.9510565 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testcos1# #argv <- list(c(-6.28318530717959, -6.1261056745001, -5.96902604182061, -5.81194640914112, -5.65486677646163, -5.49778714378214, -5.34070751110265, -5.18362787842316, -5.02654824574367, -4.86946861306418, -4.71238898038469, -4.5553093477052, -4.39822971502571, -4.24115008234622, -4.08407044966673, -3.92699081698724, -3.76991118430775, -3.61283155162826, -3.45575191894877, -3.29867228626928, -3.14159265358979, -2.9845130209103, -2.82743338823081, -2.67035375555132, -2.51327412287183, -2.35619449019234, -2.19911485751286, -2.04203522483337, -1.88495559215388, -1.72787595947439, -1.5707963267949, -1.41371669411541, -1.25663706143592, -1.09955742875643, -0.942477796076938, -0.785398163397448, -0.628318530717959, -0.471238898038469, -0.314159265358979, -0.15707963267949, 0, 0.15707963267949, 0.314159265358979, 0.471238898038469, 0.628318530717959, 0.785398163397448, 0.942477796076938, 1.09955742875643, 1.25663706143592, 1.41371669411541, 1.5707963267949, 1.72787595947439, 1.88495559215388, 2.04203522483337, 2.19911485751286, 2.35619449019234, 2.51327412287183, 2.67035375555133, 2.82743338823081, 2.9845130209103, 3.14159265358979, 3.29867228626928, 3.45575191894877, 3.61283155162826, 3.76991118430775, 3.92699081698724, 4.08407044966673, 4.24115008234622, 4.39822971502571, 4.5553093477052, 4.71238898038469, 4.86946861306418, 5.02654824574367, 5.18362787842316, 5.34070751110265, 5.49778714378214, 5.65486677646163, 5.81194640914112, 5.96902604182061, 6.1261056745001, 6.28318530717959, 6.44026493985908, 6.59734457253857, 6.75442420521805, 6.91150383789754, 7.06858347057704, 7.22566310325652, 7.38274273593601, 7.5398223686155, 7.69690200129499, 7.85398163397448, 8.01106126665397, 8.16814089933346, 8.32522053201295, 8.48230016469244, 8.63937979737193, 8.79645943005142, 8.95353906273091, 9.1106186954104, 9.26769832808989, 9.42477796076938));cospi(argv[[1]]); [1] 0.629681725 0.922544680 0.995269354 0.830502131 0.467559887 [6] -0.006951837 -0.479804709 -0.838166232 -0.996523921 -0.917090348 [11] -0.618820010 -0.172886392 0.314301502 0.726490544 0.965323885 [16] 0.973810939 0.749926519 0.347094089 -0.138562184 -0.591154649 [21] -0.902685362 -0.998816638 -0.856609563 -0.509997692 -0.041689801 [26] 0.436566140 0.810648352 0.991293066 0.935394708 0.656291786 [31] 0.220584041 -0.267759628 -0.692210300 -0.951485247 -0.983716094 [36] -0.781211892 -0.392294341 0.090232771 0.551228473 0.880689637 [41] 1.000000000 0.880689637 0.551228473 0.090232771 -0.392294341 [46] -0.781211892 -0.983716094 -0.951485247 -0.692210300 -0.267759628 [51] 0.220584041 0.656291786 0.935394708 0.991293066 0.810648352 [56] 0.436566140 -0.041689801 -0.509997692 -0.856609563 -0.998816638 [61] -0.902685362 -0.591154649 -0.138562184 0.347094089 0.749926519 [66] 0.973810939 0.965323885 0.726490544 0.314301502 -0.172886392 [71] -0.618820010 -0.917090348 -0.996523921 -0.838166232 -0.479804709 [76] -0.006951837 0.467559887 0.830502131 0.995269354 0.922544680 [81] 0.629681725 0.186563660 -0.301072362 -0.716866278 -0.961601042 [86] -0.976877867 -0.759051386 -0.360099512 0.124779569 0.579883659 [91] 0.896615489 0.999396280 0.863700405 0.521907712 0.055577022 [96] -0.424015498 -0.802429131 -0.989366542 -0.940220591 -0.666718519 [101] -0.234123590 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testcos2# #argv <- list(c(0.0156298141969641, 0.0312596283939283, 0.0468894425908924, 0.0625192567878566, 0.0781490709848207, 0.0937788851817849, 0.109408699378749, 0.125038513575713, 0.140668327772677, 0.156298141969641, 0.171927956166606, 0.18755777036357, 0.203187584560534, 0.218817398757498, 0.234447212954462, 0.250077027151426, 0.26570684134839, 0.281336655545355, 0.296966469742319, 0.312596283939283, 0.328226098136247, 0.343855912333211, 0.359485726530175, 0.375115540727139, 0.390745354924104, 0.406375169121068, 0.422004983318032, 0.437634797514996, 0.45326461171196, 0.468894425908924, 0.484524240105888, 0.500154054302853, 0.515783868499817, 0.531413682696781, 0.547043496893745, 0.562673311090709, 0.578303125287673, 0.593932939484637, 0.609562753681602, 0.625192567878566, 0.64082238207553, 0.656452196272494, 0.672082010469458, 0.687711824666422, 0.703341638863387, 0.718971453060351, 0.734601267257315, 0.750231081454279, 0.765860895651243, 0.781490709848207, 0.797120524045171, 0.812750338242136, 0.8283801524391, 0.844009966636064, 0.859639780833028, 0.875269595029992, 0.890899409226956, 0.90652922342392, 0.922159037620885, 0.937788851817849, 0.953418666014813, 0.969048480211777, 0.984678294408741, 1.00030810860571, 1.01593792280267, 1.03156773699963, 1.0471975511966, 1.06282736539356, 1.07845717959053, 1.09408699378749, 1.10971680798445, 1.12534662218142, 1.14097643637838, 1.15660625057535, 1.17223606477231, 1.18786587896927, 1.20349569316624, 1.2191255073632, 1.23475532156017, 1.25038513575713, 1.2660149499541, 1.28164476415106, 1.29727457834802, 1.31290439254499, 1.32853420674195, 1.34416402093892, 1.35979383513588, 1.37542364933284, 1.39105346352981, 1.40668327772677, 1.42231309192374, 1.4379429061207, 1.45357272031767, 1.46920253451463, 1.48483234871159, 1.50046216290856, 1.51609197710552, 1.53172179130249, 1.54735160549945, 1.56298141969641));cospi(argv[[1]]); [1] 0.9987947140 0.9951817613 0.9891698514 0.9807734762 0.9700128760 [6] 0.9569139898 0.9415083935 0.9238332234 0.9039310867 0.8818499591 [11] 0.8576430686 0.8313687676 0.8030903924 0.7728761100 0.7407987539 [16] 0.7069356492 0.6713684251 0.6341828191 0.5954684696 0.5553187006 [21] 0.5138302958 0.4711032661 0.4272406080 0.3823480556 0.3365338257 [26] 0.2899083568 0.2425840429 0.1946749627 0.1462966044 0.0975655877 [31] 0.0485993821 -0.0004839758 -0.0495661671 -0.0985288756 -0.1472540731 [36] -0.1956243040 -0.2435229685 -0.2908346033 -0.3374451604 -0.3832422815 [41] -0.4281155696 -0.4719568542 -0.5146604529 -0.5561234254 -0.5962458224 [46] -0.6349309258 -0.6720854825 -0.7076199287 -0.7414486062 -0.7734899683 [51] -0.8036667771 -0.8319062893 -0.8581404315 -0.8823059643 -0.9043446350 [56] -0.9242033178 -0.9418341420 -0.9571946071 -0.9702476856 -0.9809619122 [61] -0.9893114594 -0.9952762001 -0.9988417558 -0.9999995315 -0.9987467363 [66] -0.9950863902 -0.9890273166 -0.9805841214 -0.9697771575 -0.9566324759 [71] -0.9411817629 -0.9234622633 -0.9035166915 -0.8813931276 -0.8571449021 [76] -0.8308304670 -0.8025132553 -0.7722615275 -0.7401482077 -0.7062507073 [81] -0.6706507387 -0.6334341181 -0.5946905590 -0.5545134555 -0.5129996573 [86] -0.4702492365 -0.4263652461 -0.3814534714 -0.3356221758 -0.2889818387 [91] -0.2416448900 -0.1937254389 -0.1453389987 -0.0966022084 -0.0476325515 [96] 0.0014519271 0.0505329057 0.0994920711 0.1482114037 0.1965734621 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testcos3# #argv <- list(c(0.560475646552213, 0.23017748948328, -1.55870831414912, -0.070508391424576, -0.129287735160946, -1.71506498688328, -0.460916205989202, 1.26506123460653, 0.686852851893526, 0.445661970099958, -1.22408179743946, -0.359813827057364, -0.400771450594052, -0.11068271594512, 0.555841134754075, -1.78691313680308, -0.497850478229239, 1.96661715662964, -0.701355901563686, 0.472791407727934, 1.06782370598685, 0.217974914658295, 1.02600444830724, 0.72889122929114, 0.625039267849257, 1.68669331074241, -0.837787044494525, -0.153373117836515, 1.13813693701195, -1.25381492106993, -0.426464221476814, 0.295071482992271, -0.895125661045022, -0.878133487533042, -0.821581081637487, -0.688640254100091, -0.553917653537589, 0.0619117105767217, 0.305962663739917, 0.380471001012383, 0.694706978920513, 0.207917278019599, 1.26539635156826, -2.16895596533851, -1.20796199830499, 1.12310858320335, 0.402884835299076, 0.466655353623219, -0.779965118336318, 0.0833690664718293, -0.253318513994755, 0.028546755348703, 0.0428704572913161, -1.36860228401446, 0.225770985659268, -1.51647060442954, 1.54875280423022, -0.584613749636069, -0.123854243844614, -0.215941568743973, -0.379639482759882, 0.502323453109302, 0.33320738366942, 1.01857538310709, 1.07179122647558, -0.303528641404258, -0.448209778629426, -0.0530042267305041, -0.922267467879738, -2.05008468562714, 0.491031166056535, 2.30916887564081, -1.00573852446226, 0.709200762582393, 0.688008616467358, -1.0255713696967, 0.284773007051009, 1.22071771225454, -0.18130347974915, 0.138891362439045, -0.00576418589988693, -0.38528040112633, 0.370660031792409, -0.644376548518833, 0.220486561818751, -0.331781963915697, -1.09683901314935, -0.435181490833803, 0.325931585531227, -1.14880761845109, -0.993503855962119, -0.54839695950807, -0.238731735111441, 0.627906076039371, -1.36065244853001, 0.600259587147127, -2.18733299301658, -1.53261062618519, 0.235700359100477));cospi(argv[[1]]); [1] -0.188848925 0.749742206 0.183393709 0.975567108 0.918641004 [6] 0.625401978 0.122477069 -0.672870215 -0.553878645 0.169880057 [11] -0.762276209 0.426308434 0.306711124 0.940152075 -0.174531651 [16] 0.784174183 0.006752870 0.994505625 -0.591226071 0.085374260 [21] -0.977385393 0.774552909 -0.996664788 -0.658694992 -0.382797403 [26] 0.553461267 -0.872936280 0.886145666 -0.907303620 -0.698581577 [31] 0.228970020 0.600240625 -0.946213160 -0.927601897 -0.846979012 [36] -0.558545164 -0.168578454 0.981144164 0.572528298 0.366748366 [41] -0.574251858 0.794148360 -0.672091022 0.862407015 -0.794062971 [46] -0.926137137 0.300385018 0.104563809 -0.770443387 0.965896765 [51] 0.699696603 0.995981239 0.990944146 -0.401173959 0.758830694 [56] 0.051720843 0.152563332 -0.262702422 0.925251013 0.778577512 [61] 0.369177380 -0.007299278 0.500342632 -0.998297755 -0.974673758 [66] 0.578780919 0.161986865 0.986167935 -0.970330104 0.987646687 [71] 0.028172695 0.564241012 -0.999837498 -0.610921141 -0.556898100 [76] -0.996774893 0.625799037 -0.769074048 0.842126640 0.906304503 [81] 0.999836042 0.352650668 0.395244027 -0.438179423 0.769537990 [86] 0.504214854 -0.954078275 0.202228939 0.520000941 -0.892700907 [91] -0.999791759 -0.151458405 0.731690324 -0.391102116 -0.423923750 [96] -0.309792494 0.831760988 0.102270182 0.738148515 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testcos4# #argv <- list(c(-1.88495559215388, 0.628318530717959, -2.51327412287183, 5.02654824574367, 0.942477796076938, -2.51327412287183, 1.5707963267949, 2.19911485751286, 1.88495559215388, -0.942477796076938, 4.71238898038469, 1.25663706143592, -1.88495559215388, -6.91150383789755, 3.45575191894877, 0, 0, 2.82743338823081, 2.51327412287183, 1.88495559215388, 2.82743338823081, 2.51327412287183, 0.314159265358979, -6.28318530717959, 1.88495559215388, -0.314159265358979, -0.628318530717959, -4.71238898038469, -1.5707963267949, 1.25663706143592));cospi(argv[[1]]); [1] 0.9353947 -0.3922943 -0.0416898 -0.9965239 -0.9837161 -0.0416898 [7] 0.2205840 0.8106484 0.9353947 -0.9837161 -0.6188200 -0.6922103 [13] 0.9353947 -0.9616010 -0.1385622 1.0000000 1.0000000 -0.8566096 [19] -0.0416898 0.9353947 -0.8566096 -0.0416898 0.5512285 0.6296817 [25] 0.9353947 0.5512285 -0.3922943 -0.6188200 0.2205840 -0.6922103 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testcos5# #argv <- list(structure(c(-0.416146836547142, -0.989992496600445, -0.653643620863612, 0.283662185463226, 0.960170286650366, -0.416146836547142, 0.283662185463226, -0.839071529076452, -0.275163338051597, 0.64691932232864, 0.283662185463226, -0.759687912858821, 0.914742357804531, -0.918282786212119, 0.776685982021631), .Dim = c(5L, 3L)));cospi(argv[[1]]); [,1] [,2] [,3] [1,] 0.2603961 0.2603961 0.6285172 [2,] -0.9995058 0.6285172 -0.7282971 [3,] -0.4641597 -0.8748977 -0.9643435 [4,] 0.6285172 0.6490578 -0.9672274 [5,] -0.9921816 -0.4453460 -0.7638352 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testcos6#Ignored.Unimplemented# #argv <- list(c(-0.560475646552213-0.710406563699301i, -0.23017748948328+0.25688370915653i, 1.55870831414912-0.24669187846237i, 0.070508391424576-0.347542599397733i, 0.129287735160946-0.951618567265016i, 1.71506498688328-0.04502772480892i, 0.460916205989202-0.784904469457076i, -1.26506123460653-1.66794193658814i, -0.686852851893526-0.380226520287762i, -0.445661970099958+0.918996609060766i, 1.22408179743946-0.57534696260839i, 0.359813827057364+0.607964322225033i, 0.40077145059405-1.61788270828916i, 0.11068271594512-0.055561965524539i, -0.555841134754075+0.519407203943462i, 1.78691313680308+0.30115336216671i, 0.497850478229239+0.105676194148943i, -1.96661715662964-0.64070600830538i, 0.701355901563686-0.849704346033582i, -0.47279140772793-1.02412879060491i, -1.06782370598685+0.11764659710013i, -0.217974914658295-0.947474614184802i, -1.02600444830724-0.49055744370067i, -0.72889122929114-0.256092192198247i, -0.62503926784926+1.84386200523221i, -1.68669331074241-0.65194990169546i, 0.837787044494525+0.235386572284857i, 0.153373117836515+0.077960849563711i, -1.13813693701195-0.96185663413013i, 1.25381492106993-0.0713080861236i, 0.42646422147681+1.44455085842335i, -0.295071482992271+0.451504053079215i, 0.895125661045022+0.04123292199294i, 0.878133487533042-0.422496832339625i, 0.82158108163749-2.05324722154052i, 0.68864025410009+1.13133721341418i, 0.55391765353759-1.46064007092482i, -0.061911710576722+0.739947510877334i, -0.30596266373992+1.90910356921748i, -0.38047100101238-1.4438931609718i, -0.694706978920513+0.701784335374711i, -0.207917278019599-0.262197489402468i, -1.26539635156826-1.57214415914549i, 2.16895596533851-1.51466765378175i, 1.20796199830499-1.60153617357459i, -1.12310858320335-0.5309065221703i, -0.40288483529908-1.4617555849959i, -0.466655353623219+0.687916772975828i, 0.77996511833632+2.10010894052567i, -0.08336906647183-1.28703047603518i, 0.253318513994755+0.787738847475178i, -0.028546755348703+0.76904224100091i, -0.042870457291316+0.332202578950118i, 1.36860228401446-1.00837660827701i, -0.225770985659268-0.119452606630659i, 1.51647060442954-0.28039533517025i, -1.54875280423022+0.56298953322048i, 0.584613749636069-0.372438756103829i, 0.123854243844614+0.976973386685621i, 0.215941568743973-0.374580857767014i, 0.37963948275988+1.05271146557933i, -0.5023234531093-1.04917700666607i, -0.33320738366942-1.26015524475811i, -1.01857538310709+3.2410399349424i, -1.07179122647558-0.41685758816043i, 0.303528641404258+0.298227591540715i, 0.448209778629426+0.636569674033849i, 0.053004226730504-0.483780625708744i, 0.922267467879738+0.516862044313609i, 2.05008468562714+0.36896452738509i, -0.491031166056535-0.215380507641693i, -2.30916887564081+0.06529303352532i, 1.00573852446226-0.03406725373846i, -0.70920076258239+2.12845189901618i, -0.688008616467358-0.741336096272828i, 1.0255713696967-1.09599626707466i, -0.284773007051009+0.037788399171079i, -1.22071771225454+0.31048074944314i, 0.18130347974915+0.436523478910183i, -0.138891362439045-0.458365332711106i, 0.00576418589989-1.06332613397119i, 0.38528040112633+1.26318517608949i, -0.370660031792409-0.349650387953555i, 0.644376548518833-0.865512862653374i, -0.220486561818751-0.236279568941097i, 0.331781963915697-0.197175894348552i, 1.09683901314935+1.10992028971364i, 0.435181490833803+0.084737292197196i, -0.325931585531227+0.754053785184521i, 1.14880761845109-0.49929201717226i, 0.993503855962119+0.214445309581601i, 0.54839695950807-0.324685911490835i, 0.238731735111441+0.094583528173571i, -0.627906076039371-0.895363357977542i, 1.36065244853001-1.31080153332797i, -0.60025958714713+1.99721338474797i, 2.18733299301658+0.60070882367242i, 1.53261062618519-1.25127136162494i, -0.235700359100477-0.611165916680421i, -1.02642090030678-1.18548008459731i));cospi(argv[[1]]); Error in cospi(argv[[1]]) : unimplemented complex function ##com.oracle.truffle.r.test.builtins.TestBuiltin_cospi.testcos7#Output.MissingWarning# #argv <- list(Inf);cospi(argv[[1]]); [1] NaN Warning message: In cospi(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64) Error in .Call(utils:::C_crc64) : Incorrect number of arguments (0), expecting 1 for 'crc64' ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, 'a', 'b') Error in .Call(utils:::C_crc64, "a", "b") : Incorrect number of arguments (2), expecting 1 for 'crc64' ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, 'abc') [1] "2cd8094a1a277627" ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, 01) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, NA) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, NULL) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, c('a')) [1] "330284772e652b05" ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, c('a', 'b')) [1] "330284772e652b05" ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, c(1, 2)) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, c(NULL)) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, double(0)) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, environment) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, integer(0)) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, list(NULL)) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, list(list())) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, new.env()) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, paste(c(letters, LETTERS, 0:9), collapse="")) [1] "90db9ccd9021d2d7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Call# #.Call(utils:::C_crc64, stdout()) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64('a')) [1] "330284772e652b05" ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64('a', 'b')) Error: 2 arguments passed to .Internal(crc64) which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64()) Error: 0 arguments passed to .Internal(crc64) which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(01)) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(NA)) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(NULL)) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(c('a'))) [1] "330284772e652b05" ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(c('a', 'b'))) [1] "330284772e652b05" ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(c(1, 2))) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(c(NULL))) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(double(0))) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(environment)) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(integer(0))) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(list(NULL))) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(list(list()))) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(new.env())) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(paste(c(letters, LETTERS, 0:9), collapse=""))) [1] "90db9ccd9021d2d7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal# #.Internal(crc64(stdout())) Error: input must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal#Output.IgnoreErrorContext# #crc64('a') Error in crc64("a") : could not find function "crc64" ##com.oracle.truffle.r.test.builtins.TestBuiltin_crc64.testCrc64_Internal#Output.IgnoreErrorContext# #crc64() Error in crc64() : could not find function "crc64" ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=0), complex(real=0, imaginary=0)) [,1] [1,] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=0), complex(real=0, imaginary=1)) [,1] [1,] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=0), complex(real=0, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=0), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=0), complex(real=1, imaginary=0)) [,1] [1,] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=0), complex(real=1, imaginary=1)) [,1] [1,] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=0), complex(real=1, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=0), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=0), complex(real=Inf, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=0), complex(real=Inf, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=0), complex(real=Inf, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=0), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=0), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=0), complex(real=NaN, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=0), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=1), complex(real=0, imaginary=0)) [,1] [1,] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=1), complex(real=0, imaginary=1)) [,1] [1,] -1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=1), complex(real=0, imaginary=Inf)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=1), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=1), complex(real=1, imaginary=0)) [,1] [1,] 0+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=1), complex(real=1, imaginary=1)) [,1] [1,] -1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=1), complex(real=1, imaginary=Inf)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=1), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=1), complex(real=Inf, imaginary=0)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=1), complex(real=Inf, imaginary=1)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=1), complex(real=Inf, imaginary=NaN)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=1), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=1), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=1), complex(real=NaN, imaginary=Inf)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=1), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=Inf), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=Inf), complex(real=0, imaginary=1)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=Inf), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=Inf), complex(real=1, imaginary=0)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=Inf), complex(real=1, imaginary=1)) [,1] [1,] -Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=Inf), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=Inf), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=Inf), complex(real=NaN, imaginary=1)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=Inf), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=NaN), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=NaN), complex(real=0, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=NaN), complex(real=0, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=NaN), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=NaN), complex(real=1, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=NaN), complex(real=1, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=NaN), complex(real=1, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=NaN), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=NaN), complex(real=Inf, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=NaN), complex(real=Inf, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=NaN), complex(real=Inf, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=NaN), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=NaN), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=0, imaginary=NaN), complex(real=NaN, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=0, imaginary=NaN), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=0), complex(real=0, imaginary=0)) [,1] [1,] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=0), complex(real=0, imaginary=1)) [,1] [1,] 0+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=0), complex(real=0, imaginary=Inf)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=0), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=0), complex(real=1, imaginary=0)) [,1] [1,] 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=0), complex(real=1, imaginary=1)) [,1] [1,] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=0), complex(real=1, imaginary=Inf)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=0), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=0), complex(real=Inf, imaginary=0)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=0), complex(real=Inf, imaginary=1)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=0), complex(real=Inf, imaginary=NaN)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=0), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=0), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=0), complex(real=NaN, imaginary=Inf)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=0), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=1), complex(real=0, imaginary=0)) [,1] [1,] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=1), complex(real=0, imaginary=1)) [,1] [1,] -1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=1), complex(real=0, imaginary=Inf)) [,1] [1,] -Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=1), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=1), complex(real=1, imaginary=0)) [,1] [1,] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=1), complex(real=1, imaginary=1)) [,1] [1,] 0+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=1), complex(real=1, imaginary=Inf)) [,1] [1,] -Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=1), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=1), complex(real=Inf, imaginary=0)) [,1] [1,] Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=1), complex(real=Inf, imaginary=1)) [,1] [1,] Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=1), complex(real=Inf, imaginary=NaN)) [,1] [1,] Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=1), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=1), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=1), complex(real=NaN, imaginary=Inf)) [,1] [1,] -Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=1), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=Inf), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=Inf), complex(real=0, imaginary=1)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=Inf), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=Inf), complex(real=1, imaginary=0)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=Inf), complex(real=1, imaginary=1)) [,1] [1,] -Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=Inf), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=Inf), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=Inf), complex(real=NaN, imaginary=1)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=Inf), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=NaN), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=NaN), complex(real=0, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=NaN), complex(real=0, imaginary=Inf)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=NaN), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=NaN), complex(real=1, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=NaN), complex(real=1, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=NaN), complex(real=1, imaginary=Inf)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=NaN), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=NaN), complex(real=Inf, imaginary=0)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=NaN), complex(real=Inf, imaginary=1)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=NaN), complex(real=Inf, imaginary=NaN)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=NaN), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=NaN), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=1, imaginary=NaN), complex(real=NaN, imaginary=Inf)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=1, imaginary=NaN), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=0), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=0), complex(real=0, imaginary=1)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=0), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=0), complex(real=1, imaginary=0)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=0), complex(real=1, imaginary=1)) [,1] [1,] Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=0), complex(real=1, imaginary=NaN)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=0), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=0), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=0), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=1), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=1), complex(real=0, imaginary=1)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=1), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=1), complex(real=1, imaginary=0)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=1), complex(real=1, imaginary=1)) [,1] [1,] Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=1), complex(real=1, imaginary=NaN)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=1), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=1), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=1), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=NaN), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=NaN), complex(real=0, imaginary=1)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=NaN), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=NaN), complex(real=1, imaginary=0)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=NaN), complex(real=1, imaginary=1)) [,1] [1,] Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=NaN), complex(real=1, imaginary=NaN)) [,1] [1,] Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=NaN), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=NaN), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=Inf, imaginary=NaN), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=0), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=0), complex(real=0, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=0), complex(real=0, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=0), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=0), complex(real=1, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=0), complex(real=1, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=0), complex(real=1, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=0), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=0), complex(real=Inf, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=0), complex(real=Inf, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=0), complex(real=Inf, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=0), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=0), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=0), complex(real=NaN, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=0), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=1), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=1), complex(real=0, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=1), complex(real=0, imaginary=Inf)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=1), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=1), complex(real=1, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=1), complex(real=1, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=1), complex(real=1, imaginary=Inf)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=1), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=1), complex(real=Inf, imaginary=0)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=1), complex(real=Inf, imaginary=1)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=1), complex(real=Inf, imaginary=NaN)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=1), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=1), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=1), complex(real=NaN, imaginary=Inf)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=1), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=Inf), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=Inf), complex(real=0, imaginary=1)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=Inf), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=Inf), complex(real=1, imaginary=0)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=Inf), complex(real=1, imaginary=1)) [,1] [1,] -Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=Inf), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=Inf), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=Inf), complex(real=NaN, imaginary=1)) [,1] [1,] -Inf+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=Inf), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=0, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=0, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=0, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=0, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=1, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=1, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=1, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=1, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=Inf, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=Inf, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=Inf, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=NaN, imaginary=0)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=NaN, imaginary=1)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=NaN, imaginary=Inf)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #crossprod(complex(real=NaN, imaginary=NaN), complex(real=NaN, imaginary=NaN)) [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Output.ImprovedErrorContext# #{ crossprod('asdf', matrix(1:6, ncol=2)) } Error in crossprod(x, y) : requires numeric/complex matrix/vector arguments ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #{ crossprod(1:3, matrix(1:6, ncol=2)) } [,1] [,2] [1,] 14 32 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #{ crossprod(c(1,NA,2), matrix(1:6, ncol=2)) } [,1] [,2] [1,] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #{ crossprod(t(1:2), 5) } [,1] [1,] 5 [2,] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #{ x <- 1:2 ; crossprod(t(x)) } [,1] [,2] [1,] 1 2 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #{ x <- 1:6 ; crossprod(x) } [,1] [1,] 91 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod# #{ x <- matrix(c(0.368962955428, 0.977400955511, 0.5002433417831, 0.0664379808586, 0.6384031679481, 0.4481831840239), nrow=2); crossprod(x) } [,1] [,2] [,3] [1,] 1.0914463 0.2495078 0.6736018 [2,] 0.2495078 0.2546574 0.3491333 [3,] 0.6736018 0.3491333 0.6084268 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #{ x <- matrix(c(NaN,2+3i,3,4+1i,5,NA), nrow=3); crossprod(x) } [,1] [,2] [1,] NaN+NaNi NaN+NaNi [2,] NaN+NaNi NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprod#Ignored.ImplementationError# #{ x <- matrix(c(NaN,2,3,4,5,NA), nrow=3); crossprod(x) } [,1] [,2] [1,] NaN NA [2,] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testCrossprodDimnames# #{ crossprod(structure(1:9, .Dim=c(3L,3L), .Dimnames=list(c('a', 'b', 'c'), c('A', 'B', 'C'))), structure(1:9, .Dim=c(3L,3L), .Dimnames=list(c('d', 'e', 'f'), c('D', 'E', 'F')))) } D E F A 14 32 50 B 32 77 122 C 50 122 194 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testcrossprod1# #argv <- list(structure(c(1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1), .Dim = c(60L, 5L)), structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1), .Dim = c(60L, 6L))); .Internal(crossprod(argv[[1]], argv[[2]])) [,1] [,2] [,3] [,4] [,5] [,6] [1,] 2 2 2 2 2 2 [2,] 2 2 2 2 2 2 [3,] 2 2 2 2 2 2 [4,] 2 2 2 2 2 2 [5,] 2 2 2 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testcrossprod2#Ignored.ImplementationError# #argv <- list(numeric(0), numeric(0)); .Internal(crossprod(argv[[1]], argv[[2]])) [,1] [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testcrossprod3# #argv <- list(c(1.078125, 0.603125, -0.90625, 0.984375, 1.359375, -2.21875, -0.5, 1.2, 0.5), c(3.1859635002998, 2.5309880107589, 0.0716489644728567, 1.23651898905887, 1.28393932315826, -0.671528370670039, 0.873486219199556, 1.05088299688189, 0.0536562654335257)); .Internal(crossprod(argv[[1]], argv[[2]])) [,1] [1,] 10.20009 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testcrossprod4# #argv <- list(structure(c(1, 2, 3, 4, 5, 6), .Dim = 2:3), c(2, 1)); .Internal(crossprod(argv[[1]], argv[[2]])) [,1] [1,] 4 [2,] 10 [3,] 16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testcrossprod5# #argv <- list(c(1, 2, 3), structure(c(1, 3, 5, 2, 4, 6), .Dim = c(3L, 2L))); .Internal(crossprod(argv[[1]], argv[[2]])) [,1] [,2] [1,] 22 28 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testcrossprod6# #argv <- list(structure(c(0, 0, 1, 0), .Dim = c(2L, 2L), .Dimnames = list(NULL, NULL)), c(2, 3)); .Internal(crossprod(argv[[1]], argv[[2]])) [,1] [1,] 0 [2,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testcrossprod7# #argv <- list(structure(c(-0.409148064492827, 0, 0.486127240746069, 0.000757379686646223), .Dim = c(2L, 2L), .Dimnames = list(c('Vm', 'K'), NULL)), structure(c(0, 6.20800822278518, 6.20800822278518, -25013.7571686415), .Dim = c(2L, 2L))); .Internal(crossprod(argv[[1]], argv[[2]])) [,1] [,2] [1,] 0.000000000 -2.539995 [2,] 0.004701819 -15.927030 ##com.oracle.truffle.r.test.builtins.TestBuiltin_crossprod.testcrossprod8# #argv <- list(structure(c(-0.0972759604917099, -0.0972759604917099, -0.197781705719934, -0.197781705719934, -0.258476920906799, -0.258476920906799, -0.31681058743414, -0.31681058743414, -0.36711291168933, -0.36711291168933, -0.386611727075222, -0.386611727075222, -0.339690730499459, -0.33969073049946, -0.392353467475584, -0.392353467475584, -0.277328754578855, -0.277328754578855, -0.062581948827679, -0.062581948827679, 0.204605005658209, 0.204605005658209, 0.32860008733551, 0.32860008733551, 0.504748197638673, 0.504748197638673, 0.0398546163039329, 0.039854616303933, -0.269613788250837, -0.269613788250837, -0.312096598983548, -0.312096598983548, 0.0190548270250438, 0.0190548270250438, 0.270521530002251, 0.270521530002251), .Dim = c(12L, 3L)), structure(c(-2.82631170793264, -2.82631170793264, -3.89457420977924, -3.89457420977924, -3.62818861156626, -3.62818861156626, -2.72530862462141, -2.72530862462141, -1.437640468988, -1.437640468988, -0.811701520293695, -0.811701520293695, 14291.543903102, 14291.543903102, 13346.8386233407, 13346.8386233407, 8863.44390274002, 8863.44390274002, 4080.15117667984, 4080.15117667984, 979.818149952962, 979.818149952962, 296.593928028368, 296.593928028368), .Dim = c(12L, 2L), .Dimnames = list(NULL, c('Vm', 'K')))); .Internal(crossprod(argv[[1]], argv[[2]])) Vm K [1,] 7.376014e+00 -16175.971 [2,] 6.208008e+00 -25013.757 [3,] 1.665335e-16 8362.723 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #a <- structure(1:3, names=c('a1','a2','a3')); b<-cummax(a); names(b)[1]<-'x'; a; a1 a2 a3 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #values <- c(1,2,NA,1, NaN); cummax(values); cummax(as.integer(values)) [1] 1 2 NA NA NA [1] 1 2 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #values <- c(1,2,NaN,1, NA); cummax(values); cummax(as.integer(values)) [1] 1 2 NaN NaN NaN [1] 1 2 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #{ cummax(1:10) } [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #{ cummax(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #{ cummax(as.logical(-2:2)) } [1] 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #{ cummax(c(1+1i, NA, 2+3i)) } Error in cummax(c(1 + (0+1i), NA, 2 + (0+3i))) : 'cummax' not defined for complex numbers ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #{ cummax(c(1+1i,2-3i,4+5i)) } Error in cummax(c(1 + (0+1i), 2 - (0+3i), 4 + (0+5i))) : 'cummax' not defined for complex numbers ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #{ cummax(c(1,2,3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #{ cummax(c(2000000000L, NA, 2000000000L)) } [1] 2000000000 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #{ cummax(c(TRUE,FALSE,NA,TRUE)) } [1] 1 1 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testCumulativeMax# #{ cummax(c(TRUE,FALSE,TRUE)) } [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testcummax1# #argv <- list(c(3L, 2L, 1L, 2L, 1L, 0L, 4L, 3L, 2L));cummax(argv[[1]]); [1] 3 3 3 3 3 3 4 4 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testcummax2# #argv <- list(c(1.4124321047876e-05, 0.00123993824202733, 0.00149456828694326, 0.00559442649445619, 0.00589461369451042, 0.00682814400910408, 0.00716033530387356, 0.00831306755655091, 0.0117236981036592, 0.0193564395772821, 0.0305747157670471, 0.0790837327244679, 0.158516621910594, 0.166302063477173, 0.240901842706431, 0.30743590191449, 0.310605928993035, 0.378620529843491, 0.394843673266257, 0.463217214123843, 0.846006725553553, 1.91986719718639, 2.30025314520167, 2.31702860292334, 2.66225504155806, 2.89838614884136, 2.93533263484596, 3.92915929103845, 6.05054801269533, 6.38133071205875, 6.62764115953293, 8.28240123423701, 8.53690564463391, 12.5838414070157, 12.5601043160765, 12.3043865122123, 12.7666868655065, 13.228566067383, 12.7230281716064, 12.9903781159995, 12.727240095027, 12.2523157614464, 11.8051459071199, 11.7060028009859, 11.5037817968679, 12.2693077958414, 11.5842811936712, 11.6626896867753, 10.9424154292091, 10.3816792396216));cummax(argv[[1]]); [1] 1.412432e-05 1.239938e-03 1.494568e-03 5.594426e-03 5.894614e-03 [6] 6.828144e-03 7.160335e-03 8.313068e-03 1.172370e-02 1.935644e-02 [11] 3.057472e-02 7.908373e-02 1.585166e-01 1.663021e-01 2.409018e-01 [16] 3.074359e-01 3.106059e-01 3.786205e-01 3.948437e-01 4.632172e-01 [21] 8.460067e-01 1.919867e+00 2.300253e+00 2.317029e+00 2.662255e+00 [26] 2.898386e+00 2.935333e+00 3.929159e+00 6.050548e+00 6.381331e+00 [31] 6.627641e+00 8.282401e+00 8.536906e+00 1.258384e+01 1.258384e+01 [36] 1.258384e+01 1.276669e+01 1.322857e+01 1.322857e+01 1.322857e+01 [41] 1.322857e+01 1.322857e+01 1.322857e+01 1.322857e+01 1.322857e+01 [46] 1.322857e+01 1.322857e+01 1.322857e+01 1.322857e+01 1.322857e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testcummax3# #argv <- list(list());cummax(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testcummax4# #argv <- list(FALSE);cummax(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testcummax5# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')));cummax(argv[[1]]); c0 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testcummax6# #argv <- list(NULL);cummax(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testcummax7# #argv <- list(character(0));cummax(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummax.testcummax8# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));cummax(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #a <- structure(1:3, names=c('a1','a2','a3')); b<-cummin(a); names(b)[1]<-'x'; a; a1 a2 a3 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #values <- c(1,2,NA,1, NaN); cummin(values); cummin(as.integer(values)) [1] 1 1 NA NA NA [1] 1 1 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #values <- c(1,2,NaN,1, NA); cummin(values); cummin(as.integer(values)) [1] 1 1 NaN NaN NaN [1] 1 1 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #{ cummin(1:10) } [1] 1 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #{ cummin(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #{ cummin(as.logical(-2:2)) } [1] 1 1 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #{ cummin(c(1+1i, NA, 2+3i)) } Error in cummin(c(1 + (0+1i), NA, 2 + (0+3i))) : 'cummin' not defined for complex numbers ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #{ cummin(c(1+1i,2-3i,4+5i)) } Error in cummin(c(1 + (0+1i), 2 - (0+3i), 4 + (0+5i))) : 'cummin' not defined for complex numbers ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #{ cummin(c(1,2,3)) } [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #{ cummin(c(2000000000L, NA, 2000000000L)) } [1] 2000000000 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #{ cummin(c(TRUE,FALSE,NA,TRUE)) } [1] 1 0 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testCumulativeMin# #{ cummin(c(TRUE,FALSE,TRUE)) } [1] 1 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testcummin1# #argv <- list(c(3L, 2L, 1L, 2L, 1L, 0L, 4L, 3L, 2L));cummin(argv[[1]]); [1] 3 2 1 1 1 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testcummin2# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')));cummin(argv[[1]]); c0 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testcummin3# #argv <- list(c(0.943789021783783, 0.931269398230562, 0.936135627032134, 0.76691878645786, 0.751187345517812, 0.732102071759373, 0.736981399184748, 0.745009176294265, 0.742307320914255, 0.711777799810146, 0.726511637567943, 0.690091181919273, 0.656233947317988, 0.662510996891949, 0.657978635660952, 0.44347561790306, 0.428400063839846, 0.342071801782345, 0.329359004493355, 0.312959379967, 0.204112170963036, 0.153481444959266, 0.152881906752072, 0.141986935549763, 0.125244789347208, 0.126329692184989, 0.107405157884553, 0.0483432414602031, 0.0271151539974933, 0.0237499953844365, 0.0234803429360305, 0.0199319312722803, 0.0204957267942993, 0.0167583890578386, 0.0121314575180917, 0.0121935863008149, 0.00645581491628309, 0.00266833883057866, 0.00182178254845008, 0.00120243057473427, 0.000941101987534066, 0.000909248927476008, 0.000993184583142412, 0.00101050520477321, 0.00117777399883288, 0.000412294699846418, 0.000504381657773829, 1.12994568383008e-05));cummin(argv[[1]]); [1] 9.437890e-01 9.312694e-01 9.312694e-01 7.669188e-01 7.511873e-01 [6] 7.321021e-01 7.321021e-01 7.321021e-01 7.321021e-01 7.117778e-01 [11] 7.117778e-01 6.900912e-01 6.562339e-01 6.562339e-01 6.562339e-01 [16] 4.434756e-01 4.284001e-01 3.420718e-01 3.293590e-01 3.129594e-01 [21] 2.041122e-01 1.534814e-01 1.528819e-01 1.419869e-01 1.252448e-01 [26] 1.252448e-01 1.074052e-01 4.834324e-02 2.711515e-02 2.375000e-02 [31] 2.348034e-02 1.993193e-02 1.993193e-02 1.675839e-02 1.213146e-02 [36] 1.213146e-02 6.455815e-03 2.668339e-03 1.821783e-03 1.202431e-03 [41] 9.411020e-04 9.092489e-04 9.092489e-04 9.092489e-04 9.092489e-04 [46] 4.122947e-04 4.122947e-04 1.129946e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testcummin4# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));cummin(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testcummin5# #argv <- list(logical(0));cummin(argv[[1]]); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testcummin6# #argv <- list(character(0));cummin(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testcummin7# #argv <- list(NULL);cummin(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cummin.testcummin8# #argv <- list(FALSE);cummin(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testCumProd# #a <- structure(c(1,2,3), names=c('a1','a2','a3')); b<-cumprod(a); names(b)[1]<-'x'; a; a1 a2 a3 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testCumProd# #values <- c(1,2,NA,1, NaN); cumprod(values); cumprod(as.integer(values)) [1] 1 2 NA NA NA [1] 1 2 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testCumProd# #values <- c(1,2,NaN,1, NA); cumprod(values); cumprod(as.integer(values)) [1] 1 2 NaN NaN NaN [1] 1 2 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testcumprod1# #argv <- list(structure(c(1, 60, 60, 24, 7), .Names = c('secs', 'mins', 'hours', 'days', 'weeks')));cumprod(argv[[1]]); secs mins hours days weeks 1 60 3600 86400 604800 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testcumprod10# #argv <- list(c(0.982149602642989, 0.91866776738084, 0.859369083800704, 0.921182928974104));cumprod(argv[[1]]); [1] 0.9821496 0.9022692 0.7753822 0.7142689 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testcumprod2# #argv <- list(c(0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i, 0.2853725+0.3927816i));cumprod(argv[[1]]); [1] 2.853725e-01+3.927816e-01i -7.283992e-02+2.241781e-01i [3] -1.088396e-01+3.536409e-02i -4.495018e-02-3.265824e-02i [5] 8.229928e-09-2.697537e-02i 1.059543e-02-7.698025e-03i [7] 6.047287e-03+1.964885e-03i 9.539585e-04+2.935987e-03i [9] -8.809682e-04+1.212547e-03i -7.276704e-04-4.440107e-10i [11] -2.076569e-04-2.858157e-04i 5.300355e-05-1.631278e-04i [13] 7.919934e-05-2.573336e-05i 3.270890e-05+2.376445e-05i [15] -1.796603e-11+1.962918e-05i -7.709984e-06+5.601620e-06i [17] -4.400431e-06-1.429792e-06i -6.941661e-07-2.136431e-06i [19] 6.410551e-07-8.823344e-07i 5.295042e-07+6.461868e-13i ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testcumprod3# #argv <- list(c(1, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49));cumprod(argv[[1]]); [1] 1.000000e+00 1.000000e+00 2.000000e+00 6.000000e+00 2.400000e+01 [6] 1.200000e+02 7.200000e+02 5.040000e+03 4.032000e+04 3.628800e+05 [11] 3.628800e+06 3.991680e+07 4.790016e+08 6.227021e+09 8.717829e+10 [16] 1.307674e+12 2.092279e+13 3.556874e+14 6.402374e+15 1.216451e+17 [21] 2.432902e+18 5.109094e+19 1.124001e+21 2.585202e+22 6.204484e+23 [26] 1.551121e+25 4.032915e+26 1.088887e+28 3.048883e+29 8.841762e+30 [31] 2.652529e+32 8.222839e+33 2.631308e+35 8.683318e+36 2.952328e+38 [36] 1.033315e+40 3.719933e+41 1.376375e+43 5.230226e+44 2.039788e+46 [41] 8.159153e+47 3.345253e+49 1.405006e+51 6.041526e+52 2.658272e+54 [46] 1.196222e+56 5.502622e+57 2.586232e+59 1.241392e+61 6.082819e+62 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testcumprod4# #argv <- list(structure(0L, .Names = 'l0'));cumprod(argv[[1]]); l0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testcumprod5# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')));cumprod(argv[[1]]); c0 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testcumprod6# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));cumprod(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testcumprod7# #argv <- list(structure(list(), .Names = character(0)));cumprod(argv[[1]]); named numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testcumprod8# #argv <- list(NULL);cumprod(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumprod.testcumprod9# #argv <- list(character(0));cumprod(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #a <- structure(c(1,2,3), names=c('a1','a2','a3')); b<-cumsum(a); names(b)[1]<-'x'; a; a1 a2 a3 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #values <- c(1,2,NA,1, NaN); cumsum(values); cumsum(as.integer(values)) [1] 1 3 NA NA NA [1] 1 3 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #values <- c(1,2,NaN,1, NA); cumsum(values); cumsum(as.integer(values)) [1] 1 3 NaN NaN NaN [1] 1 3 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum((1:6)*(1+1i)) } [1] 1+ 1i 3+ 3i 6+ 6i 10+10i 15+15i 21+21i ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(1:10) } [1] 1 3 6 10 15 21 28 36 45 55 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(as.logical(-2:2)) } [1] 1 2 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(as.raw(1:6)) } [1] 1 3 6 10 15 21 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(-2147483647L, -1L)) } [1] -2147483647 NA Warning message: integer overflow in 'cumsum'; use 'cumsum(as.numeric(.))' ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(1+1i, NA, 2+3i)) } [1] 1+1i NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(1+1i,2-3i,4+5i)) } [1] 1+1i 3-2i 7+3i ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(1,0/0,5+1i)) } [1] 1+0i NaN+0i NaN+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(1,2,3)) } [1] 1 3 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(1,2,3,0/0,5)) } [1] 1 3 6 NaN NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(1e308, 1e308, NA, 1, 2)) } [1] 1e+308 Inf NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(2000000000L, 2000000000L)) } [1] 2000000000 NA Warning message: integer overflow in 'cumsum'; use 'cumsum(as.numeric(.))' ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(2000000000L, NA, 2000000000L)) } [1] 2000000000 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(TRUE,FALSE,NA,TRUE)) } [1] 1 1 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(c(TRUE,FALSE,TRUE)) } [1] 1 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testCumulativeSum# #{ cumsum(rep(1e308, 3) ) } [1] 1e+308 Inf Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum1# #argv <- list(c(9L, 5L, 13L));cumsum(argv[[1]]); [1] 9 14 27 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum10# #argv <- list(structure(c(-0.233567190135781, 1.27766471142225), .Names = c('Low|Medium', 'Medium|High')));cumsum(argv[[1]]); Low|Medium Medium|High -0.2335672 1.0440975 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum11# #argv <- list(c(8L, 2L, 12L, 6L, 4L, 5L, 13L));cumsum(argv[[1]]); [1] 8 10 22 28 32 37 50 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum12# #argv <- list(c(0.535137960496205, -0.371944875163495, -1.02554224849711, -0.582401674605252, 0.342888392897331, -0.450934647056651, 0.51423012023069, -0.334338052169782, -0.105559908794475, -0.730509672807828, 1.9050435849087, 0.332621731470394, 0.230633640499451, -1.69186241488407, 0.659791899549327, -1.02362358887971, -0.891521574354298, 0.918341171021649, -0.45270064650823, -1.74837228000318, 1.76990410988936, -2.37740692539252, 0.572811529859585, 1.01724924908461, -0.630967866660535, 0.444287051411554, 0.439130388388555, 1.04062315291451, 0.484099387952522, -0.244883779092525, 0.915992057940211, 0.800622356509766, -0.936569034135793, -1.40078743399573, 0.160277539993178, -0.273962374775183, -0.985539112562296, 0.0839306795150329, -1.31999652648691, 0.161226351326199, -0.62492838754192, 0.957164274192481, 2.42448914116153, -0.915979243686792, 1.05766417094298, 0.825149727768283, -0.0701942243053587, -0.453646374057015, 1.57530770683748, -2.00545781823625, -0.643194791593663, -1.43684344365778, 1.39531343894608, -0.190703432644857, -0.524671199469671, 3.18404447406633, -0.0500372678876282, -0.443749311866524, 0.299865250136145, -1.56842462075497, 0.490302642672068, -0.0961632010799668, 0.468525122530146, -0.982370635937854, -1.02298384214794, -0.693414663276185, -0.767989573092782, 1.29904996668359, 1.57914556180809, -0.156891953039067, -0.35893656058468, -0.329038830421669, 0.0692364778530165, 0.0969042337010548, 0.290034387765571, -0.746678941046256, -0.846896388820319, 1.19707766374608, -0.548627361103323, 0.303045695225451, -0.056970533803332, -0.957849392150669, 0.591061909411507, 0.173104873492955, 1.39978335621251, 0.117459584626988, -0.331545758200853, 0.278294913305364, -1.18559164903534, -0.835894053393597, 0.510273251139431, -0.333120901223949, -0.0659609463524635, -0.11522170942195, -0.650512618774529, -2.01868865908242, 0.348834970176592, 0.761639507646859, -1.28871623535013, 1.48240271845861));cumsum(argv[[1]]); [1] 0.53513796 0.16319309 -0.86234916 -1.44475084 -1.10186244 -1.55279709 [7] -1.03856697 -1.37290502 -1.47846493 -2.20897461 -0.30393102 0.02869071 [13] 0.25932435 -1.43253806 -0.77274616 -1.79636975 -2.68789133 -1.76955016 [19] -2.22225080 -3.97062308 -2.20071897 -4.57812590 -4.00531437 -2.98806512 [25] -3.61903299 -3.17474593 -2.73561555 -1.69499239 -1.21089301 -1.45577678 [31] -0.53978473 0.26083763 -0.67573140 -2.07651884 -1.91624130 -2.19020367 [37] -3.17574279 -3.09181211 -4.41180863 -4.25058228 -4.87551067 -3.91834639 [43] -1.49385725 -2.40983650 -1.35217233 -0.52702260 -0.59721682 -1.05086320 [49] 0.52444451 -1.48101331 -2.12420810 -3.56105154 -2.16573810 -2.35644154 [55] -2.88111274 0.30293174 0.25289447 -0.19085484 0.10901041 -1.45941421 [61] -0.96911157 -1.06527477 -0.59674965 -1.57912028 -2.60210413 -3.29551879 [67] -4.06350836 -2.76445840 -1.18531283 -1.34220479 -1.70114135 -2.03018018 [73] -1.96094370 -1.86403947 -1.57400508 -2.32068402 -3.16758041 -1.97050275 [79] -2.51913011 -2.21608441 -2.27305494 -3.23090434 -2.63984243 -2.46673755 [85] -1.06695420 -0.94949461 -1.28104037 -1.00274546 -2.18833711 -3.02423116 [91] -2.51395791 -2.84707881 -2.91303976 -3.02826147 -3.67877409 -5.69746274 [97] -5.34862777 -4.58698827 -5.87570450 -4.39330178 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum13# #argv <- list(c(23L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, -7L, -7L, -7L, -7L, -7L, -7L, -7L, -7L, -7L, -7L, -7L, -7L, -7L, -7L, -7L, 15L, 15L, 15L, 15L, 15L, -4L, -4L, -4L, -4L, -4L, -4L, -4L, -4L, -4L, -4L, -4L, -4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, -9L, -9L, -9L, -9L, -9L, -9L, -9L, -9L, -9L, -9L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, -3L, -3L, -3L, -3L, -3L, -3L, -3L, -3L, -3L, -3L, -3L, -3L, -3L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, -2L, -2L, -2L, -2L, -2L, -2L, -2L, -2L, -2L, -2L, -2L, -6L, -6L, -6L, -6L, -6L, -6L, -6L, -6L, -6L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, NA, NA, 3L, 3L, 3L, -19L, -19L, -19L, -19L, -19L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L));cumsum(argv[[1]]); [1] 23 34 45 56 67 78 89 100 111 122 133 143 153 163 173 183 193 203 [19] 213 223 224 225 226 227 228 229 230 231 232 233 234 227 220 213 206 199 [37] 192 185 178 171 164 157 150 143 136 129 144 159 174 189 204 200 196 192 [55] 188 184 180 176 172 168 164 160 156 160 164 168 172 176 180 184 188 192 [73] 196 187 178 169 160 151 142 133 124 115 106 113 120 127 134 141 148 155 [91] 162 169 176 183 190 197 204 201 198 195 192 189 186 183 180 177 174 171 [109] 168 165 167 169 171 173 175 177 179 181 183 185 187 189 191 193 195 197 [127] 199 201 199 197 195 193 191 189 187 185 183 181 179 173 167 161 155 149 [145] 143 137 131 125 124 123 122 121 120 119 118 117 117 117 117 117 117 117 [163] 117 117 117 117 117 117 117 117 120 123 126 129 132 135 138 141 144 NA [181] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [199] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [217] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [235] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum14# #argv <- list(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE));cumsum(argv[[1]]); [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 1 2 2 2 2 2 2 2 2 2 3 4 [39] 4 4 4 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum15# #argv <- list(character(0));cumsum(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum2# #argv <- list(structure(c(15L, 14L), .Names = c('bibentry', NA)));cumsum(argv[[1]]); bibentry 15 29 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum3# #argv <- list(structure(c(79.3831968838961, 8.55983483385341e+101), .Names = c('', '')));cumsum(argv[[1]]); 7.938320e+01 8.559835e+101 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum4# #argv <- list(structure(c(-191.999930599838, 7.71626352011359e-309), .Names = c('', '')));cumsum(argv[[1]]); -191.9999 -191.9999 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum5# #argv <- list(NULL);cumsum(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum6# #argv <- list(structure(c(5L, 8L, 4L, 19L, 26L, 18L, 41L, 42L, 51L, 90L, 97L, 95L, 122L, 134L, 195L, 215L, 225L, 237L, 274L, 291L, 305L, 333L, 353L, 330L, 363L, 376L, 365L, 393L, 409L, 407L, 376L, 371L, 366L, 337L, 307L, 333L, 290L, 244L, 224L, 218L, 209L, 144L, 147L, 112L, 91L, 79L, 69L, 58L, 54L, 38L, 27L, 17L, 30L, 10L, 7L, 19L), .Dim = 56L, .Dimnames = structure(list(c('0', '1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55')), .Names = ''), class = 'table'));cumsum(argv[[1]]); 0 1 2 3 4 5 6 7 8 9 10 11 12 5 13 17 36 62 80 121 163 214 304 401 496 618 13 14 15 16 17 18 19 20 21 22 23 24 25 752 947 1162 1387 1624 1898 2189 2494 2827 3180 3510 3873 4249 26 27 28 29 30 31 32 33 34 35 36 37 38 4614 5007 5416 5823 6199 6570 6936 7273 7580 7913 8203 8447 8671 39 40 41 42 43 44 45 46 47 48 49 50 51 8889 9098 9242 9389 9501 9592 9671 9740 9798 9852 9890 9917 9934 52 53 54 55 9964 9974 9981 10000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum7# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')));cumsum(argv[[1]]); c0 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum8# #argv <- list(c(6, 6, 5));cumsum(argv[[1]]); [1] 6 12 17 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cumsum.testcumsum9# #argv <- list(structure(c(7, 7, 7, 7), .Dim = 4L, .Dimnames = list(c('Urban Female', 'Urban Male', 'Rural Female', 'Rural Male'))));cumsum(argv[[1]]); Urban Female Urban Male Rural Female Rural Male 7 14 21 28 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cut.testcut1# #argv <- structure(list(x = c(1.0346112150611, 0.0440203704340609, -1.18549563351614, 0.649014015685885, -0.790829522519262, 1.17598399721214, 0.983434156282803, 0.541081558957578, -0.192970091592294, -0.606426057996866, -0.548929268331095, 0.063509821468168, -0.0758711318520365, -0.587354948512591, 0.68016119925159, -0.00101371953355839, -2.04690635406766, -1.15419169868302, 1.57552198814761, -1.2826021432906, -0.0106456026122299, -1.45914938013444, -0.0877132204592902, 0.644476581366902, -0.174036946316013, 0.70686472456958, -0.800624461731312, 0.708086372571733, -0.297996173821721, 0.0138099804238364, 0.380733372967531, 0.128771481990839, 0.323047326927391, -0.311589835954256, 0.12558341704142, -0.298476619409494, -0.102902974277467, -1.68917669167977, -1.42657554846613, -0.833840095454306, 0.0781210754813429, 0.0966440325613869, 0.471427686648137, -0.755241646713195, -1.09526706499915, 0.226011761333169, -2.00335228166377, 0.871788133884678, -0.17604759041044, -0.392043928011201, 1.52493115014745, 0.696042602954131, 0.929759768084036, -0.937385053991658, -0.505487042445614, 0.658795125401, -0.530682170997639, 1.35048133622788, 1.1503422698982, -1.03530396801882, 0.222351695228838, -0.439226819350318, 0.829770867923565, -0.843987984792906, 0.634088156420345, 0.940832655747169, -0.0115852787804222, -0.410726945127659, -0.0645734442095184, -0.285424906860716, -0.132298134315469, 2.015980478747, -0.49752866007857, 0.461543245850607, 0.372715664260582, 0.911907622481186, 1.75893179717408, -0.111357338665413, 0.390438066934087, -0.15682295730562, 0.249796941030751, -0.986665869092954, 0.342284950759752, 0.814635047060746, -0.0433704725852363, 0.0953296428157898, -0.710060187690398, 0.0162693336595326, 0.406214045314364, -0.85345069761213, 0.294458010294818, -0.381515531303645, -0.341521027080523, 0.221675587474675, -1.33867071234436, 0.807929975242687, -0.126382937192597, -0.0352338330882248, -1.4928897757059, -0.235586522320615), breaks = structure(c(-2.04690635406766, -0.511785824583621, -0.0234095559343235, 0.488841154725497, 2.015980478747), .Names = c('0%', '25%', '50%', '75%', '100%')), labels = FALSE), .Names = c('x', 'breaks', 'labels'));do.call('cut', argv) [1] 4 3 1 4 1 4 4 4 2 1 1 3 2 1 4 3 NA 1 4 1 3 1 2 4 2 [26] 4 1 4 2 3 3 3 3 2 3 2 2 1 1 1 3 3 3 1 1 3 1 4 2 2 [51] 4 4 4 1 2 4 1 4 4 1 3 2 4 1 4 4 3 2 2 2 2 4 2 3 3 [76] 4 4 2 3 2 3 1 3 4 2 3 1 3 3 1 3 2 2 3 1 4 2 2 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_cut.testcut2# #argv <- structure(list(x = structure(c(50, 47, 37, 71, 62, 53, 49, 56, 50, 47, 30, 20, 44, 33, 34, 39, 54, 40, 35, 33, 31, 47, 37, 27, 66, 44, 73, 26, 40, 61, 27, 77, 50, 31, 23, 72, 90, 46, 56, 43, 62, 59, 69, 30, 55, 39, 55, 59, 54, 47, 32, 72, 22, 43, 62, 52, 59, 26, 59, 22, 77, 60, 41, 77, 42, 81, 40, 70, 47, 77, 23, 39, 33, 56, 45, 42, 28, 53, 39, 51, 26, 18, 55, 64, 42, 71, 43, 68, 72, 74, 55, 53, 67, 47, 28, 32, 38, 42, 38, 64, 44, 18, 61, 67, 75, 70, 27, 42, 45, 62, 47, 27, 28, 58, 34, 42, 24, 43, 43, 72, 22, 73, 61, 55, 43, 25, 21, 19, 45, 62, 52, 51, 20, 24, 88, 32, 66, 73, 21, 63, 77, 77, 26, 52, 67, 68, 47, 46, 64, 51, 46, 23, 39, 22, 28, 74, 68, 23, 29, 80, 43, 58, 55, 78, 58, 45, 49, 29, 58, 27, 40, 34, 23, 62, 18, 19, 66, 81, 25, 53, 28, 36, 47, 44, 37, 63, 37, 71, 47, 38, 56, 44, 64, 59, 55, 35, 31, 47, 21, 76, 62, 86, 43, 56, 20, 34, 23, 45, 58, 19, 53, 24, 30, 50, 63, 47, 73, 41, 62, 82, 21, 38, 50, 66, 59, 63, 25, 38, 28, 67, 60, 62, 48, 44, 59, 39, 82, 61, 54, 51, 35, 54, 58, 27, 58, 40, 22, 19, 68, 65, 76, 69, 25, 65, 56, 39, 82, 77, 23, 51, 40, 78, 48, 46, 73, 51, 50, 37, 56, 46, 20, 30, 25, 65, 31, 70, 52, 22, 38, 53, 48, 29, 52, 60, 80, 57, 63, 61, 36, 23, 78, 28, 26, 35, 66, 50, 34, 60, 50, 45, 54, 42, 25, 31, 30, 41, 55, 62, 74, 47, 41, 48, 71, 38, 39, 61, 73, 41, 41, 41, 24, 28, 49, 58, 27, 57, 52, 54, 35, 53, 45, 19, 37, 38, 78, 57, 55, 32, 24, 47, 46, 22, 51, 39, 46, 38, 20, 53, 82, 33, 62, 72, 44, 76, 31, 24, 78, 70, 28, 70, 69, 56, 32, 35, 53, 79, 83, 63, 28, 44, 38, 24, 41, 46, 39, 62, 63, 33, 54, 27, 27, 75, 42, 88, 52, 46, 25, 49, 58, 28, 27, 50, 74, 59, 49, 41, 33, 51, 50, 72, 65, 55, 51, 88, 52, 48, 25, 62, 34, 25, 77, 65, 48, 33, 58, 46, 34, 55, 75, 24, 73, 65, 50, 63, 24, 52, 72, 31, 53, 51, 26, 42, 29, 25, 58, 34, 46, 64, 28, 57, 45, 33, 39, 68, 76, 41, 23, 45, 28, 66, 57, 64, 48, 38, 43, 68, 62, 32, 56, 55, 58, 24, 26, 81, 33, 73, 36, 65, 69, 19, 67, 40, 46, 35, 23, 79, 32, 58, 59, 53, 43, 31, 32, 28, 23, 35, 75, 22, 63, 25, 39, 24, 24, 67, 52, 56, 34, 54, 29, 56, 37, 46, 24, 35, 65, 20, 24, 35, 82, 29, 53, 45, 40, 51, 46, 60, 65, 75, 22, 49, 29, 29, 43, 43, 45, 76, 39, 58, 49, 51, 40, 41, 44, 43, 62, 48, 65, 23, 48, 52, 63, 69, 49, 58, 19, 79, 28, 25, 43, 76, 44, 29, 65, 20, 41, 35, 37, 38, 28, 56, 38, 57, 57, 52, 72, 70, 58, 67, 77, 42, 46, 31, 55, 28, 41, 18, 49, 56, 51, 21, 56, 47, 61, 83, 36, 63, 66, 56, 19, 34, 30, 55, 70, 48, 62, 67, 44, 48, 26, 20, 35, 63, 38, 83, 56, 56, 57, 40, 64, 57, 31, 34, 38, 27, 64, 56, 48, 57, 25, 62, 35, 63, 50, 33, 52, 84, 38, 82, 44, 22, 70, 57, 47, 56, 74, 53, 57, 27, 21, 45, 68, 22, 61, 18, 30, 64, 31, 23, 74, 54, 21, 69, 38, 33, 27, 48, 58, 62, 64, 41, 41, 23, 48, 31, 46, 84, 21, 45, 21, 78, 41, 33, 21, 37, 44, 47, 23, 36, 39, 61, 25, 27, 27, 57, 26, 46, 40, 31, 42, 42, 71, 60, 19, 49, 40, 52, 58, 61, 25, 60, 77, 63, 26, 27, 45, 56, 36, 19, 26, 61, 56, 19, 38, 48, 45, 36, 83, 65, 35, 63, 63, 29, 81, 26, 19, 25, 26, 78, 47, 57, 23, 28, 20, 19, 50, 49, 25, 44, 60, 55, 51, 41, 46, 57, 43, 49, 62, 25, 37, 31, 41, 50, 39, 60, 45, 30, 49, 58, 23, 30, 46, 36, 76, 41, 77, 45, 70, 45, 47, 39, 29, 36, 66, 31, 54, 24, 22, 31, 35, 62, 37, 33, 37, 87, 28, 42, 27, 60, 65, 32, 42, 36, 65, 39, 57, 51, 68, 33, 33, 23, 61, 50, 55, 53, 22, 67, 74, 36, 26, 42, 66, 48, 46, 55, 49, 48, 58, 39, 61, 82, 59, 29, 46, 81, 57, 85, 64, 59, 19, 42, 76, 38, 29, 27, 48, 53, 35, 60, 53, 52, 77, 52, 57, 64, 56, 44, 77, 52, 84, 58, 74, 52, 51, 74, 28, 43, 64, 64, 34, 63, 55, 54, 18, 46, 29, 88, 29, 22, 53, 35, 86, 48, 29, 41, 46, 79, 69, 34, 43, 50, 45, 31, 39, 56, 32, 80, 46, 49, 20, 57, 44, 76, 24, 32, 45, 62, 65, 61, 61, 39, 63, 54, 64, 75, 53, 60, 63, 36, 47, 46, 35, 52, 43, 52, 77, 40, 63, 29, 61, 65, 55, 28, 19, 75, 34, 51, 69, 41, 40, 74, 62, 86, 19, 63, 29, 52, 68, 50, 64, 43, 27, 66, 23, 40, 41, 39, 28, 48, 37, 29, 58, 65, 51, 27, 67, 83, 35, 73, 38, 66, 18, 47, 71, 49, 68, 71, 18, 59, 19, 37, 22, 71, 20, 40, 30, 44, 28, 29, 52, 20, 40, 23, 64, 38, 57, 52, 44, 35, 37, 32, 37, 38, 69, 19, 30, 77, 58, 31, 80, 29, 79, 57, 42, 20, 33, 28, 49, 65, 48, 90, 57, 43, 51, 32, 60, 73, 50, 23, 57, 38, 24, 65, 51, 28, 33, 56, 26, 61, 51, 45, 64, 41, 33, 34, 39, 31, 22, 55, 59, 54, 66, 40, 72, 45, 79, 46, 21, 82, 67, 52, 24, 57, 30, 57, 63, 50, 33, 56, 53, 67, 54, 67, 43, 51, 22, 53, 45, 21, 47, 63, 44, 51, 25, 57, 56, 21, 28, 23, 54, 20, 63, 65, 53, 54, 82, 66, 54, 68, 55, 31, 31, 36, 61, 25, 31, 36, 77, 39, 49, 55, 30, 51, 34, 44, 36, 35, 24, 23, 45, 30, 35, 20, 25, 66, 36, 41, 69, 19, 75, 50, 29, 49, 33, 20, 19, 52, 54, 53, 67, 51, 48, 82, 34, 45, 36, 41, 34, 32, 48, 49, 86, 63, 61, 40, 50, 63, 49, 25, 44, 25, 64, 64, 78, 58, 23, 61, 41, 76, 44, 54, 70, 39, 44, 64, 19, 56, 28, 39, 26, 33, 29, 34, 49, 46, 30, 59, 48, 21, 33, 44, 21, 49, 31, 20, 84, 55, 24, 50, 26, 63, 50, 44, 65, 28, 24, 22, 55, 42, 26, 44, 22, 35, 71, 66, 23, 42, 50, 24, 56, 66, 47, 50), value.labels = structure(c(99, 98, 0), .Names = c('89. RF', '88. DK', '00. NA'))), c(0, 25, 35, 45, 55, 65, 99)), .Names = c('x', ''));do.call('cut', argv) [1] (45,55] (45,55] (35,45] (65,99] (55,65] (45,55] (45,55] (55,65] (45,55] [10] (45,55] (25,35] (0,25] (35,45] (25,35] (25,35] (35,45] (45,55] (35,45] [19] (25,35] (25,35] (25,35] (45,55] (35,45] (25,35] (65,99] (35,45] (65,99] [28] (25,35] (35,45] (55,65] (25,35] (65,99] (45,55] (25,35] (0,25] (65,99] [37] (65,99] (45,55] (55,65] (35,45] (55,65] (55,65] (65,99] (25,35] (45,55] [46] (35,45] (45,55] (55,65] (45,55] (45,55] (25,35] (65,99] (0,25] (35,45] [55] (55,65] (45,55] (55,65] (25,35] (55,65] (0,25] (65,99] (55,65] (35,45] [64] (65,99] (35,45] (65,99] (35,45] (65,99] (45,55] (65,99] (0,25] (35,45] [73] (25,35] (55,65] (35,45] (35,45] (25,35] (45,55] (35,45] (45,55] (25,35] [82] (0,25] (45,55] (55,65] (35,45] (65,99] (35,45] (65,99] (65,99] (65,99] [91] (45,55] (45,55] (65,99] (45,55] (25,35] (25,35] (35,45] (35,45] (35,45] [100] (55,65] (35,45] (0,25] (55,65] (65,99] (65,99] (65,99] (25,35] (35,45] [109] (35,45] (55,65] (45,55] (25,35] (25,35] (55,65] (25,35] (35,45] (0,25] [118] (35,45] (35,45] (65,99] (0,25] (65,99] (55,65] (45,55] (35,45] (0,25] [127] (0,25] (0,25] (35,45] (55,65] (45,55] (45,55] (0,25] (0,25] (65,99] [136] (25,35] (65,99] (65,99] (0,25] (55,65] (65,99] (65,99] (25,35] (45,55] [145] (65,99] (65,99] (45,55] (45,55] (55,65] (45,55] (45,55] (0,25] (35,45] [154] (0,25] (25,35] (65,99] (65,99] (0,25] (25,35] (65,99] (35,45] (55,65] [163] (45,55] (65,99] (55,65] (35,45] (45,55] (25,35] (55,65] (25,35] (35,45] [172] (25,35] (0,25] (55,65] (0,25] (0,25] (65,99] (65,99] (0,25] (45,55] [181] (25,35] (35,45] (45,55] (35,45] (35,45] (55,65] (35,45] (65,99] (45,55] [190] (35,45] (55,65] (35,45] (55,65] (55,65] (45,55] (25,35] (25,35] (45,55] [199] (0,25] (65,99] (55,65] (65,99] (35,45] (55,65] (0,25] (25,35] (0,25] [208] (35,45] (55,65] (0,25] (45,55] (0,25] (25,35] (45,55] (55,65] (45,55] [217] (65,99] (35,45] (55,65] (65,99] (0,25] (35,45] (45,55] (65,99] (55,65] [226] (55,65] (0,25] (35,45] (25,35] (65,99] (55,65] (55,65] (45,55] (35,45] [235] (55,65] (35,45] (65,99] (55,65] (45,55] (45,55] (25,35] (45,55] (55,65] [244] (25,35] (55,65] (35,45] (0,25] (0,25] (65,99] (55,65] (65,99] (65,99] [253] (0,25] (55,65] (55,65] (35,45] (65,99] (65,99] (0,25] (45,55] (35,45] [262] (65,99] (45,55] (45,55] (65,99] (45,55] (45,55] (35,45] (55,65] (45,55] [271] (0,25] (25,35] (0,25] (55,65] (25,35] (65,99] (45,55] (0,25] (35,45] [280] (45,55] (45,55] (25,35] (45,55] (55,65] (65,99] (55,65] (55,65] (55,65] [289] (35,45] (0,25] (65,99] (25,35] (25,35] (25,35] (65,99] (45,55] (25,35] [298] (55,65] (45,55] (35,45] (45,55] (35,45] (0,25] (25,35] (25,35] (35,45] [307] (45,55] (55,65] (65,99] (45,55] (35,45] (45,55] (65,99] (35,45] (35,45] [316] (55,65] (65,99] (35,45] (35,45] (35,45] (0,25] (25,35] (45,55] (55,65] [325] (25,35] (55,65] (45,55] (45,55] (25,35] (45,55] (35,45] (0,25] (35,45] [334] (35,45] (65,99] (55,65] (45,55] (25,35] (0,25] (45,55] (45,55] (0,25] [343] (45,55] (35,45] (45,55] (35,45] (0,25] (45,55] (65,99] (25,35] (55,65] [352] (65,99] (35,45] (65,99] (25,35] (0,25] (65,99] (65,99] (25,35] (65,99] [361] (65,99] (55,65] (25,35] (25,35] (45,55] (65,99] (65,99] (55,65] (25,35] [370] (35,45] (35,45] (0,25] (35,45] (45,55] (35,45] (55,65] (55,65] (25,35] [379] (45,55] (25,35] (25,35] (65,99] (35,45] (65,99] (45,55] (45,55] (0,25] [388] (45,55] (55,65] (25,35] (25,35] (45,55] (65,99] (55,65] (45,55] (35,45] [397] (25,35] (45,55] (45,55] (65,99] (55,65] (45,55] (45,55] (65,99] (45,55] [406] (45,55] (0,25] (55,65] (25,35] (0,25] (65,99] (55,65] (45,55] (25,35] [415] (55,65] (45,55] (25,35] (45,55] (65,99] (0,25] (65,99] (55,65] (45,55] [424] (55,65] (0,25] (45,55] (65,99] (25,35] (45,55] (45,55] (25,35] (35,45] [433] (25,35] (0,25] (55,65] (25,35] (45,55] (55,65] (25,35] (55,65] (35,45] [442] (25,35] (35,45] (65,99] (65,99] (35,45] (0,25] (35,45] (25,35] (65,99] [451] (55,65] (55,65] (45,55] (35,45] (35,45] (65,99] (55,65] (25,35] (55,65] [460] (45,55] (55,65] (0,25] (25,35] (65,99] (25,35] (65,99] (35,45] (55,65] [469] (65,99] (0,25] (65,99] (35,45] (45,55] (25,35] (0,25] (65,99] (25,35] [478] (55,65] (55,65] (45,55] (35,45] (25,35] (25,35] (25,35] (0,25] (25,35] [487] (65,99] (0,25] (55,65] (0,25] (35,45] (0,25] (0,25] (65,99] (45,55] [496] (55,65] (25,35] (45,55] (25,35] (55,65] (35,45] (45,55] (0,25] (25,35] [505] (55,65] (0,25] (0,25] (25,35] (65,99] (25,35] (45,55] (35,45] (35,45] [514] (45,55] (45,55] (55,65] (55,65] (65,99] (0,25] (45,55] (25,35] (25,35] [523] (35,45] (35,45] (35,45] (65,99] (35,45] (55,65] (45,55] (45,55] (35,45] [532] (35,45] (35,45] (35,45] (55,65] (45,55] (55,65] (0,25] (45,55] (45,55] [541] (55,65] (65,99] (45,55] (55,65] (0,25] (65,99] (25,35] (0,25] (35,45] [550] (65,99] (35,45] (25,35] (55,65] (0,25] (35,45] (25,35] (35,45] (35,45] [559] (25,35] (55,65] (35,45] (55,65] (55,65] (45,55] (65,99] (65,99] (55,65] [568] (65,99] (65,99] (35,45] (45,55] (25,35] (45,55] (25,35] (35,45] (0,25] [577] (45,55] (55,65] (45,55] (0,25] (55,65] (45,55] (55,65] (65,99] (35,45] [586] (55,65] (65,99] (55,65] (0,25] (25,35] (25,35] (45,55] (65,99] (45,55] [595] (55,65] (65,99] (35,45] (45,55] (25,35] (0,25] (25,35] (55,65] (35,45] [604] (65,99] (55,65] (55,65] (55,65] (35,45] (55,65] (55,65] (25,35] (25,35] [613] (35,45] (25,35] (55,65] (55,65] (45,55] (55,65] (0,25] (55,65] (25,35] [622] (55,65] (45,55] (25,35] (45,55] (65,99] (35,45] (65,99] (35,45] (0,25] [631] (65,99] (55,65] (45,55] (55,65] (65,99] (45,55] (55,65] (25,35] (0,25] [640] (35,45] (65,99] (0,25] (55,65] (0,25] (25,35] (55,65] (25,35] (0,25] [649] (65,99] (45,55] (0,25] (65,99] (35,45] (25,35] (25,35] (45,55] (55,65] [658] (55,65] (55,65] (35,45] (35,45] (0,25] (45,55] (25,35] (45,55] (65,99] [667] (0,25] (35,45] (0,25] (65,99] (35,45] (25,35] (0,25] (35,45] (35,45] [676] (45,55] (0,25] (35,45] (35,45] (55,65] (0,25] (25,35] (25,35] (55,65] [685] (25,35] (45,55] (35,45] (25,35] (35,45] (35,45] (65,99] (55,65] (0,25] [694] (45,55] (35,45] (45,55] (55,65] (55,65] (0,25] (55,65] (65,99] (55,65] [703] (25,35] (25,35] (35,45] (55,65] (35,45] (0,25] (25,35] (55,65] (55,65] [712] (0,25] (35,45] (45,55] (35,45] (35,45] (65,99] (55,65] (25,35] (55,65] [721] (55,65] (25,35] (65,99] (25,35] (0,25] (0,25] (25,35] (65,99] (45,55] [730] (55,65] (0,25] (25,35] (0,25] (0,25] (45,55] (45,55] (0,25] (35,45] [739] (55,65] (45,55] (45,55] (35,45] (45,55] (55,65] (35,45] (45,55] (55,65] [748] (0,25] (35,45] (25,35] (35,45] (45,55] (35,45] (55,65] (35,45] (25,35] [757] (45,55] (55,65] (0,25] (25,35] (45,55] (35,45] (65,99] (35,45] (65,99] [766] (35,45] (65,99] (35,45] (45,55] (35,45] (25,35] (35,45] (65,99] (25,35] [775] (45,55] (0,25] (0,25] (25,35] (25,35] (55,65] (35,45] (25,35] (35,45] [784] (65,99] (25,35] (35,45] (25,35] (55,65] (55,65] (25,35] (35,45] (35,45] [793] (55,65] (35,45] (55,65] (45,55] (65,99] (25,35] (25,35] (0,25] (55,65] [802] (45,55] (45,55] (45,55] (0,25] (65,99] (65,99] (35,45] (25,35] (35,45] [811] (65,99] (45,55] (45,55] (45,55] (45,55] (45,55] (55,65] (35,45] (55,65] [820] (65,99] (55,65] (25,35] (45,55] (65,99] (55,65] (65,99] (55,65] (55,65] [829] (0,25] (35,45] (65,99] (35,45] (25,35] (25,35] (45,55] (45,55] (25,35] [838] (55,65] (45,55] (45,55] (65,99] (45,55] (55,65] (55,65] (55,65] (35,45] [847] (65,99] (45,55] (65,99] (55,65] (65,99] (45,55] (45,55] (65,99] (25,35] [856] (35,45] (55,65] (55,65] (25,35] (55,65] (45,55] (45,55] (0,25] (45,55] [865] (25,35] (65,99] (25,35] (0,25] (45,55] (25,35] (65,99] (45,55] (25,35] [874] (35,45] (45,55] (65,99] (65,99] (25,35] (35,45] (45,55] (35,45] (25,35] [883] (35,45] (55,65] (25,35] (65,99] (45,55] (45,55] (0,25] (55,65] (35,45] [892] (65,99] (0,25] (25,35] (35,45] (55,65] (55,65] (55,65] (55,65] (35,45] [901] (55,65] (45,55] (55,65] (65,99] (45,55] (55,65] (55,65] (35,45] (45,55] [910] (45,55] (25,35] (45,55] (35,45] (45,55] (65,99] (35,45] (55,65] (25,35] [919] (55,65] (55,65] (45,55] (25,35] (0,25] (65,99] (25,35] (45,55] (65,99] [928] (35,45] (35,45] (65,99] (55,65] (65,99] (0,25] (55,65] (25,35] (45,55] [937] (65,99] (45,55] (55,65] (35,45] (25,35] (65,99] (0,25] (35,45] (35,45] [946] (35,45] (25,35] (45,55] (35,45] (25,35] (55,65] (55,65] (45,55] (25,35] [955] (65,99] (65,99] (25,35] (65,99] (35,45] (65,99] (0,25] (45,55] (65,99] [964] (45,55] (65,99] (65,99] (0,25] (55,65] (0,25] (35,45] (0,25] (65,99] [973] (0,25] (35,45] (25,35] (35,45] (25,35] (25,35] (45,55] (0,25] (35,45] [982] (0,25] (55,65] (35,45] (55,65] (45,55] (35,45] (25,35] (35,45] (25,35] [991] (35,45] (35,45] (65,99] (0,25] (25,35] (65,99] (55,65] (25,35] (65,99] [1000] (25,35] (65,99] (55,65] (35,45] (0,25] (25,35] (25,35] (45,55] (55,65] [1009] (45,55] (65,99] (55,65] (35,45] (45,55] (25,35] (55,65] (65,99] (45,55] [1018] (0,25] (55,65] (35,45] (0,25] (55,65] (45,55] (25,35] (25,35] (55,65] [1027] (25,35] (55,65] (45,55] (35,45] (55,65] (35,45] (25,35] (25,35] (35,45] [1036] (25,35] (0,25] (45,55] (55,65] (45,55] (65,99] (35,45] (65,99] (35,45] [1045] (65,99] (45,55] (0,25] (65,99] (65,99] (45,55] (0,25] (55,65] (25,35] [1054] (55,65] (55,65] (45,55] (25,35] (55,65] (45,55] (65,99] (45,55] (65,99] [1063] (35,45] (45,55] (0,25] (45,55] (35,45] (0,25] (45,55] (55,65] (35,45] [1072] (45,55] (0,25] (55,65] (55,65] (0,25] (25,35] (0,25] (45,55] (0,25] [1081] (55,65] (55,65] (45,55] (45,55] (65,99] (65,99] (45,55] (65,99] (45,55] [1090] (25,35] (25,35] (35,45] (55,65] (0,25] (25,35] (35,45] (65,99] (35,45] [1099] (45,55] (45,55] (25,35] (45,55] (25,35] (35,45] (35,45] (25,35] (0,25] [1108] (0,25] (35,45] (25,35] (25,35] (0,25] (0,25] (65,99] (35,45] (35,45] [1117] (65,99] (0,25] (65,99] (45,55] (25,35] (45,55] (25,35] (0,25] (0,25] [1126] (45,55] (45,55] (45,55] (65,99] (45,55] (45,55] (65,99] (25,35] (35,45] [1135] (35,45] (35,45] (25,35] (25,35] (45,55] (45,55] (65,99] (55,65] (55,65] [1144] (35,45] (45,55] (55,65] (45,55] (0,25] (35,45] (0,25] (55,65] (55,65] [1153] (65,99] (55,65] (0,25] (55,65] (35,45] (65,99] (35,45] (45,55] (65,99] [1162] (35,45] (35,45] (55,65] (0,25] (55,65] (25,35] (35,45] (25,35] (25,35] [1171] (25,35] (25,35] (45,55] (45,55] (25,35] (55,65] (45,55] (0,25] (25,35] [1180] (35,45] (0,25] (45,55] (25,35] (0,25] (65,99] (45,55] (0,25] (45,55] [1189] (25,35] (55,65] (45,55] (35,45] (55,65] (25,35] (0,25] (0,25] (45,55] [1198] (35,45] (25,35] (35,45] (0,25] (25,35] (65,99] (65,99] (0,25] (35,45] [1207] (45,55] (0,25] (55,65] (65,99] (45,55] (45,55] Levels: (0,25] (25,35] (35,45] (45,55] (55,65] (65,99] ##com.oracle.truffle.r.test.builtins.TestBuiltin_dQuote.testdQuote1# #argv <- structure(list(x = character(0)), .Names = 'x');do.call('dQuote', argv) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dataclass.testdataclass1# #argv <- structure(list(x = c('A', 'B', 'C', NA)), .Names = 'x');do.call('data.class', argv) [1] "character" ##com.oracle.truffle.r.test.builtins.TestBuiltin_date.testDate# #attributes(date()) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_date.testDate# #is.character(date()) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_date.testDate# #length(date()) == 1L [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ delayedAssign("x", a+b); a <- 1 ; b <- 3 ; x } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ delayedAssign("x", y); delayedAssign("y", x) ; x } Error: promise already under evaluation: recursive default argument reference or earlier problems? ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ delayedAssign("x", y); y <- 10; x } [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ f <- function() print ("outer"); g <- function() { delayedAssign("f", 1); f() }; g()} [1] "outer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ f <- function() { delayedAssign("x", 3); delayedAssign("x", 2); x } ; f() } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ f <- function() { delayedAssign("x", y); delayedAssign("y", x) ; x } ; f() } Error in f() : promise already under evaluation: recursive default argument reference or earlier problems? ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ f <- function() { delayedAssign("x", y); y <- 10; x } ; f() } [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign#Output.IgnoreErrorContext# #{ f <- function() { delayedAssign("x",y); delayedAssign("y",x); g(x, y)}; g <- function(x, y) { x + y }; f() } Error in g(x, y) : promise already under evaluation: recursive default argument reference or earlier problems? ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ f <- function() { delayedAssign("x",y); delayedAssign("y",x); list(x, y)}; f() } Error in f() : promise already under evaluation: recursive default argument reference or earlier problems? ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign#Output.IgnoreErrorContext# #{ f <- function() { delayedAssign("x",y); delayedAssign("y",x); paste(x, y)}; f() } Error in paste(x, y) : promise already under evaluation: recursive default argument reference or earlier problems? ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ f <- function() { delayedAssign("x",y); delayedAssign("y",x); print(x, y)}; f() } Error in print(x, y) : promise already under evaluation: recursive default argument reference or earlier problems? ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ f <- function() { p <- 0; for (i in 1:10) { if (i %% 2 == 0) { delayedAssign("a", p + 1); } else { a <- p + 1; }; p <- a; }; p }; f() } [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ f <- function() { x <- 4 ; delayedAssign("x", y); y <- 10; x } ; f() } [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ f <- function(...) { delayedAssign("x", ..1) ; y <<- x } ; f(10) ; y } [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ h <- new.env(parent=emptyenv()) ; assign("x", 1, h) ; delayedAssign("x", y, h, h) ; assign("y", 2, h) ; get("x", h) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testDelayedAssign# #{ h <- new.env(parent=emptyenv()) ; delayedAssign("x", y, h, h) ; assign("y", 2, h) ; get("x", h) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_delayedAssign.testParseIndirectlyInvokedInternal# #f <- function(x, value, eval.env = parent.frame(1), assign.env = parent.frame(1)) { (get(".Internal", baseenv()))(delayedAssign(x, value, eval.env, assign.env)) }; f("aaa",1); aaa [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-0) [1] "0" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-0.0000000000000001) [1] "-1e-16" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-0.0000000001) [1] "-1e-10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-0.00123) [1] "-0.00123" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-0.1) [1] "-0.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-0.123) [1] "-0.123" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-0L) [1] "0L" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-1) [1] "-1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-1.545234523452345252523452345) [1] "-1.54523452345235" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-1000) [1] "-1000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-10000) [1] "-10000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-100000000) [1] "-1e+08" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-10000000000000) [1] "-1e+13" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-16L) [1] "-16L" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-17) [1] "-17" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-199.1234-5i) [1] "-199.1234-5i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-5i) [1] "0-5i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-99999) [1] "-99999" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(-Inf) [1] "-Inf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(0) [1] "0" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(0.0000000000000001) [1] "1e-16" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(0.0000000001) [1] "1e-10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(0.00123) [1] "0.00123" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(0.1) [1] "0.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(0.123) [1] "0.123" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(0L) [1] "0L" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(1) [1] "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(1.53160350210786e-322) [1] "1.53160350210786e-322" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(1.545234523452345252523452345) [1] "1.54523452345235" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(1000) [1] "1000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(10000) [1] "10000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(100000000) [1] "1e+08" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(10000000000000) [1] "1e+13" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(16L) [1] "16L" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(17) [1] "17" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(199.1234-5i) [1] "199.1234-5i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(1:2) [1] "1:2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(1:6) [1] "1:6" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(5i) [1] "0+5i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(99999) [1] "99999" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(Inf) [1] "Inf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(NA_character_) [1] "NA_character_" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(NA_complex_) [1] "NA_complex_" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(NA_integer_) [1] "NA_integer_" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(NA_real_) [1] "NA_real_" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(NaN) [1] "NaN" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(TRUE) [1] "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(c(-2L,-1L,0L,1L)) [1] "-2:1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(c(1,2,3)) [1] "c(1, 2, 3)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(c(1L,2L,3L)) [1] "1:3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(c(1L,2L,3L, NA_integer_)) [1] "c(1L, 2L, 3L, NA)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(c(3L,2L,1L)) [1] "3:1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(c(NA_integer_, 1L,2L,3L)) [1] "c(NA, 1L, 2L, 3L)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(c(T, F)) [1] "c(TRUE, FALSE)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(list(`x y`=1)) [1] "list(\"x y\" = 1)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(1/0)) [1] "1/0" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-0))) [1] "cat(-0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-0.0000000000000001))) [1] "cat(-1e-16)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-0.0000000001))) [1] "cat(-1e-10)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-0.00123))) [1] "cat(-0.00123)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-0.1))) [1] "cat(-0.1)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-0.123))) [1] "cat(-0.123)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-0L))) [1] "cat(-0L)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-1))) [1] "cat(-1)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-1.545234523452345252523452345))) [1] "cat(-1.54523452345235)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-1000))) [1] "cat(-1000)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-10000))) [1] "cat(-10000)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-100000000))) [1] "cat(-1e+08)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-10000000000000))) [1] "cat(-1e+13)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-16L))) [1] "cat(-16L)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-17))) [1] "cat(-17)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-199.1234-5i))) [1] "cat(-199.1234 - (0+5i))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-5i))) [1] "cat(-(0+5i))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-99999))) [1] "cat(-99999)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(-Inf))) [1] "cat(-Inf)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(0))) [1] "cat(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(0.0000000000000001))) [1] "cat(1e-16)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(0.0000000001))) [1] "cat(1e-10)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(0.00123))) [1] "cat(0.00123)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(0.1))) [1] "cat(0.1)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(0.123))) [1] "cat(0.123)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(0L))) [1] "cat(0L)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(1))) [1] "cat(1)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(1.545234523452345252523452345))) [1] "cat(1.54523452345235)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(1000))) [1] "cat(1000)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(10000))) [1] "cat(10000)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(100000000))) [1] "cat(1e+08)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(10000000000000))) [1] "cat(1e+13)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(16L))) [1] "cat(16L)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(17))) [1] "cat(17)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(199.1234-5i))) [1] "cat(199.1234 - (0+5i))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(1:2))) [1] "cat(1:2)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(1:6))) [1] "cat(1:6)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(5i))) [1] "cat(0+5i)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(99999))) [1] "cat(99999)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(Inf))) [1] "cat(Inf)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(NA_character_))) [1] "cat(NA_character_)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(NA_complex_))) [1] "cat(NA_complex_)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(NA_integer_))) [1] "cat(NA_integer_)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(NA_real_))) [1] "cat(NA_real_)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(NaN))) [1] "cat(NaN)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(TRUE))) [1] "cat(TRUE)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(c(-2L,-1L,0L,1L)))) [1] "cat(c(-2L, -1L, 0L, 1L))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(c(1,2,3)))) [1] "cat(c(1, 2, 3))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(c(1L,2L,3L)))) [1] "cat(c(1L, 2L, 3L))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(c(1L,2L,3L, NA_integer_)))) [1] "cat(c(1L, 2L, 3L, NA_integer_))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(c(3L,2L,1L)))) [1] "cat(c(3L, 2L, 1L))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(c(NA_integer_, 1L,2L,3L)))) [1] "cat(c(NA_integer_, 1L, 2L, 3L))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #deparse(quote(cat(c(T, F)))) [1] "cat(c(T, F))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #e <- quote(a <- 1); e[[3]] <- as.raw(c(1,6,9,254)); e a <- as.raw(c(0x01, 0x06, 0x09, 0xfe)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #unserialize(serialize(quote(!(a <- TRUE)), NULL)) !(a <- TRUE) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #unserialize(serialize(quote(a[a <- TRUE]), NULL)) a[a <- TRUE] ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ deparse(expression(a+b, c+d)) } [1] "expression(a + b, c + d)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ deparse(function (a1, a2, a3) if (!(a1 || a2) && a3) 42 else 7) } [1] "function (a1, a2, a3) " "if (!(a1 || a2) && a3) 42 else 7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ deparse(new.env()) } [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ deparse(nrow) } [1] "function (x) " "dim(x)[1L]" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ deparse(round) } [1] ".Primitive(\"round\")" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ e <- new.env(); assign("a", 1, e); assign("b", 2, e); le <- as.list(e); deparse(le)} [1] "list(a = 1, b = 2)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ f <- function() 23 ; deparse(f) } [1] "function () " "23" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ f <- function(x) { deparse(substitute(x)) } ; f(a + b * (c - d)) } [1] "a + b * (c - d)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ f<-function(...) { substitute(list(...)) }; deparse(f(c(1,2))) } [1] "list(c(1, 2))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ f<-function(...) { substitute(list(...)) }; deparse(f(c(x=1,2))) } [1] "list(c(x = 1, 2))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ f<-function(x) { deparse(x) }; l<-list(7); f(l) } [1] "list(7)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ f<-function(x) { deparse(x) }; l<-list(7, 42); f(l) } [1] "list(7, 42)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ f<-function(x) { deparse(x) }; l<-list(7, list(42)); f(l) } [1] "list(7, list(42))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ k <- 2 ; deparse(k) } [1] "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ x<-c(a=42, b=7); deparse(x) } [1] "c(a = 42, b = 7)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparse# #{ x<-expression(1); deparse(x) } [1] "expression(1)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparseStructure# #{ deparse(structure(.Data=c(1,2))) } [1] "c(1, 2)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparseStructure# #{ deparse(structure(.Data=c(1,2), attr1=c(1))) } [1] "structure(c(1, 2), attr1 = 1)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testDeparseStructure# #{ deparse(structure(.Data=c(1,2), attr1=c(1), attr2=c(2))) } [1] "structure(c(1, 2), attr1 = 1, attr2 = 2)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse1# #argv <- list(quote(rsp), 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "rsp" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse10# #argv <- list(quote(1:10), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "1:10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse11# #argv <- list(quote(x[[i]]), 500L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "x[[i]]" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse12# #argv <- list(quote(t1 - 4), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "t1 - 4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse13# #argv <- list(quote(read.table('foo1')), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "read.table(\"foo1\")" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse14# #argv <- list(quote(`[.data.frame`(dd, , 'x')), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "`[.data.frame`(dd, , \"x\")" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse15# #argv <- list(1e-07, 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "1e-07" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse16# #argv <- list('coef.corStruct', 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "\"coef.corStruct\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse17# #argv <- list('Version of graph is too old --- no tests done here!\n', 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "\"Version of graph is too old --- no tests done here!\\n\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse18# #argv <- list(Inf, 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "Inf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse19# #cat({argv <- list(structure(list(Sex = structure(c(2L, 2L, 1L, 1L, 2L, 2L), .Label = c('Female', 'Male'), class = 'factor'), age = c(15, 20, 10, 12, 2, 4), Subject = structure(c(2L, 2L, 1L, 1L, 3L, 3L), .Label = c('F30', 'M01', 'M04'), class = 'factor')), .Names = c('Sex', 'age', 'Subject'), row.names = c(NA, -6L), class = 'data.frame'), 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]]))}) structure(list(structure(c(2L, 2L, 1L, 1L, 2L, 2L), .Label = c("Female", "Male"), class = "factor"), c(15, 20, 10, 12, 2, 4), structure(c(2L, 2L, 1L, 1L, 3L, 3L), .Label = c("F30", "M01", "M04"), class = "factor")), .Names = c("Sex", "age", "Subject"), row.names = c(NA, -6L), class = "data.frame") ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse2# #argv <- list(quote(rnorm(1, sd = Inf)), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "rnorm(1, sd = Inf)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse20# #argv <- list(TRUE, 500L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse21# #argv <- list(.Primitive('interactive'), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] ".Primitive(\"interactive\")" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse22# #argv <- list(0+1i, 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "0+1i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse23# #argv <- list(quote(cor(Z[, FALSE], use = 'pairwise.complete.obs', method = 'kendall')), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "cor(Z[, FALSE], use = \"pairwise.complete.obs\", method = \"kendall\")" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse24# #cat({argv <- list(c(7.4, 8, 12.6, 11.5, 14.3, 14.9, 8.6, 13.8, 20.1, 8.6, 6.9, 9.7, 9.2, 10.9, 13.2, 11.5, 12, 18.4, 11.5, 9.7, 9.7, 16.6, 9.7, 12, 16.6, 14.9, 8, 12, 14.9, 5.7, 7.4, 8.6, 9.7, 16.1, 9.2, 8.6, 14.3, 9.7, 6.9, 13.8, 11.5, 10.9, 9.2, 8, 13.8, 11.5, 14.9, 20.7, 9.2, 11.5, 10.3, 6.3, 1.7, 4.6, 6.3, 8, 8, 10.3, 11.5, 14.9, 8, 6.9, 13.8, 7.4, 6.9, 7.4, 4.6, 4, 10.3, 8, 8.6, 11.5, 11.5, 11.5, 9.7, 11.5, 10.3, 6.3, 7.4, 10.9, 10.3, 15.5, 14.3, 12.6, 9.7, 3.4, 8, 5.7, 9.7, 2.3, 6.3, 6.3, 6.9, 5.1, 2.8, 4.6, 7.4, 15.5, 10.9, 10.3, 10.9, 9.7, 14.9, 15.5, 6.3, 10.9, 11.5, 6.9, 13.8, 10.3, 10.3, 8, 12.6, 9.2, 10.3, 10.3, 16.6, 6.9, 13.2, 14.3, 8, 11.5), 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]]))}) c(7.4, 8, 12.6, 11.5, 14.3, 14.9, 8.6, 13.8, 20.1, 8.6, 6.9, 9.7, 9.2, 10.9, 13.2, 11.5, 12, 18.4, 11.5, 9.7, 9.7, 16.6, 9.7, 12, 16.6, 14.9, 8, 12, 14.9, 5.7, 7.4, 8.6, 9.7, 16.1, 9.2, 8.6, 14.3, 9.7, 6.9, 13.8, 11.5, 10.9, 9.2, 8, 13.8, 11.5, 14.9, 20.7, 9.2, 11.5, 10.3, 6.3, 1.7, 4.6, 6.3, 8, 8, 10.3, 11.5, 14.9, 8, 6.9, 13.8, 7.4, 6.9, 7.4, 4.6, 4, 10.3, 8, 8.6, 11.5, 11.5, 11.5, 9.7, 11.5, 10.3, 6.3, 7.4, 10.9, 10.3, 15.5, 14.3, 12.6, 9.7, 3.4, 8, 5.7, 9.7, 2.3, 6.3, 6.3, 6.9, 5.1, 2.8, 4.6, 7.4, 15.5, 10.9, 10.3, 10.9, 9.7, 14.9, 15.5, 6.3, 10.9, 11.5, 6.9, 13.8, 10.3, 10.3, 8, 12.6, 9.2, 10.3, 10.3, 16.6, 6.9, 13.2, 14.3, 8, 11.5) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse25# #argv <- list(1e+05, 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "1e+05" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse26# #cat({argv <- list(structure(list(distance = c(26, 25, 29, 31, 21.5, 22.5), age = c(8, 10, 12, 14, 8, 10), Subject = structure(c(2L, 2L, 2L, 2L, 1L, 1L), .Label = c('M02', 'M01'), class = c('ordered', 'factor')), Sex = structure(c(1L, 1L, 1L, 1L, 1L, 1L), .Label = c('Male', 'Female'), class = 'factor')), .Names = c('distance', 'age', 'Subject', 'Sex'), row.names = c('1', '2', '3', '4', '5', '6'), class = 'data.frame'), 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]]))}) structure(list(c(26, 25, 29, 31, 21.5, 22.5), c(8, 10, 12, 14, 8, 10), structure(c(2L, 2L, 2L, 2L, 1L, 1L), .Label = c("M02", "M01"), class = c("ordered", "factor")), structure(c(1L, 1L, 1L, 1L, 1L, 1L), .Label = c("Male", "Female"), class = "factor")), .Names = c("distance", "age", "Subject", "Sex"), row.names = c("1", "2", "3", "4", "5", "6"), class = "data.frame") ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse27# #argv <- list('\t *ERROR* !!\n', 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "\"\\t *ERROR* !!\\n\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse28# #argv <- list('\n\f\n', 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "\"\\n\\f\\n\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse29# #argv <- list(' +\\.', 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "\" +\\\\.\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse3# #argv <- list(quote(rnorm(2, c(1, NA))), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "rnorm(2, c(1, NA))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse30# #argv <- list(structure(FALSE, .Dim = 1L), 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "structure(FALSE, .Dim = 1L)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse31# #cat({argv <- list(c(0, 0.587785252292473, 0.951056516295154, 0.951056516295154, 0.587785252292473, 1.22464679914735e-16, -0.587785252292473, -0.951056516295154, -0.951056516295154, -0.587785252292473, -2.44929359829471e-16, 0.587785252292473, 0.951056516295154), 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]]))}) c(0, 0.587785252292473, 0.951056516295154, 0.951056516295154, 0.587785252292473, 1.22464679914735e-16, -0.587785252292473, -0.951056516295154, -0.951056516295154, -0.587785252292473, -2.44929359829471e-16, 0.587785252292473, 0.951056516295154) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse32# #cat({argv <- list(structure(c(39.384847580955, 40.3469409309138, 42.6018205723052, 46.6665176252597, 51.3438205965467, 60.0069972599329, 64.6480892875058, 62.5709232928432, 57.679739382496, 49.5060394945433, 43.474726406114, 39.8236314289602, 38.361391396627, 37.9275637097922, 43.6868952734483, 45.1919846859641, 51.722520194987, 59.3399821539983, 61.9345241730145, 62.1515308754468, 57.6561604617486, 49.2849925780811, 42.606775772378, 39.6394677676018, 38.6328048791077, 38.4418602988203, 43.1520834957543, 45.6551746936999, 51.7999631155049, 59.5021948495759, 62.9217123388139, 62.0751910659837, 57.8048619656866, 49.5091658164884, 42.8045075272742, 40.2515159054665), .Tsp = c(1937, 1939.91666666667, 12), class = 'ts'), 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]]))}) structure(c(39.384847580955, 40.3469409309138, 42.6018205723052, 46.6665176252597, 51.3438205965467, 60.0069972599329, 64.6480892875058, 62.5709232928432, 57.679739382496, 49.5060394945433, 43.474726406114, 39.8236314289602, 38.361391396627, 37.9275637097922, 43.6868952734483, 45.1919846859641, 51.722520194987, 59.3399821539983, 61.9345241730145, 62.1515308754468, 57.6561604617486, 49.2849925780811, 42.606775772378, 39.6394677676018, 38.6328048791077, 38.4418602988203, 43.1520834957543, 45.6551746936999, 51.7999631155049, 59.5021948495759, 62.9217123388139, 62.0751910659837, 57.8048619656866, 49.5091658164884, 42.8045075272742, 40.2515159054665), .Tsp = c(1937, 1939.91666666667, 12), class = "ts") ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse33# #argv <- list(NA_real_, 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "NA_real_" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse34# #argv <- list(quote(lm(formula = y ~ x1 + x2 + x3)), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "lm(formula = y ~ x1 + x2 + x3)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse35# #cat({argv <- list(structure(c(112, 118, 132, 129, 121, 135, 148, 148, 136, 119, 104, 118, 115, 126, 141, 135, 125, 149, 170, 170, 158, 133, 114, 140, 145, 150, 178, 163, 172, 178, 199, 199, 184, 162, 146, 166, 171, 180, 193, 181, 183, 218, 230, 242, 209, 191, 172, 194, 196, 196, 236, 235, 229, 243, 264, 272, 237, 211, 180, 201, 204, 188, 235, 227, 234, 264, 302, 293, 259, 229, 203, 229, 242, 233, 267, 269, 270, 315, 364, 347, 312, 274, 237, 278, 284, 277, 317, 313, 318, 374, 413, 405, 355, 306, 271, 306, 315, 301, 356, 348, 355, 422, 465, 467, 404, 347, 305, 336, 340, 318, 362, 348, 363, 435, 491, 505, 404, 359, 310, 337, 360, 342, 406, 396, 420, 472, 548, 559, 463, 407, 362, 405, 417, 391, 419, 461, 472, 535, 622, 606, 508, 461, 390, 432, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 419.147602949539, 391.474665943444, 435.919286153217, 443.935203034261, 455.023399013445, 517.28707821144, 589.71337277669, 582.999919227301, 484.573388713116, 428.878182738437, 368.526582998452, 406.728709993152, 415.660571294428, 388.716535970235, 433.006017658935, 440.885684396326, 451.651900136866, 513.051252429496, 584.327164324967, 577.055407135124, 479.076505013118, 423.494870357491, 363.43932958967, 400.592058645117, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 484.030717075782, 462.954959541421, 526.353307750503, 546.165638262644, 569.502470928676, 657.838443307596, 761.241730163307, 763.280655335144, 642.989004951864, 576.423799567567, 501.429012064338, 559.981301364233, 591.700754553767, 565.210772316967, 642.377841008703, 666.682421047093, 695.547100430962, 804.065022775202, 931.340589597203, 934.837830059897, 788.422986194072, 707.666678543854, 616.37838266375, 689.250456425465), .Dim = c(168L, 3L), .Dimnames = list(NULL, c('structure(c(112, 118, 132, 129, 121, 135, 148, 148, 136, 119, ', 'structure(c(419.147602949539, 391.474665943444, 435.919286153217, ', 'structure(c(484.030717075782, 462.954959541421, 526.353307750503, ')), .Tsp = c(1949, 1962.91666666667, 12), class = c('mts', 'ts', 'matrix')), 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]]))}) structure(c(112, 118, 132, 129, 121, 135, 148, 148, 136, 119, 104, 118, 115, 126, 141, 135, 125, 149, 170, 170, 158, 133, 114, 140, 145, 150, 178, 163, 172, 178, 199, 199, 184, 162, 146, 166, 171, 180, 193, 181, 183, 218, 230, 242, 209, 191, 172, 194, 196, 196, 236, 235, 229, 243, 264, 272, 237, 211, 180, 201, 204, 188, 235, 227, 234, 264, 302, 293, 259, 229, 203, 229, 242, 233, 267, 269, 270, 315, 364, 347, 312, 274, 237, 278, 284, 277, 317, 313, 318, 374, 413, 405, 355, 306, 271, 306, 315, 301, 356, 348, 355, 422, 465, 467, 404, 347, 305, 336, 340, 318, 362, 348, 363, 435, 491, 505, 404, 359, 310, 337, 360, 342, 406, 396, 420, 472, 548, 559, 463, 407, 362, 405, 417, 391, 419, 461, 472, 535, 622, 606, 508, 461, 390, 432, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 419.147602949539, 391.474665943444, 435.919286153217, 443.935203034261, 455.023399013445, 517.28707821144, 589.71337277669, 582.999919227301, 484.573388713116, 428.878182738437, 368.526582998452, 406.728709993152, 415.660571294428, 388.716535970235, 433.006017658935, 440.885684396326, 451.651900136866, 513.051252429496, 584.327164324967, 577.055407135124, 479.076505013118, 423.494870357491, 363.43932958967, 400.592058645117, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 484.030717075782, 462.954959541421, 526.353307750503, 546.165638262644, 569.502470928676, 657.838443307596, 761.241730163307, 763.280655335144, 642.989004951864, 576.423799567567, 501.429012064338, 559.981301364233, 591.700754553767, 565.210772316967, 642.377841008703, 666.682421047093, 695.547100430962, 804.065022775202, 931.340589597203, 934.837830059897, 788.422986194072, 707.666678543854, 616.37838266375, 689.250456425465), .Dim = c(168L, 3L), .Dimnames = list(NULL, c("structure(c(112, 118, 132, 129, 121, 135, 148, 148, 136, 119, ", "structure(c(419.147602949539, 391.474665943444, 435.919286153217, ", "structure(c(484.030717075782, 462.954959541421, 526.353307750503, " )), .Tsp = c(1949, 1962.91666666667, 12), class = c("mts", "ts", "matrix")) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse36# #argv <- list(numeric(0), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "numeric(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse37# #argv <- list(0:12, 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "0:12" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse38# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')), 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "structure(list(structure(integer(0), .Label = character(0), class = \"factor\")), .Names = \"c0\", row.names = character(0), class = c(c0 = \"integer(0)\"))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse39# #argv <- list(NA, 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse4# #argv <- list(quote(unclass(x)), 500, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "unclass(x)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse40# #argv <- list(logical(0), logical(0), FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "logical(0)" Warning message: invalid 'cutoff' value for 'deparse', using default ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse41# #argv <- list(FALSE, 50L, FALSE, 69, 2L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse42# #argv <- list(c(FALSE, FALSE), 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "c(FALSE, FALSE)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse43# #argv <- list(quote(glm(formula = y ~ x, family = poisson(identity), start = c(1, 0))), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "glm(formula = y ~ x, family = poisson(identity), start = c(1, " [2] " 0))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse44# #cat({argv <- list(quote(lm(formula = 1000/MPG.city ~ Weight + Cylinders + Type + EngineSize + DriveTrain, data = Cars93)), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]]))}) lm(formula = 1000/MPG.city ~ Weight + Cylinders + Type + EngineSize + DriveTrain, data = Cars93) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse45# #argv <- list(0.333333333333333, 60L, FALSE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "0.333333333333333" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse46# #argv <- list(quote(Fr ~ (Hair + Eye + Sex)^2), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "Fr ~ (Hair + Eye + Sex)^2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse47# #argv <- list(quote(glm(formula = cbind(X, M) ~ M.user + Temp + M.user:Temp, family = binomial, data = detg1)), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "glm(formula = cbind(X, M) ~ M.user + Temp + M.user:Temp, family = binomial, " [2] " data = detg1)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse48# #argv <- list(quote(x[[i]] <- 0.9999997), 500L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "x[[i]] <- 0.9999997" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse5# #argv <- list(quote(cor(rnorm(10), NULL)), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "cor(rnorm(10), NULL)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse6# #argv <- list(quote(5 * exp(-x)), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "5 * exp(-x)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse7# #cat({argv <- list(quote(y ~ ((g1) * exp((log(g2/g1)) * (1 - exp(-k * (x - Ta)))/(1 - exp(-k * (Tb - Ta)))))), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]]))}) y ~ ((g1) * exp((log(g2/g1)) * (1 - exp(-k * (x - Ta)))/(1 - exp(-k * (Tb - Ta))))) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse8# #argv <- list(quote(tt <- table(c(rep(0, 7), rep(1, 4), rep(5, 3)))), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "tt <- table(c(rep(0, 7), rep(1, 4), rep(5, 3)))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deparse.testdeparse9# #argv <- list(quote(utils::str), 60L, TRUE, 69, -1L); .Internal(deparse(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "utils::str" ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ (x+1)*(x+2), c("x"), hessian=FALSE) expression({ .expr1 <- x + 1 .expr2 <- x + 2 .value <- .expr1 * .expr2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- .expr2 + .expr1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ (x+1)*(x+2), c("x"), hessian=TRUE) expression({ .expr1 <- x + 1 .expr2 <- x + 2 .value <- .expr1 * .expr2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- .expr2 + .expr1 .hessian[, "x", "x"] <- 1 + 1 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ (x+1)*(x+2*(x-1)), c("x"), hessian=FALSE) expression({ .expr1 <- x + 1 .expr4 <- x + 2 * (x - 1) .value <- .expr1 * .expr4 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- .expr4 + .expr1 * (1 + 2) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ (x+1)*(x+2*(x-1)), c("x"), hessian=TRUE) expression({ .expr1 <- x + 1 .expr4 <- x + 2 * (x - 1) .expr6 <- 1 + 2 .value <- .expr1 * .expr4 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- .expr4 + .expr1 * .expr6 .hessian[, "x", "x"] <- .expr6 + .expr6 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ (x+1)+(x+2), c("x"), hessian=FALSE) expression({ .value <- x + 1 + (x + 2) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1 + 1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ (x+1)+(x+2), c("x"), hessian=TRUE) expression({ .value <- x + 1 + (x + 2) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1 + 1 .hessian[, "x", "x"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ (x+1)-(x+2), c("x"), hessian=FALSE) expression({ .value <- x + 1 - (x + 2) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1 - 1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ (x+1)-(x+2), c("x"), hessian=TRUE) expression({ .value <- x + 1 - (x + 2) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1 - 1 .hessian[, "x", "x"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ (x+1)/(x+2), c("x"), hessian=FALSE) expression({ .expr1 <- x + 1 .expr2 <- x + 2 .value <- .expr1/.expr2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1/.expr2 - .expr1/.expr2^2 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1#Output.IgnoreWhitespace# #deriv(~ (x+1)/(x+2), c("x"), hessian=TRUE) expression({ .expr1 <- x + 1 .expr2 <- x + 2 .expr5 <- .expr2^2 .expr8 <- 1/.expr5 .value <- .expr1/.expr2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1/.expr2 - .expr1/.expr5 .hessian[, "x", "x"] <- -(.expr8 + (.expr8 - .expr1 * (2 * .expr2)/.expr5^2)) attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1#Ignored.OutputFormatting# #deriv(~ (x+1)^(x+2), c("x"), hessian=FALSE) expression({ .expr1 <- x + 1 .expr2 <- x + 2 .expr3 <- .expr1^.expr2 .value <- .expr3 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- .expr1^(.expr2 - 1) * .expr2 + .expr3 * log(.expr1) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ -(x+1)+(x+2), c("x"), hessian=FALSE) expression({ .value <- -(x + 1) + (x + 2) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1 - 1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ -(x+1)+(x+2), c("x"), hessian=TRUE) expression({ .value <- -(x + 1) + (x + 2) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1 - 1 .hessian[, "x", "x"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ -(x+1)-(x+2), c("x"), hessian=FALSE) expression({ .value <- -(x + 1) - (x + 2) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- -(1 + 1) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ -(x+1)-(x+2), c("x"), hessian=TRUE) expression({ .value <- -(x + 1) - (x + 2) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- -(1 + 1) .hessian[, "x", "x"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ 1, c("x"), hessian=FALSE) expression({ .value <- 1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 0 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ 1, c("x"), hessian=TRUE) expression({ .value <- 1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ 2*x, c("x"), hessian=FALSE) expression({ .value <- 2 * x .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 2 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ 2*x, c("x"), hessian=TRUE) expression({ .value <- 2 * x .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 2 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1#Ignored.OutputFormatting# #deriv(~ 2/x, c("x"), hessian=FALSE) expression({ .value <- 2/x .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- -(2/x^2) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ x+1, c("x"), hessian=FALSE) expression({ .value <- x + 1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ x+1, c("x"), hessian=TRUE) expression({ .value <- x + 1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ x, c("x"), hessian=FALSE) expression({ .value <- x .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ x, c("x"), hessian=TRUE) expression({ .value <- x .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ x/2, c("x"), hessian=FALSE) expression({ .value <- x/2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1/2 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ x/2, c("x"), hessian=TRUE) expression({ .value <- x/2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1/2 .hessian[, "x", "x"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ x^2, c("x"), hessian=FALSE) expression({ .value <- x^2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 2 * x attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #deriv(~ x^2, c("x"), hessian=TRUE) expression({ .value <- x^2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 2 * x .hessian[, "x", "x"] <- 2 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)*(x+2), c("x"), hessian=FALSE); x<-0; eval(df) [1] 2 attr(,"gradient") x [1,] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)*(x+2), c("x"), hessian=TRUE); x<-0; eval(df) [1] 2 attr(,"gradient") x [1,] 3 attr(,"hessian") , , x x [1,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)*(x+2*(x-1)), c("x"), hessian=FALSE); x<-0; eval(df) [1] -2 attr(,"gradient") x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)*(x+2*(x-1)), c("x"), hessian=TRUE); x<-0; eval(df) [1] -2 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)+(x+2), c("x"), hessian=FALSE); x<-0; eval(df) [1] 3 attr(,"gradient") x [1,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)+(x+2), c("x"), hessian=TRUE); x<-0; eval(df) [1] 3 attr(,"gradient") x [1,] 2 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)-(x+2), c("x"), hessian=FALSE); x<-0; eval(df) [1] -1 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)-(x+2), c("x"), hessian=TRUE); x<-0; eval(df) [1] -1 attr(,"gradient") x [1,] 0 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)/(x+2), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0.5 attr(,"gradient") x [1,] 0.25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)/(x+2), c("x"), hessian=TRUE); x<-0; eval(df) [1] 0.5 attr(,"gradient") x [1,] 0.25 attr(,"hessian") , , x x [1,] -0.25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ (x+1)^(x+2), c("x"), hessian=FALSE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ -(x+1)+(x+2), c("x"), hessian=FALSE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ -(x+1)+(x+2), c("x"), hessian=TRUE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 0 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ -(x+1)-(x+2), c("x"), hessian=FALSE); x<-0; eval(df) [1] -3 attr(,"gradient") x [1,] -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ -(x+1)-(x+2), c("x"), hessian=TRUE); x<-0; eval(df) [1] -3 attr(,"gradient") x [1,] -2 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ 1, c("x"), hessian=FALSE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ 1, c("x"), hessian=TRUE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 0 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ 2*x, c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ 2*x, c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 2 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ 2/x, c("x"), hessian=FALSE); x<-0; eval(df) [1] Inf attr(,"gradient") x [1,] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ x+1, c("x"), hessian=FALSE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ x+1, c("x"), hessian=TRUE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ x, c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ x, c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ x/2, c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 0.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ x/2, c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 0.5 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ x^2, c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions1# #df <- deriv(~ x^2, c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 0 attr(,"hessian") , , x x [1,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ (x+1)*(y+2), c("x","y"), hessian=FALSE) expression({ .expr1 <- x + 1 .expr2 <- y + 2 .value <- .expr1 * .expr2 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- .expr2 .grad[, "y"] <- .expr1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ (x+1)*(y+2), c("x","y"), hessian=TRUE) expression({ .expr1 <- x + 1 .expr2 <- y + 2 .value <- .expr1 * .expr2 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- .expr2 .hessian[, "x", "x"] <- 0 .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- 1 .grad[, "y"] <- .expr1 .hessian[, "y", "y"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ (x+1)*(y+2*(x-1)), c("x","y"), hessian=FALSE) expression({ .expr1 <- x + 1 .expr4 <- y + 2 * (x - 1) .value <- .expr1 * .expr4 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- .expr4 + .expr1 * 2 .grad[, "y"] <- .expr1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ (x+1)*(y+2*(x-1)), c("x","y"), hessian=TRUE) expression({ .expr1 <- x + 1 .expr4 <- y + 2 * (x - 1) .value <- .expr1 * .expr4 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- .expr4 + .expr1 * 2 .hessian[, "x", "x"] <- 2 + 2 .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- 1 .grad[, "y"] <- .expr1 .hessian[, "y", "y"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ (x+1)-(y+2), c("x","y"), hessian=FALSE) expression({ .value <- x + 1 - (y + 2) .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- 1 .grad[, "y"] <- -1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ (x+1)-(y+2), c("x","y"), hessian=TRUE) expression({ .value <- x + 1 - (y + 2) .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- 1 .grad[, "y"] <- -1 .hessian[, "y", "y"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ (x+1)/(y+2), c("x","y"), hessian=FALSE) expression({ .expr1 <- x + 1 .expr2 <- y + 2 .value <- .expr1/.expr2 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- 1/.expr2 .grad[, "y"] <- -(.expr1/.expr2^2) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ (x+1)/(y+2), c("x","y"), hessian=TRUE) expression({ .expr1 <- x + 1 .expr2 <- y + 2 .expr5 <- .expr2^2 .value <- .expr1/.expr2 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- 1/.expr2 .hessian[, "x", "x"] <- 0 .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- -(1/.expr5) .grad[, "y"] <- -(.expr1/.expr5) .hessian[, "y", "y"] <- .expr1 * (2 * .expr2)/.expr5^2 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ (x+1)^(y+2), c("x","y"), hessian=FALSE) expression({ .expr1 <- x + 1 .expr2 <- y + 2 .expr3 <- .expr1^.expr2 .value <- .expr3 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- .expr1^(.expr2 - 1) * .expr2 .grad[, "y"] <- .expr3 * log(.expr1) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ (x+1)^(y+2), c("x","y"), hessian=TRUE) expression({ .expr1 <- x + 1 .expr2 <- y + 2 .expr3 <- .expr1^.expr2 .expr4 <- .expr2 - 1 .expr5 <- .expr1^.expr4 .expr11 <- log(.expr1) .expr15 <- .expr3 * .expr11 .value <- .expr3 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- .expr5 * .expr2 .hessian[, "x", "x"] <- .expr1^(.expr4 - 1) * .expr4 * .expr2 .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- .expr5 * .expr11 * .expr2 + .expr5 .grad[, "y"] <- .expr15 .hessian[, "y", "y"] <- .expr15 * .expr11 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ -(x+1)+(y+2), c("x","y"), hessian=FALSE) expression({ .value <- -(x + 1) + (y + 2) .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- -1 .grad[, "y"] <- 1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ -(x+1)+(y+2), c("x","y"), hessian=TRUE) expression({ .value <- -(x + 1) + (y + 2) .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- -1 .hessian[, "x", "x"] <- 0 .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- 0 .grad[, "y"] <- 1 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ -(x+1)-(y+2), c("x","y"), hessian=FALSE) expression({ .expr5 <- -1 .value <- -(x + 1) - (y + 2) .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- .expr5 .grad[, "y"] <- .expr5 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ -(x+1)-(y+2), c("x","y"), hessian=TRUE) expression({ .expr5 <- -1 .value <- -(x + 1) - (y + 2) .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- .expr5 .hessian[, "x", "x"] <- 0 .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- 0 .grad[, "y"] <- .expr5 .hessian[, "y", "y"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ 2*x*y, c("x","y"), hessian=FALSE) expression({ .expr1 <- 2 * x .value <- .expr1 * y .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- 2 * y .grad[, "y"] <- .expr1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ 2*x*y, c("x","y"), hessian=TRUE) expression({ .expr1 <- 2 * x .value <- .expr1 * y .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- 2 * y .hessian[, "x", "x"] <- 0 .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- 2 .grad[, "y"] <- .expr1 .hessian[, "y", "y"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ 2/x*y, c("x","y"), hessian=FALSE) expression({ .expr1 <- 2/x .value <- .expr1 * y .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- -(2/x^2 * y) .grad[, "y"] <- .expr1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ 2/x*y, c("x","y"), hessian=TRUE) expression({ .expr1 <- 2/x .expr3 <- x^2 .expr4 <- 2/.expr3 .value <- .expr1 * y .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- -(.expr4 * y) .hessian[, "x", "x"] <- 2 * (2 * x)/.expr3^2 * y .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- -.expr4 .grad[, "y"] <- .expr1 .hessian[, "y", "y"] <- 0 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ x + y, c("x","y"), hessian=FALSE) expression({ .value <- x + y .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- 1 .grad[, "y"] <- 1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ x + y, c("x","y"), hessian=TRUE) expression({ .value <- x + y .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- 1 .grad[, "y"] <- 1 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ x*y, c("x","y"), hessian=FALSE) expression({ .value <- x * y .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- y .grad[, "y"] <- x attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ x*y, c("x","y"), hessian=TRUE) expression({ .value <- x * y .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- y .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- 1 .grad[, "y"] <- x attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ x/y/2, c("x","y"), hessian=FALSE) expression({ .value <- x/y/2 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- 1/y/2 .grad[, "y"] <- -(x/y^2/2) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ x/y/2, c("x","y"), hessian=TRUE) expression({ .expr5 <- y^2 .value <- x/y/2 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- 1/y/2 .hessian[, "x", "x"] <- 0 .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- -(1/.expr5/2) .grad[, "y"] <- -(x/.expr5/2) .hessian[, "y", "y"] <- x * (2 * y)/.expr5^2/2 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #deriv(~ x^y, c("x","y"), hessian=FALSE) expression({ .expr1 <- x^y .value <- .expr1 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- x^(y - 1) * y .grad[, "y"] <- .expr1 * log(x) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2#Ignored.OutputFormatting# #deriv(~ x^y, c("x","y"), hessian=TRUE) expression({ .expr1 <- x^y .expr2 <- y - 1 .expr3 <- x^.expr2 .expr9 <- log(x) .expr13 <- .expr1 * .expr9 .value <- .expr1 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- .expr3 * y .hessian[, "x", "x"] <- x^(.expr2 - 1) * .expr2 * y .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- .expr3 * .expr9 * y + .expr3 .grad[, "y"] <- .expr13 .hessian[, "y", "y"] <- .expr13 * .expr9 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)*(y+2), c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] 2 attr(,"gradient") x y [1,] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)*(y+2), c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] 2 attr(,"gradient") x y [1,] 2 1 attr(,"hessian") , , x x y [1,] 0 1 , , y x y [1,] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)*(y+2*(x-1)), c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] -2 attr(,"gradient") x y [1,] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)*(y+2*(x-1)), c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] -2 attr(,"gradient") x y [1,] 0 1 attr(,"hessian") , , x x y [1,] 4 1 , , y x y [1,] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)-(y+2), c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] -1 attr(,"gradient") x y [1,] 1 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)-(y+2), c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] -1 attr(,"gradient") x y [1,] 1 -1 attr(,"hessian") , , x x y [1,] 0 0 , , y x y [1,] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)/(y+2), c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] 0.5 attr(,"gradient") x y [1,] 0.5 -0.25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)/(y+2), c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] 0.5 attr(,"gradient") x y [1,] 0.5 -0.25 attr(,"hessian") , , x x y [1,] 0 -0.25 , , y x y [1,] -0.25 0.25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)^(y+2), c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] 1 attr(,"gradient") x y [1,] 2 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)^(y+2), c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] 1 attr(,"gradient") x y [1,] 2 0 attr(,"hessian") , , x x y [1,] 2 1 , , y x y [1,] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ (x+1)^(y+2), c("x","y"), hessian=TRUE); x<-1; y<-1; eval(df) [1] 8 attr(,"gradient") x y [1,] 12 5.545177 attr(,"hessian") , , x x y [1,] 12 12.31777 , , y x y [1,] 12.31777 3.843624 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ -(x+1)+(y+2), c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] 1 attr(,"gradient") x y [1,] -1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ -(x+1)+(y+2), c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] 1 attr(,"gradient") x y [1,] -1 1 attr(,"hessian") , , x x y [1,] 0 0 , , y x y [1,] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ -(x+1)-(y+2), c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] -3 attr(,"gradient") x y [1,] -1 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ -(x+1)-(y+2), c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] -3 attr(,"gradient") x y [1,] -1 -1 attr(,"hessian") , , x x y [1,] 0 0 , , y x y [1,] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ 2*x*y, c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] 0 attr(,"gradient") x y [1,] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ 2*x*y, c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] 0 attr(,"gradient") x y [1,] 0 0 attr(,"hessian") , , x x y [1,] 0 2 , , y x y [1,] 2 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ 2/x*y, c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] NaN attr(,"gradient") x y [1,] NaN Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ 2/x*y, c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] NaN attr(,"gradient") x y [1,] NaN Inf attr(,"hessian") , , x x y [1,] NaN -Inf , , y x y [1,] -Inf 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ x + y, c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] 0 attr(,"gradient") x y [1,] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ x + y, c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] 0 attr(,"gradient") x y [1,] 1 1 attr(,"hessian") , , x x y [1,] 0 0 , , y x y [1,] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ x*y, c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] 0 attr(,"gradient") x y [1,] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ x*y, c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] 0 attr(,"gradient") x y [1,] 0 0 attr(,"hessian") , , x x y [1,] 0 1 , , y x y [1,] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ x/y/2, c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] NaN attr(,"gradient") x y [1,] Inf NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ x/y/2, c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] NaN attr(,"gradient") x y [1,] Inf NaN attr(,"hessian") , , x x y [1,] 0 -Inf , , y x y [1,] -Inf NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ x^y, c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] 1 attr(,"gradient") x y [1,] NaN -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveBasicExpressions2# #df <- deriv(~ x^y, c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] 1 attr(,"gradient") x y [1,] NaN -Inf attr(,"hessian") , , x x y [1,] NaN NaN , , y x y [1,] NaN Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1#Ignored.OutputFormatting# #deriv(~ acos(x), c("x"), hessian=FALSE) expression({ .value <- acos(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- -(1/sqrt(1 - x^2)) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ asin(x), c("x"), hessian=FALSE) expression({ .value <- asin(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1/sqrt(1 - x^2) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ asin(x), c("x"), hessian=TRUE) expression({ .expr3 <- 1 - x^2 .expr4 <- sqrt(.expr3) .value <- asin(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1/.expr4 .hessian[, "x", "x"] <- 0.5 * (2 * x * .expr3^-0.5)/.expr4^2 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ atan(x), c("x"), hessian=FALSE) expression({ .value <- atan(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1/(1 + x^2) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1#Ignored.OutputFormatting# #deriv(~ atan(x), c("x"), hessian=TRUE) expression({ .expr3 <- 1 + x^2 .value <- atan(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1/.expr3 .hessian[, "x", "x"] <- -(2 * x/.expr3^2) attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ cos(x), c("x"), hessian=FALSE) expression({ .value <- cos(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- -sin(x) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ cos(x), c("x"), hessian=TRUE) expression({ .expr1 <- cos(x) .value <- .expr1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- -sin(x) .hessian[, "x", "x"] <- -.expr1 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ cosh(x), c("x"), hessian=FALSE) expression({ .value <- cosh(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- sinh(x) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ cosh(x), c("x"), hessian=TRUE) expression({ .expr1 <- cosh(x) .value <- .expr1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- sinh(x) .hessian[, "x", "x"] <- .expr1 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ digamma(x), c("x"), hessian=FALSE) expression({ .value <- digamma(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- trigamma(x) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1#Ignored.OutputFormatting# #deriv(~ dnorm(x), c("x"), hessian=FALSE) expression({ .expr1 <- dnorm(x) .value <- .expr1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- -(x * .expr1) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ exp(x), c("x"), hessian=FALSE) expression({ .expr1 <- exp(x) .value <- .expr1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- .expr1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ exp(x), c("x"), hessian=TRUE) expression({ .expr1 <- exp(x) .value <- .expr1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- .expr1 .hessian[, "x", "x"] <- .expr1 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ gamma(x), c("x"), hessian=FALSE) expression({ .expr1 <- gamma(x) .value <- .expr1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- .expr1 * digamma(x) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ lgamma(x), c("x"), hessian=FALSE) expression({ .value <- lgamma(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- digamma(x) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ log(x), c("x"), hessian=FALSE) expression({ .value <- log(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1/x attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1#Ignored.OutputFormatting# #deriv(~ log(x), c("x"), hessian=TRUE) expression({ .value <- log(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1/x .hessian[, "x", "x"] <- -(1/x^2) attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ pnorm(x), c("x"), hessian=FALSE) expression({ .value <- pnorm(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- dnorm(x) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1#Ignored.OutputFormatting# #deriv(~ pnorm(x), c("x"), hessian=TRUE) expression({ .expr2 <- dnorm(x) .value <- pnorm(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- .expr2 .hessian[, "x", "x"] <- -(x * .expr2) attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ psigamma(x), c("x"), hessian=FALSE) expression({ .value <- psigamma(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- psigamma(x, 1L) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ sin(x), c("x"), hessian=FALSE) expression({ .value <- sin(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- cos(x) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ sin(x), c("x"), hessian=TRUE) expression({ .expr1 <- sin(x) .value <- .expr1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- cos(x) .hessian[, "x", "x"] <- -.expr1 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ sinh(x), c("x"), hessian=FALSE) expression({ .value <- sinh(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- cosh(x) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ sinh(x), c("x"), hessian=TRUE) expression({ .expr1 <- sinh(x) .value <- .expr1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- cosh(x) .hessian[, "x", "x"] <- .expr1 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ sqrt(x), c("x"), hessian=FALSE) expression({ .value <- sqrt(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 0.5 * x^-0.5 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ sqrt(x), c("x"), hessian=TRUE) expression({ .value <- sqrt(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 0.5 * x^-0.5 .hessian[, "x", "x"] <- 0.5 * (-0.5 * x^-1.5) attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ tan(x), c("x"), hessian=FALSE) expression({ .value <- tan(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1/cos(x)^2 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ tan(x), c("x"), hessian=TRUE) expression({ .expr2 <- cos(x) .expr3 <- .expr2^2 .value <- tan(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1/.expr3 .hessian[, "x", "x"] <- 2 * (sin(x) * .expr2)/.expr3^2 attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ tanh(x), c("x"), hessian=FALSE) expression({ .value <- tanh(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 1/cosh(x)^2 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1#Ignored.OutputFormatting# #deriv(~ tanh(x), c("x"), hessian=TRUE) expression({ .expr2 <- cosh(x) .expr3 <- .expr2^2 .value <- tanh(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 1/.expr3 .hessian[, "x", "x"] <- -(2 * (sinh(x) * .expr2)/.expr3^2) attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #deriv(~ trigamma(x), c("x"), hessian=FALSE) expression({ .value <- trigamma(x) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- psigamma(x, 2L) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ acos(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 1.570796 attr(,"gradient") x [1,] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ asin(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ asin(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ atan(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ atan(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ cos(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ cos(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 0 attr(,"hessian") , , x x [1,] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ cosh(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ cosh(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 0 attr(,"hessian") , , x x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1#Ignored.Unimplemented# #df <- deriv(~ digamma(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] NaN attr(,"gradient") x [1,] Inf Warning message: In digamma(x) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ dnorm(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0.3989423 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ exp(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ exp(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 1 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ gamma(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] NaN attr(,"gradient") x [1,] NaN Warning messages: 1: In gamma(x) : NaNs produced 2: In digamma(x) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ lgamma(x), c("x"), hessian=FALSE); x<-0.5; eval(df) [1] 0.5723649 attr(,"gradient") x [1,] -1.96351 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ log(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] -Inf attr(,"gradient") x [1,] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ log(x), c("x"), hessian=TRUE); x<--1; eval(df) [1] NaN attr(,"gradient") x [1,] -1 attr(,"hessian") , , x x [1,] -1 Warning message: In log(x) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ log(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] -Inf attr(,"gradient") x [1,] Inf attr(,"hessian") , , x x [1,] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ log(x), c("x"), hessian=TRUE); x<-1; eval(df) [1] 0 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ pnorm(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0.5 attr(,"gradient") x [1,] 0.3989423 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ pnorm(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 0.5 attr(,"gradient") x [1,] 0.3989423 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1#Ignored.Unimplemented# #df <- deriv(~ psigamma(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] NaN attr(,"gradient") x [1,] Inf Warning message: In psigamma(x) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ sin(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ sin(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ sinh(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ sinh(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ sqrt(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ sqrt(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] Inf attr(,"hessian") , , x x [1,] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ tan(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ tan(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ tanh(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ tanh(x), c("x"), hessian=TRUE); x<--1; eval(df) [1] -0.7615942 attr(,"gradient") x [1,] 0.4199743 attr(,"hessian") , , x x [1,] 0.6397 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ tanh(x), c("x"), hessian=TRUE); x<-0; eval(df) [1] 0 attr(,"gradient") x [1,] 1 attr(,"hessian") , , x x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1# #df <- deriv(~ tanh(x), c("x"), hessian=TRUE); x<-1; eval(df) [1] 0.7615942 attr(,"gradient") x [1,] 0.4199743 attr(,"hessian") , , x x [1,] -0.6397 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctions1#Ignored.Unimplemented# #df <- deriv(~ trigamma(x), c("x"), hessian=FALSE); x<-0; eval(df) [1] Inf attr(,"gradient") x [1,] NaN Warning message: In psigamma(x, 2L) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1# #deriv(~ log(2*x), c("x"), hessian=FALSE) expression({ .expr1 <- 2 * x .value <- log(.expr1) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 2/.expr1 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1#Ignored.OutputFormatting# #deriv(~ log(2*x), c("x"), hessian=TRUE) expression({ .expr1 <- 2 * x .value <- log(.expr1) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- 2/.expr1 .hessian[, "x", "x"] <- -(2 * 2/.expr1^2) attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1# #deriv(~ log(sin(2*x)), c("x"), hessian=FALSE) expression({ .expr1 <- 2 * x .expr2 <- sin(.expr1) .value <- log(.expr2) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- cos(.expr1) * 2/.expr2 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1#Output.IgnoreWhitespace# #deriv(~ log(sin(2*x)), c("x"), hessian=TRUE) expression({ .expr1 <- 2 * x .expr2 <- sin(.expr1) .expr5 <- cos(.expr1) * 2 .value <- log(.expr2) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .hessian <- array(0, c(length(.value), 1L, 1L), list(NULL, c("x"), c("x"))) .grad[, "x"] <- .expr5/.expr2 .hessian[, "x", "x"] <- -(.expr2 * 2 * 2/.expr2 + .expr5 * .expr5/.expr2^2) attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1#Output.IgnoreWhitespace# #deriv(~ log(sin(2*x)*cos(x^2)), c("x"), hessian=FALSE) expression({ .expr1 <- 2 * x .expr2 <- sin(.expr1) .expr3 <- x^2 .expr4 <- cos(.expr3) .expr5 <- .expr2 * .expr4 .value <- log(.expr5) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- (cos(.expr1) * 2 * .expr4 - .expr2 * (sin(.expr3) * .expr1))/.expr5 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1#Output.IgnoreWhitespace# #deriv(~ pnorm(sin(2*x)^log(x+1)), c("x"), hessian=FALSE) expression({ .expr1 <- 2 * x .expr2 <- sin(.expr1) .expr3 <- x + 1 .expr4 <- log(.expr3) .expr5 <- .expr2^.expr4 .value <- pnorm(.expr5) .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- dnorm(.expr5) * (.expr2^(.expr4 - 1) * (.expr4 * (cos(.expr1) * 2)) + .expr5 * (log(.expr2) * (1/.expr3))) attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1# #df <- deriv(~ log(2*x), c("x"), hessian=FALSE); x<-0; eval(df) [1] -Inf attr(,"gradient") x [1,] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1# #df <- deriv(~ log(2*x), c("x"), hessian=TRUE); x<-0; eval(df) [1] -Inf attr(,"gradient") x [1,] Inf attr(,"hessian") , , x x [1,] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1# #df <- deriv(~ log(sin(2*x)), c("x"), hessian=FALSE); x<-0; eval(df) [1] -Inf attr(,"gradient") x [1,] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1# #df <- deriv(~ log(sin(2*x)), c("x"), hessian=TRUE); x<-0; eval(df) [1] -Inf attr(,"gradient") x [1,] Inf attr(,"hessian") , , x x [1,] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1# #df <- deriv(~ log(sin(2*x)*cos(x^2)), c("x"), hessian=FALSE); x<-0; eval(df) [1] -Inf attr(,"gradient") x [1,] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testDeriveFunctionsWithCompArg1# #df <- deriv(~ pnorm(sin(2*x)^log(x+1)), c("x"), hessian=FALSE); x<-0; eval(df) [1] 0.8413447 attr(,"gradient") x [1,] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testEnvironment# #environment(deriv((y ~ sin(cos(x) * y)), c('x','y'), func = TRUE)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testEnvironment# #environment(local(deriv((y ~ sin(cos(x) * y)), c('x','y'), func = TRUE))) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testEnvironment# #environment(local(deriv((y ~ sin(cos(x) * y)), c('x','y'), func = deriv))) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testFunctionGenereration#Output.IgnoreWhitespace# #(df <- deriv(~x^2*sin(x), "x", function.arg=TRUE));df(0) function (x) { .expr1 <- x^2 .expr2 <- sin(x) .value <- .expr1 * .expr2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 2 * x * .expr2 + .expr1 * cos(x) attr(.value, "gradient") <- .grad .value } [1] 0 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testFunctionGenereration#Output.IgnoreWhitespace# #(df <- deriv(~x^2*sin(x), "x", function.arg=c("x")));df(0) function (x) { .expr1 <- x^2 .expr2 <- sin(x) .value <- .expr1 * .expr2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 2 * x * .expr2 + .expr1 * cos(x) attr(.value, "gradient") <- .grad .value } [1] 0 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testFunctionGenereration#Output.IgnoreWhitespace# #(df <- deriv(~x^2*sin(x), "x", function.arg=function(x)NULL));df(0) function (x) { .expr1 <- x^2 .expr2 <- sin(x) .value <- .expr1 * .expr2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 2 * x * .expr2 + .expr1 * cos(x) attr(.value, "gradient") <- .grad .value } [1] 0 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testFunctionGenereration#Output.IgnoreWhitespace# #(df <- deriv(~x^2*sin(x), "x", function.arg=function(x=1){}));df(0) function (x = 1) { .expr1 <- x^2 .expr2 <- sin(x) .value <- .expr1 * .expr2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 2 * x * .expr2 + .expr1 * cos(x) attr(.value, "gradient") <- .grad .value } [1] 0 attr(,"gradient") x [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testLongExpression#Output.IgnoreWhitespace# #deriv(~ (log(2*x)+sin(x))*cos(y^x*(exp(x)))*(x*y+x^y/(x+y+1)), c("x","y"), hessian=FALSE) expression({ .expr1 <- 2 * x .expr4 <- log(.expr1) + sin(x) .expr5 <- y^x .expr6 <- exp(x) .expr7 <- .expr5 * .expr6 .expr8 <- cos(.expr7) .expr9 <- .expr4 * .expr8 .expr11 <- x^y .expr13 <- x + y + 1 .expr15 <- x * y + .expr11/.expr13 .expr21 <- sin(.expr7) .expr35 <- .expr11/.expr13^2 .value <- .expr9 * .expr15 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .grad[, "x"] <- ((2/.expr1 + cos(x)) * .expr8 - .expr4 * (.expr21 * (.expr5 * log(y) * .expr6 + .expr7))) * .expr15 + .expr9 * (y + (x^(y - 1) * y/.expr13 - .expr35)) .grad[, "y"] <- .expr9 * (x + (.expr11 * log(x)/.expr13 - .expr35)) - .expr4 * (.expr21 * (y^(x - 1) * x * .expr6)) * .expr15 attr(.value, "gradient") <- .grad .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testLongExpression#Ignored.OutputFormatting# #deriv(~ (log(2*x)+sin(x))*cos(y^x*(exp(x)))*(x*y+x^y/(x+y+1)), c("x","y"), hessian=TRUE) expression({ .expr1 <- 2 * x .expr3 <- sin(x) .expr4 <- log(.expr1) + .expr3 .expr5 <- y^x .expr6 <- exp(x) .expr7 <- .expr5 * .expr6 .expr8 <- cos(.expr7) .expr9 <- .expr4 * .expr8 .expr11 <- x^y .expr13 <- x + y + 1 .expr15 <- x * y + .expr11/.expr13 .expr19 <- 2/.expr1 + cos(x) .expr21 <- sin(.expr7) .expr22 <- log(y) .expr23 <- .expr5 * .expr22 .expr24 <- .expr23 * .expr6 .expr25 <- .expr24 + .expr7 .expr26 <- .expr21 * .expr25 .expr28 <- .expr19 * .expr8 - .expr4 * .expr26 .expr30 <- y - 1 .expr31 <- x^.expr30 .expr32 <- .expr31 * y .expr34 <- .expr13^2 .expr35 <- .expr11/.expr34 .expr37 <- y + (.expr32/.expr13 - .expr35) .expr40 <- .expr28 * .expr37 .expr41 <- .expr19 * .expr26 .expr66 <- .expr32/.expr34 .expr71 <- .expr11 * (2 * .expr13)/.expr34^2 .expr77 <- log(x) .expr78 <- .expr11 * .expr77 .expr81 <- x + (.expr78/.expr13 - .expr35) .expr83 <- x - 1 .expr85 <- y^.expr83 * x .expr86 <- .expr85 * .expr6 .expr87 <- .expr21 * .expr86 .expr89 <- .expr8 * .expr86 .expr108 <- .expr78/.expr34 .expr109 <- .expr108 - .expr71 .expr113 <- .expr4 * .expr87 .expr125 <- .expr113 * .expr81 .value <- .expr9 * .expr15 .grad <- array(0, c(length(.value), 2L), list(NULL, c("x", "y"))) .hessian <- array(0, c(length(.value), 2L, 2L), list(NULL, c("x", "y"), c("x", "y"))) .grad[, "x"] <- .expr28 * .expr15 + .expr9 * .expr37 .hessian[, "x", "x"] <- .expr40 - (.expr41 + (.expr3 + 2 * 2/.expr1^2) * .expr8 + (.expr41 + .expr4 * (.expr8 * .expr25 * .expr25 + .expr21 * (.expr23 * .expr22 * .expr6 + .expr24 + .expr25)))) * .expr15 + (.expr40 + .expr9 * (x^(.expr30 - 1) * .expr30 * y/.expr13 - .expr66 - (.expr66 - .expr71))) .hessian[, "x", "y"] <- .hessian[, "y", "x"] <- .expr28 * .expr81 - (.expr19 * .expr87 + .expr4 * (.expr89 * .expr25 + .expr21 * ((.expr85 * .expr22 + .expr5 * (1/y)) * .expr6 + .expr86))) * .expr15 + (.expr9 * (1 + ((.expr31 * .expr77 * y + .expr31)/.expr13 - .expr66 - .expr109)) - .expr113 * .expr37) .grad[, "y"] <- .expr9 * .expr81 - .expr113 * .expr15 .hessian[, "y", "y"] <- .expr9 * (.expr78 * .expr77/.expr13 - .expr108 - .expr109) - .expr125 - (.expr4 * (.expr89 * .expr86 + .expr21 * (y^(.expr83 - 1) * .expr83 * x * .expr6)) * .expr15 + .expr125) attr(.value, "gradient") <- .grad attr(.value, "hessian") <- .hessian .value }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testLongExpression# #df <- deriv(~ (log(2*x)+sin(x))*cos(y^x*(exp(x)))*(x*y+x^y/(x+y+1)), c("x","y"), hessian=FALSE); x<-0; y<-0; eval(df) [1] -Inf attr(,"gradient") x y [1,] NaN NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testLongExpression# #df <- deriv(~ (log(2*x)+sin(x))*cos(y^x*(exp(x)))*(x*y+x^y/(x+y+1)), c("x","y"), hessian=TRUE); x<-0; y<-0; eval(df) [1] -Inf attr(,"gradient") x y [1,] NaN NaN attr(,"hessian") , , x x y [1,] NaN NaN , , y x y [1,] NaN NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testUnusualExprs# #(df <- deriv(1, "x"));df(0) expression({ .value <- 1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 0 attr(.value, "gradient") <- .grad .value }) Error in df(0) : argument "df1" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testUnusualExprs# #(df <- deriv(expression(x^2*sin(x)), "x"));df(0) expression({ .expr1 <- x^2 .expr2 <- sin(x) .value <- .expr1 * .expr2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 2 * x * .expr2 + .expr1 * cos(x) attr(.value, "gradient") <- .grad .value }) Error in df(0) : argument "df1" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testUnusualExprs# #(df <- deriv(quote(x^2*sin(x)), "x"));df(0) expression({ .expr1 <- x^2 .expr2 <- sin(x) .value <- .expr1 * .expr2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 2 * x * .expr2 + .expr1 * cos(x) attr(.value, "gradient") <- .grad .value }) Error in df(0) : argument "df1" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testUnusualExprs# #g<-quote(x^2);(df <- deriv(g, "x"));df(0) expression({ .value <- x^2 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 2 * x attr(.value, "gradient") <- .grad .value }) Error in df(0) : argument "df1" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_deriv.testUnusualExprs# #x<-1;(df <- deriv(x, "x"));df(0) expression({ .value <- 1 .grad <- array(0, c(length(.value), 1L), list(NULL, c("x"))) .grad[, "x"] <- 0 attr(.value, "gradient") <- .grad .value }) Error in df(0) : argument "df1" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_det.testDet# #{ det(matrix(c(1,-3,4,-5),nrow=2)) } [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_det.testDet# #{ det(matrix(c(1,0,4,NA),nrow=2)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_det.testDet# #{ det(matrix(c(1,2,4,5),nrow=2)) } [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_det.testdet1# #argv <- list(structure(c(FALSE, TRUE, TRUE, FALSE), .Dim = c(2L, 2L), .Dimnames = list(c('A', 'B'), c('A', 'B'))), TRUE); .Internal(det_ge_real(argv[[1]], argv[[2]])) $modulus [1] 0 attr(,"logarithm") [1] TRUE $sign [1] -1 attr(,"class") [1] "det" ##com.oracle.truffle.r.test.builtins.TestBuiltin_det.testdet2# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE), .Dim = c(2L, 2L), .Dimnames = list(c('A', 'B'), c('A', 'B'))), TRUE); .Internal(det_ge_real(argv[[1]], argv[[2]])) $modulus [1] -Inf attr(,"logarithm") [1] TRUE $sign [1] 1 attr(,"class") [1] "det" ##com.oracle.truffle.r.test.builtins.TestBuiltin_det.testdet3# #argv <- list(structure(c(2, 1, 1, 2), .Dim = c(2L, 2L), .Dimnames = list(c('A', 'B'), c('A', 'B'))), TRUE); .Internal(det_ge_real(argv[[1]], argv[[2]])) $modulus [1] 1.098612 attr(,"logarithm") [1] TRUE $sign [1] 1 attr(,"class") [1] "det" ##com.oracle.truffle.r.test.builtins.TestBuiltin_det.testdet5# #argv <- structure(list(x = structure(c(0, 0, 0, 0, 0, 0, NA, 0, 0, NA, NA, 0, 0, 0, 0, 1), .Dim = c(4L, 4L))), .Names = 'x');do.call('det', argv) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_devcur.simpleTests#Ignored.NativeGridGraphics# #{ .Devices <- list(); dev.cur(); } null device 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_devcur.simpleTests# #{ dev.cur() } null device 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_devset.validationTest#Ignored.NativeGridGraphics# #{ dev.set(-100L) } null device 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_devset.validationTest#Ignored.NativeGridGraphics# #{ dev.set(100L) } null device 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn1# #argv <- list('f is deprecated.\nUse convertY instead.\nSee help(Deprecated)', NULL); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: f is deprecated. Use convertY instead. See help(Deprecated) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn10# #argv <- list('x is neither a vector nor a matrix: using as.numeric(x)', quote(dotchart(table(infert$education)))); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: In dotchart(table(infert$education)) : x is neither a vector nor a matrix: using as.numeric(x) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn11# #argv <- list('Invalid file name(s) for R code in ./myTst/R:\n file55711ba85492\n are now renamed to z.R', quote(package.skeleton('myTst', code_files = tmp))); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: In package.skeleton("myTst", code_files = tmp) : Invalid file name(s) for R code in ./myTst/R: file55711ba85492 are now renamed to z.R ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn12# #argv <- list('incomplete final line found by readTableHeader on foo4', quote(read.table('foo4', header = TRUE))); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: In read.table("foo4", header = TRUE) : incomplete final line found by readTableHeader on foo4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn2# #argv <- list('bessel_y(2,nu=288.12): precision lost in result', quote(besselY(2, nu = nu <- seq(3, 300, len = 51)))); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: In besselY(2, nu = nu <- seq(3, 300, len = 51)) : bessel_y(2,nu=288.12): precision lost in result ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn3# #argv <- list('glm.fit: algorithm stopped at boundary value', NULL); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: glm.fit: algorithm stopped at boundary value ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn4# #argv <- list('header and col.names are of different lengths', quote(read.table('foo3', header = TRUE, col.names = letters[1:4]))); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: In read.table("foo3", header = TRUE, col.names = letters[1:4]) : header and col.names are of different lengths ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn5# #argv <- list('‘graphics’ namespace cannot be unloaded:\n namespace ‘graphics’ is imported by ‘stats’ so cannot be unloaded', NULL); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: ‘graphics’ namespace cannot be unloaded: namespace ‘graphics’ is imported by ‘stats’ so cannot be unloaded ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn6# #argv <- list('NaNs produced', quote(log(ifelse(y == 0, 1, y/mu)))); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: In log(ifelse(y == 0, 1, y/mu)) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn7# #argv <- list('drop argument will be ignored', quote(`[.data.frame`(women, 'height', drop = FALSE))); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: In `[.data.frame`(women, "height", drop = FALSE) : drop argument will be ignored ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn8#Output.IgnoreWarningContext# #argv <- list('prediction from a rank-deficient fit may be misleading', quote(predict.lm(object, newdata, se.fit, scale = residual.scale, type = ifelse(type == 'link', 'response', type), terms = terms, na.action = na.action))); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: In predict.lm(object, newdata, se.fit, scale = residual.scale, type = ifelse(type == : prediction from a rank-deficient fit may be misleading ##com.oracle.truffle.r.test.builtins.TestBuiltin_dfltWarn.testdfltWarn9# #argv <- list('1 y value <= 0 omitted from logarithmic plot', quote(xy.coords(x, NULL, log = log))); .Internal(.dfltWarn(argv[[1]], argv[[2]])) NULL Warning message: In xy.coords(x, NULL, log = log) : 1 y value <= 0 omitted from logarithmic plot ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testDiagonal# #{ diag('a', 3, 4) } [,1] [,2] [,3] [,4] [1,] NA 0 0 0 [2,] 0 NA 0 0 [3,] 0 0 NA 0 Warning message: In diag("a", 3, 4) : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testDiagonal# #{ diag(1, 2, 7) } [,1] [,2] [,3] [,4] [,5] [,6] [,7] [1,] 1 0 0 0 0 0 0 [2,] 0 1 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testDiagonal# #{ diag(1, 7) } [,1] [,2] [,3] [,4] [,5] [,6] [,7] [1,] 1 0 0 0 0 0 0 [2,] 0 1 0 0 0 0 0 [3,] 0 0 1 0 0 0 0 [4,] 0 0 0 1 0 0 0 [5,] 0 0 0 0 1 0 0 [6,] 0 0 0 0 0 1 0 [7,] 0 0 0 0 0 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testDiagonal# #{ diag(1, 7, 2) } [,1] [,2] [1,] 1 0 [2,] 0 1 [3,] 0 0 [4,] 0 0 [5,] 0 0 [6,] 0 0 [7,] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testDiagonal# #{ diag(c('a','b','c'), 3, 4) } [,1] [,2] [,3] [,4] [1,] NA 0 0 0 [2,] 0 NA 0 0 [3,] 0 0 NA 0 Warning message: In diag(c("a", "b", "c"), 3, 4) : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testDiagonal# #{ m <- matrix(1:6, nrow=2) ; diag(m) } [1] 1 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testDiagonal# #{ m <- matrix(1:6, nrow=3) ; diag(m) } [1] 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testDiagonal# #{ m <- matrix(1:9, nrow=3) ; diag(m) } [1] 1 5 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag1# #argv <- list(structure(c(1L, 2L, 3L, 4L, 1L), .Dim = 5L), 5L, 5L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [1,] 1 0 0 0 0 [2,] 0 2 0 0 0 [3,] 0 0 3 0 0 [4,] 0 0 0 4 0 [5,] 0 0 0 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag10# #argv <- list(structure(c(-268.831499270454, 5.6415423423032, 14.3443760756611, -6.07661158322081, -7.61383061715105, 3.28804653251744, 13.7579673886322, 2.89856286229343, -9.75713414208632, 4.61320568224165), .Names = c('(Intercept)', 'block2', 'block3', 'block4', 'block5', 'block6', 'N1', 'P1', 'K1', 'N1:P1')), 24L, 10L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [1,] -268.8315 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [2,] 0.0000 5.641542 0.00000 0.000000 0.000000 0.000000 0.00000 [3,] 0.0000 0.000000 14.34438 0.000000 0.000000 0.000000 0.00000 [4,] 0.0000 0.000000 0.00000 -6.076612 0.000000 0.000000 0.00000 [5,] 0.0000 0.000000 0.00000 0.000000 -7.613831 0.000000 0.00000 [6,] 0.0000 0.000000 0.00000 0.000000 0.000000 3.288047 0.00000 [7,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 13.75797 [8,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [9,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [10,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [11,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [12,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [13,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [14,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [15,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [16,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [17,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [18,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [19,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [20,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [21,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [22,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [23,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [24,] 0.0000 0.000000 0.00000 0.000000 0.000000 0.000000 0.00000 [,8] [,9] [,10] [1,] 0.000000 0.000000 0.000000 [2,] 0.000000 0.000000 0.000000 [3,] 0.000000 0.000000 0.000000 [4,] 0.000000 0.000000 0.000000 [5,] 0.000000 0.000000 0.000000 [6,] 0.000000 0.000000 0.000000 [7,] 0.000000 0.000000 0.000000 [8,] 2.898563 0.000000 0.000000 [9,] 0.000000 -9.757134 0.000000 [10,] 0.000000 0.000000 4.613206 [11,] 0.000000 0.000000 0.000000 [12,] 0.000000 0.000000 0.000000 [13,] 0.000000 0.000000 0.000000 [14,] 0.000000 0.000000 0.000000 [15,] 0.000000 0.000000 0.000000 [16,] 0.000000 0.000000 0.000000 [17,] 0.000000 0.000000 0.000000 [18,] 0.000000 0.000000 0.000000 [19,] 0.000000 0.000000 0.000000 [20,] 0.000000 0.000000 0.000000 [21,] 0.000000 0.000000 0.000000 [22,] 0.000000 0.000000 0.000000 [23,] 0.000000 0.000000 0.000000 [24,] 0.000000 0.000000 0.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag11# #argv <- list(structure(c(0.00284900284900285, 0.00284900284900285, 0.00284900284900285, 0.00284900284900285, 0.00284900284900285, 0.00284900284900285, 0.00284900284900285, 0.00284900284900285, 0.00284900284900285, 0.00284900284900285), .Dim = 10L, .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10'))), 10L, 10L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [1,] 0.002849003 0.000000000 0.000000000 0.000000000 0.000000000 0.000000000 [2,] 0.000000000 0.002849003 0.000000000 0.000000000 0.000000000 0.000000000 [3,] 0.000000000 0.000000000 0.002849003 0.000000000 0.000000000 0.000000000 [4,] 0.000000000 0.000000000 0.000000000 0.002849003 0.000000000 0.000000000 [5,] 0.000000000 0.000000000 0.000000000 0.000000000 0.002849003 0.000000000 [6,] 0.000000000 0.000000000 0.000000000 0.000000000 0.000000000 0.002849003 [7,] 0.000000000 0.000000000 0.000000000 0.000000000 0.000000000 0.000000000 [8,] 0.000000000 0.000000000 0.000000000 0.000000000 0.000000000 0.000000000 [9,] 0.000000000 0.000000000 0.000000000 0.000000000 0.000000000 0.000000000 [10,] 0.000000000 0.000000000 0.000000000 0.000000000 0.000000000 0.000000000 [,7] [,8] [,9] [,10] [1,] 0.000000000 0.000000000 0.000000000 0.000000000 [2,] 0.000000000 0.000000000 0.000000000 0.000000000 [3,] 0.000000000 0.000000000 0.000000000 0.000000000 [4,] 0.000000000 0.000000000 0.000000000 0.000000000 [5,] 0.000000000 0.000000000 0.000000000 0.000000000 [6,] 0.000000000 0.000000000 0.000000000 0.000000000 [7,] 0.002849003 0.000000000 0.000000000 0.000000000 [8,] 0.000000000 0.002849003 0.000000000 0.000000000 [9,] 0.000000000 0.000000000 0.002849003 0.000000000 [10,] 0.000000000 0.000000000 0.000000000 0.002849003 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag12# #argv <- list(list(1, 1, 1), 3L, 3L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [1,] 1 0 0 [2,] 0 1 0 [3,] 0 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag13# #argv <- list(list(), 0L, 0L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag14# #argv <- list(character(0), 0L, 0L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag16# #argv <- structure(list(x = structure(c(25707905.8534307, -1396341.94003231, 107590.673887047, 1282255.68405509, 990152.618275206, -1396341.94003231, 23207928.6679172, -602948.854263649, -750498.277752946, -97557.914173682, 107590.673887047, -602948.854263649, 25224155.0868383, -1446668.75346658, 3085225.85187065, 1282255.68405509, -750498.277752946, -1446668.75346658, 22221045.9258222, -1069907.07413189, 990152.618275206, -97557.914173682, 3085225.85187065, -1069907.07413189, 27302989.4318488), .Dim = c(5L, 5L))), .Names = 'x');do.call('diag', argv) [1] 25707906 23207929 25224155 22221046 27302989 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag2# #argv <- list(NULL, 0L, 0L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag3# #argv <- list(structure(c(0.00258017518312032, 0.00371592854270272, 4.74358130918145e-05, 0.00490111130607204, 0.000101990092933588, 0.00674107947251412, 0.000239828967315095, 0.00980847069198632, 0.000617541923597065, 0.0155189333862593, 0.00178497855501229, 0.0281274123275302, 0.00633033372222146, 0.0642581517771313, 0.0351608933185668, 0.151097171670205, 0.967636582993474, 0.0809667077153405), .Names = c('Xr1', 'Xr2', 'Xr3', 'Xr4', 'Xr5', 'Xr6', 'Xr7', 'Xr8', 'Xr9', 'Xr10', 'Xr11', 'Xr12', 'Xr13', 'Xr14', 'Xr15', 'Xr16', 'Xr17', 'Xr18')), 18L, 18L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [1,] 0.002580175 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [2,] 0.000000000 0.003715929 0.000000e+00 0.000000000 0.0000000000 0.000000000 [3,] 0.000000000 0.000000000 4.743581e-05 0.000000000 0.0000000000 0.000000000 [4,] 0.000000000 0.000000000 0.000000e+00 0.004901111 0.0000000000 0.000000000 [5,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0001019901 0.000000000 [6,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.006741079 [7,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [8,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [9,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [10,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [11,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [12,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [13,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [14,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [15,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [16,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [17,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [18,] 0.000000000 0.000000000 0.000000e+00 0.000000000 0.0000000000 0.000000000 [,7] [,8] [,9] [,10] [,11] [,12] [1,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [2,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [3,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [4,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [5,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [6,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [7,] 0.000239829 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [8,] 0.000000000 0.009808471 0.0000000000 0.00000000 0.000000000 0.00000000 [9,] 0.000000000 0.000000000 0.0006175419 0.00000000 0.000000000 0.00000000 [10,] 0.000000000 0.000000000 0.0000000000 0.01551893 0.000000000 0.00000000 [11,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.001784979 0.00000000 [12,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.02812741 [13,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [14,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [15,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [16,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [17,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [18,] 0.000000000 0.000000000 0.0000000000 0.00000000 0.000000000 0.00000000 [,13] [,14] [,15] [,16] [,17] [,18] [1,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [2,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [3,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [4,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [5,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [6,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [7,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [8,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [9,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [10,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [11,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [12,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [13,] 0.006330334 0.00000000 0.00000000 0.0000000 0.0000000 0.00000000 [14,] 0.000000000 0.06425815 0.00000000 0.0000000 0.0000000 0.00000000 [15,] 0.000000000 0.00000000 0.03516089 0.0000000 0.0000000 0.00000000 [16,] 0.000000000 0.00000000 0.00000000 0.1510972 0.0000000 0.00000000 [17,] 0.000000000 0.00000000 0.00000000 0.0000000 0.9676366 0.00000000 [18,] 0.000000000 0.00000000 0.00000000 0.0000000 0.0000000 0.08096671 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag4# #argv <- list(c(FALSE, TRUE, TRUE, TRUE), 4L, 4L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [1,] FALSE FALSE FALSE FALSE [2,] FALSE TRUE FALSE FALSE [3,] FALSE FALSE TRUE FALSE [4,] FALSE FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag5# #argv <- list(c(-2.80063713410797-0i, 2.40432724210166-0i, -1.40502612938985+0i, 1.39344241164891+0i, 0.785422253492721+0i), 5L, 5L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [1,] -2.800637+0i 0.000000+0i 0.000000+0i 0.000000+0i 0.0000000+0i [2,] 0.000000+0i 2.404327+0i 0.000000+0i 0.000000+0i 0.0000000+0i [3,] 0.000000+0i 0.000000+0i -1.405026+0i 0.000000+0i 0.0000000+0i [4,] 0.000000+0i 0.000000+0i 0.000000+0i 1.393442+0i 0.0000000+0i [5,] 0.000000+0i 0.000000+0i 0.000000+0i 0.000000+0i 0.7854223+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag6# #argv <- list(structure(c(0.662193594830517, 0.883082096514931, 0.80211645621425, 0.806993241239092, 0.593615611337433, 0.55837479933202, 0.531727869384763, 0.696607367099979, 0.506321785494117, 0.489681023915914, 0.742249020738322, 0.65965217395585, 0.700437655250271, 0.80388520340336, 0.834325796707322, 0.741083805719802, 0.77320911661894, 0.76968452857621, 0.872531808824412, 0.769100148773066, 0.763385216756006, 0.775173380089108, 0.705125971098107, 0.706916424657676), .Names = c('VisualPerception', 'Cubes', 'PaperFormBoard', 'Flags', 'GeneralInformation', 'PargraphComprehension', 'SentenceCompletion', 'WordClassification', 'WordMeaning', 'Addition', 'Code', 'CountingDots', 'StraightCurvedCapitals', 'WordRecognition', 'NumberRecognition', 'FigureRecognition', 'ObjectNumber', 'NumberFigure', 'FigureWord', 'Deduction', 'NumericalPuzzles', 'ProblemReasoning', 'SeriesCompletion', 'ArithmeticProblems')), 24L, 24L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [1,] 0.6621936 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [2,] 0.0000000 0.8830821 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [3,] 0.0000000 0.0000000 0.8021165 0.0000000 0.0000000 0.0000000 0.0000000 [4,] 0.0000000 0.0000000 0.0000000 0.8069932 0.0000000 0.0000000 0.0000000 [5,] 0.0000000 0.0000000 0.0000000 0.0000000 0.5936156 0.0000000 0.0000000 [6,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.5583748 0.0000000 [7,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.5317279 [8,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [9,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [10,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [11,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [12,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [13,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [14,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [15,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [16,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [17,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [18,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [19,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [20,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [21,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [22,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [23,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [24,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [,8] [,9] [,10] [,11] [,12] [,13] [,14] [1,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [2,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [3,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [4,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [5,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [6,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [7,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [8,] 0.6966074 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [9,] 0.0000000 0.5063218 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [10,] 0.0000000 0.0000000 0.489681 0.000000 0.0000000 0.0000000 0.0000000 [11,] 0.0000000 0.0000000 0.000000 0.742249 0.0000000 0.0000000 0.0000000 [12,] 0.0000000 0.0000000 0.000000 0.000000 0.6596522 0.0000000 0.0000000 [13,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.7004377 0.0000000 [14,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.8038852 [15,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [16,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [17,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [18,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [19,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [20,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [21,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [22,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [23,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [24,] 0.0000000 0.0000000 0.000000 0.000000 0.0000000 0.0000000 0.0000000 [,15] [,16] [,17] [,18] [,19] [,20] [,21] [1,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [2,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [3,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [4,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [5,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [6,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [7,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [8,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [9,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [10,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [11,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [12,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [13,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [14,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [15,] 0.8343258 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [16,] 0.0000000 0.7410838 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [17,] 0.0000000 0.0000000 0.7732091 0.0000000 0.0000000 0.0000000 0.0000000 [18,] 0.0000000 0.0000000 0.0000000 0.7696845 0.0000000 0.0000000 0.0000000 [19,] 0.0000000 0.0000000 0.0000000 0.0000000 0.8725318 0.0000000 0.0000000 [20,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.7691001 0.0000000 [21,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.7633852 [22,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [23,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [24,] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [,22] [,23] [,24] [1,] 0.0000000 0.000000 0.0000000 [2,] 0.0000000 0.000000 0.0000000 [3,] 0.0000000 0.000000 0.0000000 [4,] 0.0000000 0.000000 0.0000000 [5,] 0.0000000 0.000000 0.0000000 [6,] 0.0000000 0.000000 0.0000000 [7,] 0.0000000 0.000000 0.0000000 [8,] 0.0000000 0.000000 0.0000000 [9,] 0.0000000 0.000000 0.0000000 [10,] 0.0000000 0.000000 0.0000000 [11,] 0.0000000 0.000000 0.0000000 [12,] 0.0000000 0.000000 0.0000000 [13,] 0.0000000 0.000000 0.0000000 [14,] 0.0000000 0.000000 0.0000000 [15,] 0.0000000 0.000000 0.0000000 [16,] 0.0000000 0.000000 0.0000000 [17,] 0.0000000 0.000000 0.0000000 [18,] 0.0000000 0.000000 0.0000000 [19,] 0.0000000 0.000000 0.0000000 [20,] 0.0000000 0.000000 0.0000000 [21,] 0.0000000 0.000000 0.0000000 [22,] 0.7751734 0.000000 0.0000000 [23,] 0.0000000 0.705126 0.0000000 [24,] 0.0000000 0.000000 0.7069164 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag7# #argv <- list(1, 0L, 0L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag8# #argv <- list(structure(c(0.553622032575332, 1.83583330034692, 0.540309168173204, 0.347171956892285), .Names = c('A', 'B', 'C', 'D')), 4L, 4L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [1,] 0.553622 0.000000 0.0000000 0.000000 [2,] 0.000000 1.835833 0.0000000 0.000000 [3,] 0.000000 0.000000 0.5403092 0.000000 [4,] 0.000000 0.000000 0.0000000 0.347172 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diag.testdiag9# #argv <- list(structure(c(-875.251472917967, 12.8319913648351, -28.2155558559225, -27.6015982680416, -70.4377976184188, -98.9293825275015, 32.8291346503008, -20.6544753576079, 26.3486263439148, -42.5376299218819, -131.164911564755, -12.7775395276621, 3.34207338870892, -6.39516049903921, 5.97199502480298, 9.16451921253422, 4.70193189358059), .Names = c('(Intercept)', 'BII', 'BIII', 'BIV', 'BV', 'BVI', 'VMarvellous', 'VVictory', 'N0.2cwt', 'N0.4cwt', 'N0.6cwt', 'VMarvellous:N0.2cwt', 'VVictory:N0.2cwt', 'VMarvellous:N0.4cwt', 'VVictory:N0.4cwt', 'VMarvellous:N0.6cwt', 'VVictory:N0.6cwt')), 71L, 17L); .Internal(diag(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [1,] -875.2515 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [2,] 0.0000 12.83199 0.00000 0.0000 0.0000 0.00000 0.00000 [3,] 0.0000 0.00000 -28.21556 0.0000 0.0000 0.00000 0.00000 [4,] 0.0000 0.00000 0.00000 -27.6016 0.0000 0.00000 0.00000 [5,] 0.0000 0.00000 0.00000 0.0000 -70.4378 0.00000 0.00000 [6,] 0.0000 0.00000 0.00000 0.0000 0.0000 -98.92938 0.00000 [7,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 32.82913 [8,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [9,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [10,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [11,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [12,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [13,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [14,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [15,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [16,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [17,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [18,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [19,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [20,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [21,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [22,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [23,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [24,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [25,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [26,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [27,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [28,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [29,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [30,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [31,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [32,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [33,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [34,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [35,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [36,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [37,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [38,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [39,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [40,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [41,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [42,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [43,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [44,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [45,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [46,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [47,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [48,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [49,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [50,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [51,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [52,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [53,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [54,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [55,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [56,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [57,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [58,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [59,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [60,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [61,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [62,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [63,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [64,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [65,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [66,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [67,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [68,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [69,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [70,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [71,] 0.0000 0.00000 0.00000 0.0000 0.0000 0.00000 0.00000 [,8] [,9] [,10] [,11] [,12] [,13] [,14] [1,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [2,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [3,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [4,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [5,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [6,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [7,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [8,] -20.65448 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [9,] 0.00000 26.34863 0.00000 0.0000 0.00000 0.000000 0.00000 [10,] 0.00000 0.00000 -42.53763 0.0000 0.00000 0.000000 0.00000 [11,] 0.00000 0.00000 0.00000 -131.1649 0.00000 0.000000 0.00000 [12,] 0.00000 0.00000 0.00000 0.0000 -12.77754 0.000000 0.00000 [13,] 0.00000 0.00000 0.00000 0.0000 0.00000 3.342073 0.00000 [14,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 -6.39516 [15,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [16,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [17,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [18,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [19,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [20,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [21,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [22,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [23,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [24,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [25,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [26,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [27,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [28,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [29,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [30,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [31,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [32,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [33,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [34,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [35,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [36,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [37,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [38,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [39,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [40,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [41,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [42,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [43,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [44,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [45,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [46,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [47,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [48,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [49,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [50,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [51,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [52,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [53,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [54,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [55,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [56,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [57,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [58,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [59,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [60,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [61,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [62,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [63,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [64,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [65,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [66,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [67,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [68,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [69,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [70,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [71,] 0.00000 0.00000 0.00000 0.0000 0.00000 0.000000 0.00000 [,15] [,16] [,17] [1,] 0.000000 0.000000 0.000000 [2,] 0.000000 0.000000 0.000000 [3,] 0.000000 0.000000 0.000000 [4,] 0.000000 0.000000 0.000000 [5,] 0.000000 0.000000 0.000000 [6,] 0.000000 0.000000 0.000000 [7,] 0.000000 0.000000 0.000000 [8,] 0.000000 0.000000 0.000000 [9,] 0.000000 0.000000 0.000000 [10,] 0.000000 0.000000 0.000000 [11,] 0.000000 0.000000 0.000000 [12,] 0.000000 0.000000 0.000000 [13,] 0.000000 0.000000 0.000000 [14,] 0.000000 0.000000 0.000000 [15,] 5.971995 0.000000 0.000000 [16,] 0.000000 9.164519 0.000000 [17,] 0.000000 0.000000 4.701932 [18,] 0.000000 0.000000 0.000000 [19,] 0.000000 0.000000 0.000000 [20,] 0.000000 0.000000 0.000000 [21,] 0.000000 0.000000 0.000000 [22,] 0.000000 0.000000 0.000000 [23,] 0.000000 0.000000 0.000000 [24,] 0.000000 0.000000 0.000000 [25,] 0.000000 0.000000 0.000000 [26,] 0.000000 0.000000 0.000000 [27,] 0.000000 0.000000 0.000000 [28,] 0.000000 0.000000 0.000000 [29,] 0.000000 0.000000 0.000000 [30,] 0.000000 0.000000 0.000000 [31,] 0.000000 0.000000 0.000000 [32,] 0.000000 0.000000 0.000000 [33,] 0.000000 0.000000 0.000000 [34,] 0.000000 0.000000 0.000000 [35,] 0.000000 0.000000 0.000000 [36,] 0.000000 0.000000 0.000000 [37,] 0.000000 0.000000 0.000000 [38,] 0.000000 0.000000 0.000000 [39,] 0.000000 0.000000 0.000000 [40,] 0.000000 0.000000 0.000000 [41,] 0.000000 0.000000 0.000000 [42,] 0.000000 0.000000 0.000000 [43,] 0.000000 0.000000 0.000000 [44,] 0.000000 0.000000 0.000000 [45,] 0.000000 0.000000 0.000000 [46,] 0.000000 0.000000 0.000000 [47,] 0.000000 0.000000 0.000000 [48,] 0.000000 0.000000 0.000000 [49,] 0.000000 0.000000 0.000000 [50,] 0.000000 0.000000 0.000000 [51,] 0.000000 0.000000 0.000000 [52,] 0.000000 0.000000 0.000000 [53,] 0.000000 0.000000 0.000000 [54,] 0.000000 0.000000 0.000000 [55,] 0.000000 0.000000 0.000000 [56,] 0.000000 0.000000 0.000000 [57,] 0.000000 0.000000 0.000000 [58,] 0.000000 0.000000 0.000000 [59,] 0.000000 0.000000 0.000000 [60,] 0.000000 0.000000 0.000000 [61,] 0.000000 0.000000 0.000000 [62,] 0.000000 0.000000 0.000000 [63,] 0.000000 0.000000 0.000000 [64,] 0.000000 0.000000 0.000000 [65,] 0.000000 0.000000 0.000000 [66,] 0.000000 0.000000 0.000000 [67,] 0.000000 0.000000 0.000000 [68,] 0.000000 0.000000 0.000000 [69,] 0.000000 0.000000 0.000000 [70,] 0.000000 0.000000 0.000000 [71,] 0.000000 0.000000 0.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testUpdateDiagonal# #{ m <- matrix(1:6, nrow=3) ; attr(m, "foo")<-"foo"; diag(m) <- c(1,2); attributes(m) } $dim [1] 3 2 $foo [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testUpdateDiagonal# #{ m <- matrix(1:6, nrow=3) ; attr(m, "foo")<-"foo"; diag(m) <- c(1.1,2.2); attributes(m) } $dim [1] 3 2 $foo [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testUpdateDiagonal# #{ m <- matrix(1:6, nrow=3) ; diag(m) <- c(1,2) ; m } [,1] [,2] [1,] 1 4 [2,] 2 2 [3,] 3 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testUpdateDiagonal# #{ m <- matrix(1:6, nrow=3) ; diag(m) <- c(1,2.2); m } [,1] [,2] [1,] 1 4.0 [2,] 2 2.2 [3,] 3 6.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testUpdateDiagonal# #{ m <- matrix(1:6, nrow=3) ; diag(m) <- c(1.1,2); m } [,1] [,2] [1,] 1.1 4 [2,] 2.0 2 [3,] 3.0 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testUpdateDiagonal# #{ m <- matrix(1:6, nrow=3) ; diag(m) <- c(1.1,2.2); m } [,1] [,2] [1,] 1.1 4.0 [2,] 2.0 2.2 [3,] 3.0 6.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testUpdateDiagonal# #{ m <- matrix(1:6, nrow=3) ; f <- function() { diag(m) <- c(100,200) } ; f() ; m } [,1] [,2] [1,] 1 4 [2,] 2 5 [3,] 3 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testUpdateDiagonal# #{ m <- matrix(1:6, nrow=3); y<-m+42; diag(y) <- c(1,2); y } [,1] [,2] [1,] 1 46 [2,] 44 2 [3,] 45 48 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testUpdateDiagonal# #{ x <- (m <- matrix(1:6, nrow=3)) ; diag(m) <- c(1,2) ; x } [,1] [,2] [1,] 1 4 [2,] 2 5 [3,] 3 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testdiagassign_1# #argv <- structure(list(x = structure(numeric(0), .Dim = c(0L, 4L)), value = numeric(0)), .Names = c('x', 'value'));do.call('diag<-', argv) [,1] [,2] [,3] [,4] ##com.oracle.truffle.r.test.builtins.TestBuiltin_diagassign_.testdiagassign_3# #argv <- structure(list(x = structure(c(0, 0, 0, 0, 0, 0, 0.215098376664487, 0, 0, 0, -1.65637081299852, 0, 0, 0, 0, 0, -0.414332953459613, 0, 0, -1.40806198482254, 0, 0, 0, 0, 0, 0, 0, 0, -0.856525152312943, 0, 0, 0, 0, 0, 0, 0, 0, -0.0763379828255197, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0.566886579526715, 0, 0, 0, 0, 0, 0.6662762965807, -1.0108032000459, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.27827012429586, 0, 0, 0, 0, 0, 2.58429591514953, 0, 0, 2.11417636787577, -0.433540727336897, 0, -1.2168073873217, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.739899226286947, 0, 1.63831140634344, 0.940796284653334, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.27827012429586, 0, 0, 0, -1.53221105110478, 0, 0.0842634801991399, 0, 0, 0, 0, 0, 0, 0, 0.46436714586526, 0, 0, 0.215098376664487, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.20702771149749, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.53221105110478, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0.797128455296496, 0, 0, -0.856525152312943, 0.566886579526715, 0, -0.739899226286947, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.53717285365944, 0, 0, -1.78309634885893, 0, 0, 0, 0, 0, 0.0842634801991399, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0.0654058852501743, 0, 0, 0, -1.65637081299852, 0, 0, 0, 1.63831140634344, 0, 0, 0, 0, 0, 0, -0.211859819992765, 1.70777682244235, 0, 0, 0.899304333370124, 0, 0, 0.696790958441438, 0, 0, 0, 0, 2.58429591514953, 0.940796284653334, 0, 0, 0, 0, 0, -0.211859819992765, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.70777682244235, 0, 0, 0, 0, 0, 0, 2.70925832108517, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.218019634714546, 0, 0, 0.6662762965807, 2.11417636787577, 0, 0, 1.20702771149749, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.431663950618028, 0, 0, 0, -1.0108032000459, -0.433540727336897, 0, 0, 0, 0, 0, 0, 0.899304333370124, 0, 0, 0, 0, 0, 1.84823959064644, 0, 0, 0, -0.414332953459613, 0, 0, 0, 0, 0, 0, 0, -0.53717285365944, 0.0654058852501743, 0, 0, 0, 0, 0, 1.84823959064644, 0.487718131057368, 0, 0, 0, 0, -0.0763379828255197, 0, -1.2168073873217, 0, 0.46436714586526, 0, 0, 0, 0, 0, 0, 2.70925832108517, 0, 0, 0, 0, 0, 0, 0.89955019874646, 0, 0, 0, 0, 0, 0, 0, 0.797128455296496, 0, 0, 0.696790958441438, 0, 0, 0, -0.431663950618028, 0, 0, 0, 0, 0, -1.40806198482254, 0, 0, 0, 0, 0, 0, 0, -1.78309634885893, 0, 0, 0, 0, -0.218019634714546, 0, 0, 0, 0.89955019874646, 0, 0), .Dim = c(20L, 20L)), value = 1), .Names = c('x', 'value'));do.call('diag<-', argv) [,1] [,2] [,3] [,4] [,5] [,6] [1,] 1.0000000 0.00000000 0.0000000 0.0000000 0.0000000 0.00000000 [2,] 0.0000000 1.00000000 0.0000000 0.0000000 0.0000000 0.00000000 [3,] 0.0000000 0.00000000 1.0000000 0.0000000 0.0000000 0.00000000 [4,] 0.0000000 0.00000000 0.0000000 1.0000000 0.0000000 -1.27827012 [5,] 0.0000000 0.00000000 0.0000000 0.0000000 1.0000000 0.00000000 [6,] 0.0000000 0.00000000 0.0000000 -1.2782701 0.0000000 1.00000000 [7,] 0.2150984 0.00000000 0.0000000 0.0000000 0.0000000 0.00000000 [8,] 0.0000000 0.00000000 0.0000000 0.0000000 0.0000000 -1.53221105 [9,] 0.0000000 -0.85652515 0.5668866 0.0000000 -0.7398992 0.00000000 [10,] 0.0000000 0.00000000 0.0000000 0.0000000 0.0000000 0.08426348 [11,] -1.6563708 0.00000000 0.0000000 0.0000000 1.6383114 0.00000000 [12,] 0.0000000 0.00000000 0.0000000 2.5842959 0.9407963 0.00000000 [13,] 0.0000000 0.00000000 0.0000000 0.0000000 0.0000000 0.00000000 [14,] 0.0000000 0.00000000 0.0000000 0.0000000 0.0000000 0.00000000 [15,] 0.0000000 0.00000000 0.6662763 2.1141764 0.0000000 0.00000000 [16,] 0.0000000 0.00000000 -1.0108032 -0.4335407 0.0000000 0.00000000 [17,] -0.4143330 0.00000000 0.0000000 0.0000000 0.0000000 0.00000000 [18,] 0.0000000 -0.07633798 0.0000000 -1.2168074 0.0000000 0.46436715 [19,] 0.0000000 0.00000000 0.0000000 0.0000000 0.0000000 0.00000000 [20,] -1.4080620 0.00000000 0.0000000 0.0000000 0.0000000 0.00000000 [,7] [,8] [,9] [,10] [,11] [,12] [,13] [1,] 0.2150984 0.0000000 0.0000000 0.00000000 -1.6563708 0.0000000 0.000000 [2,] 0.0000000 0.0000000 -0.8565252 0.00000000 0.0000000 0.0000000 0.000000 [3,] 0.0000000 0.0000000 0.5668866 0.00000000 0.0000000 0.0000000 0.000000 [4,] 0.0000000 0.0000000 0.0000000 0.00000000 0.0000000 2.5842959 0.000000 [5,] 0.0000000 0.0000000 -0.7398992 0.00000000 1.6383114 0.9407963 0.000000 [6,] 0.0000000 -1.5322111 0.0000000 0.08426348 0.0000000 0.0000000 0.000000 [7,] 1.0000000 0.0000000 0.0000000 0.00000000 0.0000000 0.0000000 0.000000 [8,] 0.0000000 1.0000000 0.0000000 0.00000000 0.0000000 0.0000000 0.000000 [9,] 0.0000000 0.0000000 1.0000000 0.00000000 0.0000000 0.0000000 0.000000 [10,] 0.0000000 0.0000000 0.0000000 1.00000000 0.0000000 0.0000000 0.000000 [11,] 0.0000000 0.0000000 0.0000000 0.00000000 1.0000000 -0.2118598 1.707777 [12,] 0.0000000 0.0000000 0.0000000 0.00000000 -0.2118598 1.0000000 0.000000 [13,] 0.0000000 0.0000000 0.0000000 0.00000000 1.7077768 0.0000000 1.000000 [14,] 0.0000000 0.0000000 0.0000000 0.00000000 0.0000000 0.0000000 0.000000 [15,] 1.2070277 0.0000000 0.0000000 0.00000000 0.0000000 0.0000000 0.000000 [16,] 0.0000000 0.0000000 0.0000000 0.00000000 0.8993043 0.0000000 0.000000 [17,] 0.0000000 0.0000000 -0.5371729 0.06540589 0.0000000 0.0000000 0.000000 [18,] 0.0000000 0.0000000 0.0000000 0.00000000 0.0000000 0.0000000 2.709258 [19,] 0.0000000 0.7971285 0.0000000 0.00000000 0.6967910 0.0000000 0.000000 [20,] 0.0000000 0.0000000 -1.7830963 0.00000000 0.0000000 0.0000000 0.000000 [,14] [,15] [,16] [,17] [,18] [,19] [1,] 0.0000000 0.0000000 0.0000000 -0.41433295 0.00000000 0.0000000 [2,] 0.0000000 0.0000000 0.0000000 0.00000000 -0.07633798 0.0000000 [3,] 0.0000000 0.6662763 -1.0108032 0.00000000 0.00000000 0.0000000 [4,] 0.0000000 2.1141764 -0.4335407 0.00000000 -1.21680739 0.0000000 [5,] 0.0000000 0.0000000 0.0000000 0.00000000 0.00000000 0.0000000 [6,] 0.0000000 0.0000000 0.0000000 0.00000000 0.46436715 0.0000000 [7,] 0.0000000 1.2070277 0.0000000 0.00000000 0.00000000 0.0000000 [8,] 0.0000000 0.0000000 0.0000000 0.00000000 0.00000000 0.7971285 [9,] 0.0000000 0.0000000 0.0000000 -0.53717285 0.00000000 0.0000000 [10,] 0.0000000 0.0000000 0.0000000 0.06540589 0.00000000 0.0000000 [11,] 0.0000000 0.0000000 0.8993043 0.00000000 0.00000000 0.6967910 [12,] 0.0000000 0.0000000 0.0000000 0.00000000 0.00000000 0.0000000 [13,] 0.0000000 0.0000000 0.0000000 0.00000000 2.70925832 0.0000000 [14,] 1.0000000 0.0000000 0.0000000 0.00000000 0.00000000 0.0000000 [15,] 0.0000000 1.0000000 0.0000000 0.00000000 0.00000000 -0.4316640 [16,] 0.0000000 0.0000000 1.0000000 1.84823959 0.00000000 0.0000000 [17,] 0.0000000 0.0000000 1.8482396 1.00000000 0.00000000 0.0000000 [18,] 0.0000000 0.0000000 0.0000000 0.00000000 1.00000000 0.0000000 [19,] 0.0000000 -0.4316640 0.0000000 0.00000000 0.00000000 1.0000000 [20,] -0.2180196 0.0000000 0.0000000 0.00000000 0.89955020 0.0000000 [,20] [1,] -1.4080620 [2,] 0.0000000 [3,] 0.0000000 [4,] 0.0000000 [5,] 0.0000000 [6,] 0.0000000 [7,] 0.0000000 [8,] 0.0000000 [9,] -1.7830963 [10,] 0.0000000 [11,] 0.0000000 [12,] 0.0000000 [13,] 0.0000000 [14,] -0.2180196 [15,] 0.0000000 [16,] 0.0000000 [17,] 0.0000000 [18,] 0.8995502 [19,] 0.0000000 [20,] 1.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diff.testDiff# #{ diff(1:10, 2) } [1] 2 2 2 2 2 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diff.testDiff# #{ diff(1:10, 2, 2) } [1] 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diff.testDiff# #{ x <- cumsum(cumsum(1:10)) ; diff(x, differences = 2) } [1] 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diff.testDiff# #{ x <- cumsum(cumsum(1:10)) ; diff(x, lag = 2) } [1] 9 16 25 36 49 64 81 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_diff.testdiff1# #argv <- structure(list(x = c(0.467590032349108, 0.560407538764412)), .Names = 'x');do.call('diff', argv) [1] 0.09281751 ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testDiGamma# #{ digamma(1) } [1] -0.5772157 ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testDiGamma# #{ digamma(1+1i) } Error in digamma(1 + (0+1i)) : unimplemented complex function ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testDiGamma# #{ digamma(100) } [1] 4.600162 ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testDiGamma# #{ digamma(7.42) } [1] 1.935283 ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testDiGamma# #{ digamma(FALSE) } [1] NaN Warning message: In digamma(FALSE) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testDiGamma# #{ digamma(as.double(NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testDiGamma# #{ digamma(as.raw(1)) } Error in digamma(as.raw(1)) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testDiGamma# #{ digamma(c(100, 2.2)) } [1] 4.6001619 0.5442934 ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testdigamma1# #argv <- list(structure(c(3.80516394437114, 12.8051639443711, 15.8051639443711, 6.80516394437114, 6.80516394437114, 14.8051639443711, 21.8051639443711, 23.8051639443711, 7.80516394437114, 7.80516394437114, 16.8051639443711, 8.80516394437114, 15.8051639443711, 7.80516394437114, 33.8051639443711, 54.8051639443711, 58.8051639443711, 15.8051639443711, 17.8051639443711, 17.8051639443711, 18.8051639443711, 41.8051639443711, 44.8051639443711, 47.8051639443711, 9.80516394437114, 24.8051639443711, 24.8051639443711, 29.8051639443711, 35.8051639443711, 37.8051639443711, 39.8051639443711, 4.80516394437114, 6.80516394437114, 12.8051639443711, 25.8051639443711, 46.8051639443711, 6.80516394437114, 7.80516394437114, 7.80516394437114, 10.8051639443711, 14.8051639443711, 24.8051639443711, 26.8051639443711, 33.8051639443711, 54.8051639443711, 55.8051639443711, 6.80516394437114, 6.80516394437114, 12.8051639443711, 18.8051639443711, 20.8051639443711, 9.80516394437114, 14.8051639443711, 15.8051639443711, 21.8051639443711, 48.8051639443711, 49.8051639443711, 61.8051639443711, 82.8051639443711, 3.80516394437114, 1.80516394437114, 3.80516394437114, 4.80516394437114, 6.80516394437114, 11.8051639443711, 15.8051639443711, 22.8051639443711, 37.8051639443711, 41.8051639443711, 7.80516394437114, 18.8051639443711, 68.8051639443711, 1.80516394437114, 1.80516394437114, 3.80516394437114, 8.80516394437114, 12.8051639443711, 13.8051639443711, 1.80516394437114, 1.80516394437114, 6.80516394437114, 6.80516394437114, 6.80516394437114, 12.8051639443711, 18.8051639443711, 4.80516394437114, 5.80516394437114, 23.8051639443711, 31.8051639443711, 37.8051639443711, 9.80516394437114, 1.80516394437114, 2.80516394437114, 6.80516394437114, 8.80516394437114, 17.8051639443711, 28.8051639443711, 1.80516394437114, 31.8051639443711, 11.8051639443711, 15.8051639443711, 28.8051639443711, 42.8051639443711, 70.8051639443711, 26.8051639443711, 11.8051639443711, 12.8051639443711, 21.8051639443711, 34.8051639443711, 6.80516394437114, 8.80516394437114, 1.80516394437114, 2.80516394437114, 6.80516394437114, 6.80516394437114, 6.80516394437114, 6.80516394437114, 8.80516394437114, 12.8051639443711, 16.8051639443711, 6.80516394437114, 15.8051639443711, 7.80516394437114, 7.80516394437114, 8.80516394437114, 29.8051639443711, 1.80516394437114, 6.80516394437114, 15.8051639443711, 3.80516394437114, 3.80516394437114, 4.80516394437114, 9.80516394437114, 11.8051639443711, 13.8051639443711, 2.80516394437114, 2.80516394437114, 10.8051639443711, 23.8051639443711, 4.80516394437114, 4.80516394437114, 6.80516394437114, 16.8051639443711, 19.8051639443711, 23.8051639443711, 38.8051639443711), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100', '101', '102', '103', '104', '105', '106', '107', '108', '109', '110', '111', '112', '113', '114', '115', '116', '117', '118', '119', '120', '121', '122', '123', '124', '125', '126', '127', '128', '129', '130', '131', '132', '133', '134', '135', '136', '137', '138', '139', '140', '141', '142', '143', '144', '145', '146')));digamma(argv[[1]]); 1 2 3 4 5 6 7 8 1.1992419 2.5102939 2.7283680 1.8424125 1.8424125 2.6608240 3.0590412 3.1487517 9 10 11 12 13 14 15 16 1.9893597 1.9893597 2.7916385 2.1174800 2.7283680 1.9893597 3.5057500 3.9946335 17 18 19 20 21 22 23 24 4.0657029 2.7283680 2.8511440 2.8511440 2.9073075 3.7210119 3.7911225 3.8566381 25 26 27 28 29 30 31 32 2.2310498 3.1907593 3.1907593 3.3778123 3.5640627 3.6191617 3.6713829 1.4620426 33 34 35 36 37 38 39 40 1.8424125 2.5102939 3.2310735 3.8352729 1.8424125 1.9893597 1.9893597 2.3330368 41 42 43 44 45 46 47 48 2.6608240 3.1907593 3.2698255 3.5057500 3.9946335 4.0128799 1.8424125 1.8424125 49 50 51 52 53 54 55 56 2.5102939 2.9073075 3.0109763 2.2310498 2.6608240 2.7283680 3.0590412 3.8775563 57 58 59 60 61 62 63 64 3.8980460 4.1158752 4.4104400 1.1992419 0.2887902 1.1992419 1.4620426 1.8424125 65 66 67 68 69 70 71 72 2.4255852 2.7283680 3.1049019 3.6191617 3.7210119 1.9893597 2.9073075 4.2239943 73 74 75 76 77 78 79 80 0.2887902 0.2887902 1.1992419 2.1174800 2.5102939 2.5883874 0.2887902 0.2887902 81 82 83 84 85 86 87 88 1.8424125 1.8424125 1.8424125 2.5102939 2.9073075 1.4620426 1.6701521 3.1487517 89 90 91 92 93 94 95 96 3.4438256 3.6191617 2.2310498 0.2887902 0.8427565 1.8424125 2.1174800 2.8511440 97 98 99 100 101 102 103 104 3.3430963 0.2887902 3.4438256 2.4255852 2.7283680 3.3430963 3.7449324 4.2528537 105 106 107 108 109 110 111 112 3.2698255 2.4255852 2.5102939 3.0590412 3.5353313 1.8424125 2.1174800 0.2887902 113 114 115 116 117 118 119 120 0.8427565 1.8424125 1.8424125 1.8424125 1.8424125 2.1174800 2.5102939 2.7916385 121 122 123 124 125 126 127 128 1.8424125 2.7283680 1.9893597 1.9893597 2.1174800 3.3778123 0.2887902 1.8424125 129 130 131 132 133 134 135 136 2.7283680 1.1992419 1.1992419 1.4620426 2.2310498 2.4255852 2.5883874 0.8427565 137 138 139 140 141 142 143 144 0.8427565 2.3330368 3.1487517 1.4620426 1.4620426 1.8424125 2.7916385 2.9604844 145 146 3.1487517 3.6456131 ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testdigamma2# #argv <- list(structure(c(9.16602330897621, 9.16602330897621, 1.16602330897621, 1.16602330897621, 3.16602330897621, 3.16602330897621, 6.16602330897621, 6.16602330897621, 6.16602330897621, 6.16602330897621, 2.16602330897621, 2.16602330897621, 8.16602330897621, 8.16602330897621, 1.16602330897621, 1.16602330897621, 7.16602330897621, 7.16602330897621, 19.1660233089762, 19.1660233089762, 2.16602330897621, 2.16602330897621), .Names = c('1', '1.1', '2', '2.1', '3', '3.1', '4', '4.1', '5', '5.1', '6', '6.1', '7', '7.1', '8', '8.1', '9', '9.1', '10', '10.1', '11', '11.1')));digamma(argv[[1]]); 1 1.1 2 2.1 3 3.1 4 2.1599635 2.1599635 -0.3329761 -0.3329761 0.9863152 0.9863152 1.7357784 4.1 5 5.1 6 6.1 7 7.1 1.7357784 1.7357784 1.7357784 0.5246397 0.5246397 2.0375049 2.0375049 8 8.1 9 9.1 10 10.1 11 -0.3329761 -0.3329761 1.8979575 1.8979575 2.9268245 2.9268245 0.5246397 11.1 0.5246397 ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testdigamma3# #argv <- list(FALSE);digamma(argv[[1]]); [1] NaN Warning message: In digamma(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testdigamma4# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));digamma(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_digamma.testdigamma5# #argv <- list(c(1e+30, 1e+60, 1e+90, 1e+120, 1e+150, 1e+180, 1e+210, 1e+240, 1e+270, 1e+300));digamma(argv[[1]]); [1] 69.07755 138.15511 207.23266 276.31021 345.38776 414.46532 483.54287 [8] 552.62042 621.69798 690.77553 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ NCOL(1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ NCOL(1:3) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ NROW(1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ NROW(1:3) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ b <- c(a=1+2i,b=3+4i) ; attr(b,"my") <- 211 ; dim(b) <- c(2,1) ; names(b) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ dim(1) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ dim(1:3) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ dimnames(1) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ dimnames(NULL) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ m <- matrix(1:6, nrow=3) ; dim(m) } [1] 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ m <- matrix(1:6, nrow=3) ; ncol(m) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ m <- matrix(1:6, nrow=3) ; nrow(m) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ n <- 17 ; fac <- factor(rep(1:3, length = n), levels = 1:5) ; y<-tapply(1:n, fac, sum); attributes(y) } $dim [1] 5 $dimnames $dimnames[[1]] [1] "1" "2" "3" "4" "5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ ncol(1) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ ncol(1:3) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ nrow(1) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ nrow(1:3) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x <- 1:2 ; attr(x, "dim") <- c(2,1) ; x } [,1] [1,] 1 [2,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x <- 1:2 ; dim(x) <- c(1, -1) ; x } Error in dim(x) <- c(1, -1) : the dims contain negative values ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x <- 1:2 ; dim(x) <- c(1, 3) ; x } Error in dim(x) <- c(1, 3) : dims [product 3] do not match the length of object [2] ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x <- 1:2 ; dim(x) <- c(1, NA) ; x } Error in dim(x) <- c(1, NA) : the dims contain missing values ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x <- 1:2 ; dim(x) <- c(1,2) ; x } [,1] [,2] [1,] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x <- 1:2 ; dim(x) <- integer() ; x } Error in dim(x) <- integer() : length-0 dimension vector is invalid ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x <- 1:4 ; f <- function() { x <- 1:4 ; dim(x) <<- c(2,2) } ; f() ; dim(x) } [1] 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:12; attr(x, "dim")<-c(3, 4); dim(x) } [1] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:12; dim(x)<-c('12'); x } [1] 1 2 3 4 5 6 7 8 9 10 11 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:12; dim(x)<-c('12', '12'); x } Error in dim(x) <- c("12", "12") : dims [product 144] do not match the length of object [12] ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:12; dim(x)<-c(12); x } [1] 1 2 3 4 5 6 7 8 9 10 11 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:12; dim(x)<-c(12+10i); x } [1] 1 2 3 4 5 6 7 8 9 10 11 12 Warning message: In dim(x) <- c(12 + (0+10i)) : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:12; dim(x)<-c(12+10i, 12+10i); x } Error in dim(x) <- c(12 + (0+10i), 12 + (0+10i)) : dims [product 144] do not match the length of object [12] In addition: Warning message: In dim(x) <- c(12 + (0+10i), 12 + (0+10i)) : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:12; dim(x)<-c(2147483648); x } Error in dim(x) <- c(2147483648) : the dims contain missing values In addition: Warning message: In dim(x) <- c(2147483648) : NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:12; dim(x)<-c(2147483648, 2147483648); x } Error in dim(x) <- c(2147483648, 2147483648) : the dims contain missing values In addition: Warning message: In dim(x) <- c(2147483648, 2147483648) : NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:12; dim(x)<-c(3, 4); attr(x, "dim") } [1] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:12; dim(x)<-c(as.raw(12)); x } [1] 1 2 3 4 5 6 7 8 9 10 11 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:1; dim(x)<-c(TRUE); x } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:2; dim(x)=c(1,2); names(x)<-c("a", "b"); attr(x, "foo")<-"foo"; dim(x)<-NULL; attributes(x) } $foo [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; attr(x, "dimnames") <- list(101, 102, 103, 104) } Error in attr(x, "dimnames") <- list(101, 102, 103, 104) : 'dimnames' applied to non-array ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(2,1,2); dimnames(x) <- list(c("a")); x } Error in dimnames(x) <- list(c("a")) : length of 'dimnames' [1] not equal to array extent ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(2,1,2); dimnames(x) <- list(c("a", "b"), "c", c("d", "e"), 7); attributes(x) } Error in dimnames(x) <- list(c("a", "b"), "c", c("d", "e"), 7) : length of 'dimnames' [4] must match that of 'dims' [3] ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(2,1,2); dimnames(x) <- list(c("a", "b"), 42, c("d", "e", "f")); attributes(x) } Error in dimnames(x) <- list(c("a", "b"), 42, c("d", "e", "f")) : length of 'dimnames' [3] not equal to array extent ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(2,1,2); dimnames(x) <- list(c("a", "b"), NULL, c("d")); x } Error in dimnames(x) <- list(c("a", "b"), NULL, c("d")) : length of 'dimnames' [3] not equal to array extent ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(2,1,2); dimnames(x)<-list(NULL); attributes(x) } $dim [1] 2 1 2 $dimnames $dimnames[[1]] NULL $dimnames[[2]] NULL $dimnames[[3]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(2,1,2); dimnames(x)<-list(c("a", "b"), "c", c("d", "e")); attributes(x) } $dim [1] 2 1 2 $dimnames $dimnames[[1]] [1] "a" "b" $dimnames[[2]] [1] "c" $dimnames[[3]] [1] "d" "e" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(2,1,2); dimnames(x)<-list(c("a", "b"), 42, c("d", "e")); attributes(x) } $dim [1] 2 1 2 $dimnames $dimnames[[1]] [1] "a" "b" $dimnames[[2]] [1] "42" $dimnames[[3]] [1] "d" "e" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(4); y<-101:104; dim(y)<-c(2,2); x > y } Error in x > y : non-conformable arrays ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(4); y<-101:104; dim(y)<-c(4); x > y } [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(4); y<-101:104; x > y } [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; dim(x)<-c(4); y<-101:108; dim(y)<-c(8); x > y } Error in x > y : non-conformable arrays ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; names(x)<-c(21:24); attr(x, "dim")<-c(4); attr(x, "foo")<-"foo"; x } [1] 1 2 3 4 attr(,"names") [1] "21" "22" "23" "24" attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; names(x)<-c(21:24); attr(x, "foo")<-"foo"; x } 21 22 23 24 1 2 3 4 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; y<-101:104; dim(y)<-c(4); x > y } [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1:4; y<-c(2, 2); dim(x)<-y; y[1]=4; dim(x) } [1] 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1; dim(x)<-1; attr(x, "dimnames") <- 1 } Error in attr(x, "dimnames") <- 1 : 'dimnames' must be a list ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1; dim(x)<-1; dimnames(x) <- 1; dimnames(x) } Error in dimnames(x) <- 1 : 'dimnames' must be a list ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1; dim(x)<-1; dimnames(x)<-list("a"); dimnames(x); dimnames(x)<-list(); dimnames(x) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1; dim(x)<-1; dimnames(x)<-list() } ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1; dim(x)<-1; dimnames(x)<-list(0) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1; dim(x)=1; attr(x, "foo")<-"foo"; dim(x)<-NULL; attributes(x) } $foo [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1; dim(x)=1; attr(x, "names")<-"a"; dim(x)<-NULL; attributes(x) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1; dim(x)=1; names(x)<-"a"; dim(x)<-NULL; attributes(x) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-1; dimnames(x) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-42; y<-(dim(x)<-1); y } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-42; y<-(dim(x)<-1); } ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-c(1); dim(x)<-1; attr(x, "dimnames")<-list("b"); attributes(x) } $dim [1] 1 $dimnames $dimnames[[1]] [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-c(1); dim(x)<-1; attr(x, "dimnames")<-list(a="b"); attributes(x) } $dim [1] 1 $dimnames $dimnames$a [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-c(1); dim(x)<-1; names(x)<-c("b"); attributes(x) } $dim [1] 1 $dimnames $dimnames[[1]] [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-c(1); y<-c(1); dim(x)<-1; dim(y)<-1; attr(x, "dimnames")<-(attr(y, "dimnames")<-list("b")); attributes(x) } $dim [1] 1 $dimnames $dimnames[[1]] [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-c(42); attr(x, "dim")<-1; names(x)<-"z"; attributes(x) } $dim [1] 1 $dimnames $dimnames[[1]] [1] "z" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-c(42); names(x)<-"a"; attr(x, "dim")<-1; names(x)<-"z"; attr(x, "foo")<-"foo"; attr(x, "dim")<-NULL; attributes(x) } $names [1] "a" $foo [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-c(42); names(x)<-"a"; attr(x, "dim")<-1; names(x)<-"z"; attributes(x) } $names [1] "z" $dim [1] 1 $dimnames $dimnames[[1]] [1] "z" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-c(42); names(x)<-"a"; attr(x, "dim")<-1; names(x)<-"z"; dim(x)<-NULL; attributes(x) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-c(42); names(x)<-"a"; attr(x, "dim")<-1; names(x)<-"z"; names(x)<-NULL; attr(x, "dimnames")<-NULL; attributes(x) } $names [1] "a" $dim [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-c(42); names(x)<-"a"; attr(x, "dim")<-1; names(x)<-"z"; names(x)<-NULL; attributes(x) } $names [1] "a" $dim [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-list(1,2,3); names(x)<-c(21:23); attr(x, "dim")<-c(3); attr(x, "foo")<-"foo"; x } $`21` [1] 1 $`22` [1] 2 $`23` [1] 3 attr(,"names") [1] "21" "22" "23" attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ x<-list(1,2,3); names(x)<-c(21:23); attr(x, "foo")<-"foo"; x } $`21` [1] 1 $`22` [1] 2 $`23` [1] 3 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testDimensions# #{ z <- 1 ; dim(z) <- c(1,1) ; dim(z) <- NULL ; z } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim1# #argv <- list(structure(c(3, 3, 3, 3, 3, 3, 3, 3, 4, 3, 2, 1, 2, 3, 4, 5), .Dim = c(8L, 2L), .Dimnames = list(c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h'), c('x1', 'x2'))));dim(argv[[1]]); [1] 8 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim10# #argv <- list(structure(c(93.3042409622253, 72.8638419893434, 65.9708818502055, 74.2809886424684, 79.8889070755712, 100.233809580112, 104.965351919781, 83.86798597082, 105.795365211341, 108.580858711588, 95.3646703714076, 98.1558192431132, 5.58314117171466, 29.7542740978848, 32.2224082035474, 27.8665232792916, 25.046508702598, 23.5818201384803, 35.0327999599812, 33.2751275770215, 43.2947043117474, 39.1828378794408, 11.7874053171943, 57.3766532219607), .Dim = c(12L, 2L)));dim(argv[[1]]); [1] 12 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim11# #argv <- list(structure(c(1+1i, 3+1i, 2+1i, 4+1i, 5-1i, 7-1i, 6-1i, 8-1i), .Dim = c(2L, 2L, 2L)));dim(argv[[1]]); [1] 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim12# #argv <- list(structure(list(height = numeric(0), weight = numeric(0)), .Names = c('height', 'weight'), class = 'data.frame', row.names = integer(0)));dim(argv[[1]]); [1] 0 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim13# #argv <- list(structure(c(3+2i, 3+2i, NA, 3+2i, 3+2i, 3+2i, 3+2i, 3+2i, 4-5i, 3-5i, NA, NA, 2-5i, 3-5i, 4-5i, 5-5i), .Dim = c(8L, 2L), .Dimnames = list(NULL, c('x1', 'x2'))));dim(argv[[1]]); [1] 8 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim14# #argv <- list(c(99, 1, 2, -3, 4, 3, NA));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim15# #argv <- list(structure(c('‘[,1]’', '‘[,2]’', '‘height’', '‘weight’', 'numeric', 'numeric', 'Height (in) ', 'Weight (lbs)'), .Dim = c(2L, 4L)));dim(argv[[1]]); [1] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim16# #argv <- list(structure(list(V1 = c(0.497699242085218, 0.991906094830483), V2 = c(0.668466738192365, 0.107943625887856), V3 = c(0.0994661601725966, 0.518634263193235), V4 = c(0.892198335845023, 0.389989543473348), V5 = c(0.79730882588774, 0.410084082046524)), .Names = c('V1', 'V2', 'V3', 'V4', 'V5'), row.names = c(16L, 18L), class = 'data.frame'));dim(argv[[1]]); [1] 2 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim17# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(5L, 21L), .Dimnames = list(c('#ifdef', '\\Sexpr', 'build', 'install', 'render'), NULL)));dim(argv[[1]]); [1] 5 21 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim18# #argv <- list(structure(c(0, 0, 0, 0, 0, -1.43884556914512e-134, 0, 0, 0, -7.95468296571581e-252, 1.76099882882167e-260, 0, -9.38724727098368e-323, -0.738228974836154, 0, 0, 0, 0, 0, 0, 0, 0, 0, -6.84657791618065e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.05931985100232e-174, 0, -3.41789378681991e-150, 0, 0, 0, 0, -1.07225492686949e-10, 0, 1.65068934474523e-67, 0, -6.49830035279282e-307, 0, 5.83184963977238e-90, 0, -9.81722610183938e-287, 6.25336419454196e-54, 0, 0, 0, -1.72840591500382e-274, 1.22894687952101e-13, 0.660132850077566, 0, 0, 7.79918925397516e-200, -2.73162827952857e-178, 1.32195942051179e-41, 0, 0, 0, 0, 2.036057023761e-45, -3.40425060445074e-186, 1.59974269220388e-26, 0, 6.67054294775317e-124, 0.158503117506202, 0, 0, 0, 0, 0, 0, 3.42455724859116e-97, 0, 0, -2.70246891320217e-272, 0, 0, -3.50562438899045e-06, 0, 0, 1.35101732326608e-274, 0, 0, 0, 0, 0, 0, 0, 7.24580295957621e-65, 0, -3.54887341172294e-149, 0, 0, 0, 0, 0, 0, 0, 0, 1.77584594753563e-133, 0, 0, 0, 2.88385135688311e-250, 1.44299633616158e-259, 0, 1.56124744085834e-321, 1.63995835868977, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2.01050064173383e-122, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.64868196850938e-172, 0, 6.28699823828692e-149, 0, 0, 0, 0, 5.0552295590188e-09, 0, 2.30420733561404e-66, 0, 7.0823279075443e-306, 0, 2.05009901740696e-88, 0, 7.41800724282869e-285, 7.18347043784483e-53, 0, 0, 0, 1.04251223075649e-273, 9.75816316577433e-13, 4.29519957592147, 0, 0, 1.33541454912682e-198, 2.34606233784019e-176, 8.38236726536896e-41, 0, 0, 0, 0, 1.35710537434521e-43, 1.15710503176511e-185, 1.25601735272233e-25, 0, 4.46811655846376e-123, 4.4196641795634, 0, 0, 0, 0, 0, 0, 3.74179015251531e-93, 0, 0, 3.62662047836582e-271, 0, 0, 1.26220330674453e-05, 0, 0, 1.72715562657338e-273, 0, 0, 0, 0, 0, 0, 0, 5.46372806810809e-64, 0, 2.47081972486962e-148, 0, 0, 0), .Dim = c(100L, 2L)));dim(argv[[1]]); [1] 100 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim19# #argv <- list(structure(c(0, 87, 82, 75, 63, 50, 43, 32, 35, 60, 54, 55, 36, 39, 0, 0, 69, 57, 57, 51, 45, 37, 46, 39, 36, 24, 32, 23, 25, 32, 0, 32, 59, 74, 75, 60, 71, 61, 71, 57, 71, 68, 79, 73, 76, 71, 67, 75, 79, 62, 63, 57, 60, 49, 48, 52, 57, 62, 61, 66, 71, 62, 61, 57, 72, 83, 71, 78, 79, 71, 62, 74, 76, 64, 62, 57, 80, 73, 69, 69, 71, 64, 69, 62, 63, 46, 56, 44, 44, 52, 38, 46, 36, 49, 35, 44, 59, 65, 65, 56, 66, 53, 61, 52, 51, 48, 54, 49, 49, 61, 0, 0, 68, 44, 40, 27, 28, 25, 24, 24), .Tsp = c(1945, 1974.75, 4), class = 'ts'));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim2# #argv <- list(structure(list(surname = structure(1:5, .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(c(1L, 2L, 3L, 3L, 1L), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(1L, 1L, 1L, 2L, 1L), .Label = c('no', 'yes'), class = 'factor'), title = structure(c(NA_integer_, NA_integer_, NA_integer_, NA_integer_, NA_integer_), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA_integer_, NA_integer_, NA_integer_, NA_integer_, NA_integer_), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased', 'title', 'other.author'), row.names = c(5L, 4L, 3L, 1L, 2L), class = 'data.frame'));dim(argv[[1]]); [1] 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim20# #argv <- list(structure(raw(0), .Dim = c(0L, 0L)));dim(argv[[1]]); [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim21# #argv <- list(c(0, 1, 131072, 129140163, 17179869184, 762939453125, 16926659444736, 232630513987207, 2251799813685248, 16677181699666568, 1e+17));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim22# #argv <- list(structure(1:20, .Tsp = c(1960.08333333333, 1961.66666666667, 12), class = 'ts'));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim23# #argv <- list(structure(c(1, 0, -1, 0.5, -0.5, NA, NA, NA, 0), .Dim = c(3L, 3L)));dim(argv[[1]]); [1] 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim24# #argv <- list(c(NA, NA, NA, NA, NA, 'Ripley', 'Venables & Smith'));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim25# #argv <- list(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim26# #argv <- list(structure(c(31.9624451639742, -0.0105001367774998, 0.669596455370805, 5.14945152173688, 4.36500574231155, 6.30517873115649, 2.15562516502081, 1.77361974340981, 1.31721464996217, -6.23951992881235, -3.14333173153233, 3.7074414096456, 0.619951366669834, -3.31636282291298, -1.38277940327151, -0.0105001367774998, 4.92314051157491e-06, -0.00208176000671443, -0.00393685976143421, -0.00306114840585819, -0.00304239831702958, -0.00360485387426285, -0.000776863531985863, -0.000930425548039592, 0.00177325947012459, 0.000873478088813267, -0.00222133591240768, -0.0010997058222662, 0.000971542840761233, 0.000408638350886089, 0.669596455370805, -0.00208176000671443, 6.25966104941131, 7.27107350691908, 7.1568051334171, 7.69164996000523, 6.38546846168565, 0.584255359868468, 0.425893553320666, -0.302152926219182, -0.539719353375365, 0.767832198930969, -0.0339253942409593, -0.954875198336619, -0.44454733172958, 5.14945152173688, -0.00393685976143421, 7.27107350691908, 16.9287891082998, 9.68170957680298, 10.1927925852141, 8.31848730773964, 0.0225771728679827, -0.13423885912137, -0.952279072677042, -1.28303151957048, -0.309366054071832, 0.277949783704086, -1.95357808926458, -1.1490330193693, 4.36500574231155, -0.00306114840585819, 7.1568051334171, 9.68170957680298, 10.6200372990959, 12.0025058084698, 7.09661626032293, 0.00831356355794886, -0.18522684338686, -1.13540989802495, -1.33382692805767, 0.308573868840132, -0.809762853334073, -1.09668270906855, -0.213078730283059, 6.30517873115649, -0.00304239831702958, 7.69164996000523, 10.1927925852141, 12.0025058084698, 17.4522685874698, 6.92295996047857, -0.125541819250371, -0.215552520930932, -1.84365094178865, -1.59654434238815, 0.684384781199279, -1.93856751571012, -1.02265709591595, -0.303713451023131, 2.15562516502081, -0.00360485387426285, 6.38546846168565, 8.31848730773964, 7.09661626032293, 6.92295996047857, 23.2114402831465, -0.28786423278137, 0.360665125986693, -0.292516552346824, -1.61368872459996, 0.400045448449001, 1.49305046916227, -1.52595532739395, -2.45569084011985, 1.77361974340981, -0.000776863531985863, 0.584255359868468, 0.0225771728679827, 0.00831356355794886, -0.125541819250371, -0.28786423278137, 3.63382138185307, 1.73220942447866, 0.201523343362283, 0.961824629517822, 2.18512927857691, -0.299291412368627, -0.222951433523371, 0.190518621032026, 1.31721464996217, -0.000930425548039592, 0.425893553320666, -0.13423885912137, -0.18522684338686, -0.215552520930932, 0.360665125986693, 1.73220942447866, 2.07264968016672, 0.409359459121014, 0.882002960805309, 1.87214770160952, 0.189008347036503, -0.266586895155729, -0.112011626327013, -6.23951992881235, 0.00177325947012459, -0.302152926219182, -0.952279072677042, -1.13540989802495, -1.84365094178865, -0.292516552346824, 0.201523343362283, 0.409359459121014, 2.48234483048294, 1.19369459724506, -0.189893084140488, 0.16622651987368, 0.28664359918476, -0.0113387579323685, -3.14333173153233, 0.000873478088813267, -0.539719353375365, -1.28303151957048, -1.33382692805767, -1.59654434238815, -1.61368872459996, 0.961824629517822, 0.882002960805309, 1.19369459724506, 2.16828149626507, 0.76585533428598, 0.0326711935947258, 0.375684864300291, 0.0175473410796721, 3.7074414096456, -0.00222133591240768, 0.767832198930969, -0.309366054071832, 0.308573868840132, 0.684384781199279, 0.400045448449001, 2.18512927857691, 1.87214770160952, -0.189893084140488, 0.76585533428598, 4.87998635701286, 0.240260053826388, 0.639583107689077, 1.24508720406537, 0.619951366669834, -0.0010997058222662, -0.0339253942409593, 0.277949783704086, -0.809762853334073, -1.93856751571012, 1.49305046916227, -0.299291412368627, 0.189008347036503, 0.16622651987368, 0.0326711935947258, 0.240260053826388, 1.27358692244222, -0.271133086074816, -0.61768767314107, -3.31636282291298, 0.000971542840761233, -0.954875198336619, -1.95357808926458, -1.09668270906855, -1.02265709591595, -1.52595532739395, -0.222951433523371, -0.266586895155729, 0.28664359918476, 0.375684864300291, 0.639583107689077, -0.271133086074816, 2.24773578295184, 2.00648977390012, -1.38277940327151, 0.000408638350886089, -0.44454733172958, -1.1490330193693, -0.213078730283059, -0.303713451023131, -2.45569084011985, 0.190518621032026, -0.112011626327013, -0.0113387579323685, 0.0175473410796721, 1.24508720406537, -0.61768767314107, 2.00648977390012, 3.44090885157986), .Dim = c(15L, 15L), .Dimnames = list(c('(Intercept)', 'Weight', 'Cylinders4', 'Cylinders5', 'Cylinders6', 'Cylinders8', 'Cylindersrotary', 'TypeLarge', 'TypeMidsize', 'TypeSmall', 'TypeSporty', 'TypeVan', 'EngineSize', 'DriveTrainFront', 'DriveTrainRear'), c('(Intercept)', 'Weight', 'Cylinders4', 'Cylinders5', 'Cylinders6', 'Cylinders8', 'Cylindersrotary', 'TypeLarge', 'TypeMidsize', 'TypeSmall', 'TypeSporty', 'TypeVan', 'EngineSize', 'DriveTrainFront', 'DriveTrainRear'))));dim(argv[[1]]); [1] 15 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim27# #argv <- list(structure(c(-3.001e+155, -1.067e+107, -1.976e+62, -9.961e+152, -2.059e+23, 1), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.'), class = 'table'));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim28# #argv <- list(structure(1395082220.91387, class = c('POSIXct', 'POSIXt')));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim3# #argv <- list(structure(c(0.100837939896365, 0.100837939896365, -2.89916206010363, 1.10083793989637, 2.10083793989637, 15.3663689601092, 5.36636896010918, -15.5557367724452, 1.44426322755481, -15.5557367724452, -6.55573677244519, 2.44426322755481, -20.5557367724452, 3.41611550389052, 37.4161155038905, 8.41611550389052, 23.0292477138695, -29.9707522861305, 3.02924771386952, -25.9707522861305, 5.46163181127829, 1.46163181127829, 22.4616318112783, -11.5383681887217, 17.4616318112783, -24.5383681887217, 2.79509291794369, -19.2049070820563, -32.2049070820563, 10.7950929179437, -18.2049070820563, 17.7950929179437, 2.79509291794369, 25.7950929179437, 9.79509291794369, -3.77239539978251, 13.2276046002175, -0.772395399782511, 23.2276046002175, -2.77239539978251, 1.22760460021749, -12.7723953997825, 13.2276046002175, 7.22760460021749, 7.22760460021749, -36.8669529292102, 13.1330470707898, 12.1330470707898, -18.8669529292102, -7.86695292921016, -18.3408059382389, 14.7301967628363), .Dim = c(52L, 1L)));dim(argv[[1]]); [1] 52 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim30# #argv <- list(structure(list(Sepal.Length = c(5.1, 4.9, 4.7, 4.6, 5, 5.4, 4.6, 5, 4.4, 4.9, 5.4, 4.8, 4.8, 4.3, 5.8, 5.7, 5.4, 5.1, 5.7, 5.1, 5.4, 5.1, 4.6, 5.1, 4.8, 5, 5, 5.2, 5.2, 4.7, 4.8, 5.4, 5.2, 5.5, 4.9, 5, 5.5, 4.9, 4.4, 5.1, 5, 4.5, 4.4, 5, 5.1, 4.8, 5.1, 4.6, 5.3, 5, 7, 6.4, 6.9, 5.5, 6.5, 5.7, 6.3, 4.9, 6.6, 5.2, 5, 5.9, 6, 6.1, 5.6, 6.7, 5.6, 5.8, 6.2, 5.6, 5.9, 6.1, 6.3, 6.1, 6.4, 6.6, 6.8, 6.7, 6, 5.7, 5.5, 5.5, 5.8, 6, 5.4, 6, 6.7, 6.3, 5.6, 5.5, 5.5, 6.1, 5.8, 5, 5.6, 5.7, 5.7, 6.2, 5.1, 5.7, 6.3, 5.8, 7.1, 6.3, 6.5, 7.6, 4.9, 7.3, 6.7, 7.2, 6.5, 6.4, 6.8, 5.7, 5.8, 6.4, 6.5, 7.7, 7.7, 6, 6.9, 5.6, 7.7, 6.3, 6.7, 7.2, 6.2, 6.1, 6.4, 7.2, 7.4, 7.9, 6.4, 6.3, 6.1, 7.7, 6.3, 6.4, 6, 6.9, 6.7, 6.9, 6.8, 6.7, 6.7, 6.3, 6.5, 6.2, 5.9), Sepal.Width = c(3.5, 3, 3.2, 3.1, 3.6, 3.9, 3.4, 3.4, 2.9, 3.1, 3.7, 3.4, 3, 3, 4, 4.4, 3.9, 3.5, 3.8, 3.8, 3.4, 3.7, 3.6, 3.3, 3.4, 3, 3.4, 3.5, 3.4, 3.2, 3.1, 3.4, 4.1, 4.2, 3.1, 3.2, 3.5, 3.6, 3, 3.4, 3.5, 2.3, 3.2, 3.5, 3.8, 3, 3.8, 3.2, 3.7, 3.3, 3.2, 3.2, 3.1, 2.3, 2.8, 2.8, 3.3, 2.4, 2.9, 2.7, 2, 3, 2.2, 2.9, 2.9, 3.1, 3, 2.7, 2.2, 2.5, 3.2, 2.8, 2.5, 2.8, 2.9, 3, 2.8, 3, 2.9, 2.6, 2.4, 2.4, 2.7, 2.7, 3, 3.4, 3.1, 2.3, 3, 2.5, 2.6, 3, 2.6, 2.3, 2.7, 3, 2.9, 2.9, 2.5, 2.8, 3.3, 2.7, 3, 2.9, 3, 3, 2.5, 2.9, 2.5, 3.6, 3.2, 2.7, 3, 2.5, 2.8, 3.2, 3, 3.8, 2.6, 2.2, 3.2, 2.8, 2.8, 2.7, 3.3, 3.2, 2.8, 3, 2.8, 3, 2.8, 3.8, 2.8, 2.8, 2.6, 3, 3.4, 3.1, 3, 3.1, 3.1, 3.1, 3.2, 3.3, 3, 2.5, 3, 3.4, 3), Petal.Length = c(1.4, 1.4, 1.3, 1.5, 1.4, 1.7, 1.4, 1.5, 1.4, 1.5, 1.5, 1.6, 1.4, 1.1, 1.2, 1.5, 1.3, 1.4, 1.7, 1.5, 1.7, 1.5, 1, 1.7, 1.9, 1.6, 1.6, 1.5, 1.4, 1.6, 1.6, 1.5, 1.5, 1.4, 1.5, 1.2, 1.3, 1.4, 1.3, 1.5, 1.3, 1.3, 1.3, 1.6, 1.9, 1.4, 1.6, 1.4, 1.5, 1.4, 4.7, 4.5, 4.9, 4, 4.6, 4.5, 4.7, 3.3, 4.6, 3.9, 3.5, 4.2, 4, 4.7, 3.6, 4.4, 4.5, 4.1, 4.5, 3.9, 4.8, 4, 4.9, 4.7, 4.3, 4.4, 4.8, 5, 4.5, 3.5, 3.8, 3.7, 3.9, 5.1, 4.5, 4.5, 4.7, 4.4, 4.1, 4, 4.4, 4.6, 4, 3.3, 4.2, 4.2, 4.2, 4.3, 3, 4.1, 6, 5.1, 5.9, 5.6, 5.8, 6.6, 4.5, 6.3, 5.8, 6.1, 5.1, 5.3, 5.5, 5, 5.1, 5.3, 5.5, 6.7, 6.9, 5, 5.7, 4.9, 6.7, 4.9, 5.7, 6, 4.8, 4.9, 5.6, 5.8, 6.1, 6.4, 5.6, 5.1, 5.6, 6.1, 5.6, 5.5, 4.8, 5.4, 5.6, 5.1, 5.9, 5.7, 5.2, 5, 5.2, 5.4, 5.1), Petal.Width = c(0.2, 0.2, 0.2, 0.2, 0.2, 0.4, 0.3, 0.2, 0.2, 0.1, 0.2, 0.2, 0.1, 0.1, 0.2, 0.4, 0.4, 0.3, 0.3, 0.3, 0.2, 0.4, 0.2, 0.5, 0.2, 0.2, 0.4, 0.2, 0.2, 0.2, 0.2, 0.4, 0.1, 0.2, 0.2, 0.2, 0.2, 0.1, 0.2, 0.2, 0.3, 0.3, 0.2, 0.6, 0.4, 0.3, 0.2, 0.2, 0.2, 0.2, 1.4, 1.5, 1.5, 1.3, 1.5, 1.3, 1.6, 1, 1.3, 1.4, 1, 1.5, 1, 1.4, 1.3, 1.4, 1.5, 1, 1.5, 1.1, 1.8, 1.3, 1.5, 1.2, 1.3, 1.4, 1.4, 1.7, 1.5, 1, 1.1, 1, 1.2, 1.6, 1.5, 1.6, 1.5, 1.3, 1.3, 1.3, 1.2, 1.4, 1.2, 1, 1.3, 1.2, 1.3, 1.3, 1.1, 1.3, 2.5, 1.9, 2.1, 1.8, 2.2, 2.1, 1.7, 1.8, 1.8, 2.5, 2, 1.9, 2.1, 2, 2.4, 2.3, 1.8, 2.2, 2.3, 1.5, 2.3, 2, 2, 1.8, 2.1, 1.8, 1.8, 1.8, 2.1, 1.6, 1.9, 2, 2.2, 1.5, 1.4, 2.3, 2.4, 1.8, 1.8, 2.1, 2.4, 2.3, 2.3, 2.5, 2.3, 1.9, 2, 2.3, 1.8), Species = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('setosa', 'versicolor', 'virginica'), class = 'factor')), .Names = c('Sepal.Length', 'Sepal.Width', 'Petal.Length', 'Petal.Width', 'Species'), row.names = c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 35L, 36L, 37L, 38L, 39L, 40L, 41L, 42L, 43L, 44L, 45L, 46L, 47L, 48L, 49L, 50L, 51L, 52L, 53L, 54L, 55L, 56L, 57L, 58L, 59L, 60L, 61L, 62L, 63L, 64L, 65L, 66L, 67L, 68L, 69L, 70L, 71L, 72L, 73L, 74L, 75L, 76L, 77L, 78L, 79L, 80L, 81L, 82L, 83L, 84L, 85L, 86L, 87L, 88L, 89L, 90L, 91L, 92L, 93L, 94L, 95L, 96L, 97L, 98L, 99L, 100L, 101L, 102L, 103L, 104L, 105L, 106L, 107L, 108L, 109L, 110L, 111L, 112L, 113L, 114L, 115L, 116L, 117L, 118L, 119L, 120L, 121L, 122L, 123L, 124L, 125L, 126L, 127L, 128L, 129L, 130L, 131L, 132L, 133L, 134L, 135L, 136L, 137L, 138L, 139L, 140L, 141L, 142L, 144L, 145L, 146L, 147L, 148L, 149L, 150L), class = 'data.frame'));do.call('dim', argv) [1] 149 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim4# #argv <- list(structure(c(3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L), .Label = c('Golden.rain', 'Marvellous', 'Victory'), class = 'factor', contrasts = 'contr.treatment'));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim5# #argv <- list(structure(list(df = 10L, ss = 2.74035772634541, ms = 0.274035772634541, f = NA_real_, P = NA_real_), .Names = c('df', 'ss', 'ms', 'f', 'P'), row.names = c(NA, -1L), class = 'data.frame'));dim(argv[[1]]); [1] 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim6# #argv <- list(structure(list(File = c('GOusage.Rnw', 'annotate.Rnw', 'chromLoc.Rnw', 'prettyOutput.Rnw', 'query.Rnw', 'useDataPkgs.Rnw', 'useHomology.Rnw', 'useProbeInfo.Rnw'), Title = c('Basic GO Usage', 'Annotation Overview', 'HowTo: use chromosomal information', 'HowTo: Get HTML Output', 'HOWTO: Use the online query tools', 'Using Data Packages', 'Using the homology package', 'Using Affymetrix Probe Level Data'), PDF = c('GOusage.pdf', 'annotate.pdf', 'chromLoc.pdf', 'prettyOutput.pdf', 'query.pdf', 'useDataPkgs.pdf', 'useHomology.pdf', 'useProbeInfo.pdf'), Depends = list(c('GO.db', 'hgu95av2.db', 'Biobase'), c('Biobase', 'genefilter', 'annotate', 'hgu95av2.db'), c('annotate', 'hgu95av2.db'), c('annotate', 'hgu95av2.db'), c('annotate', 'hgu95av2.db'), c('hgu95av2.db', 'GO.db'), 'hom.Hs.inp.db', c('hgu95av2.db', 'rae230a.db', 'rae230aprobe', 'Biostrings')), Keywords = list(c('GO', 'ontology'), c('Expression Analysis', 'Annotation'), c('Expression Analysis', 'Annotation'), c('Expression Analysis', 'Annotation'), c('Expression Analysis', 'Annotation'), 'Annotation', 'Annotation', 'Annotation'), R = c('GOusage.R', 'annotate.R', 'chromLoc.R', 'prettyOutput.R', 'query.R', 'useDataPkgs.R', 'useHomology.R', 'useProbeInfo.R')), .Names = c('File', 'Title', 'PDF', 'Depends', 'Keywords', 'R'), row.names = c(NA, -8L), class = 'data.frame'));dim(argv[[1]]); [1] 8 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim7# #argv <- list(c(2832L, 2836L, 2836L, 2833L, 2833L));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim8# #argv <- list(structure(list(day = structure(1:6, .Label = c('2012-06-01', '2012-06-02', '2012-06-03', '2012-06-04', '2012-06-05', '2012-06-06', '2012-06-07'), class = 'factor')), .Names = 'day', row.names = c(1L, 5L, 9L, 13L, 17L, 21L), class = 'data.frame'));dim(argv[[1]]); [1] 6 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dim.testdim9# #argv <- list(c(NA, NA, '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/cloud.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/cloud.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/cloud.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/cloud.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/cloud.R'));dim(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testDimAssign# #{ a <- array(NA,dim=c(2,3,4),dimnames=list(1:2,1:3,1:4)); dim(a) <- c(2, 12); dimnames(a); } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testDimAssign# #{ a <- array(NA,dim=c(2,3,4),dimnames=list(1:2,1:3,1:4)); dim(a) <- c(2,3,4); dimnames(a); } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testDimAssignError# #dim(environment()) <- c(1,2) Error in dim(environment()) <- c(1, 2) : invalid (NULL) left side of assignment ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testDimAssignError# #f <- function() {}; dim(f) <- c(1,2) Error in dim(f) <- c(1, 2) : invalid first argument, must be vector (list or atomic) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign1# #argv <- list(structure(c(300, 3000, 400, 4000), .Dim = c(2L, 2L, 1L)), value = c(2, 2, 1));`dim<-`(argv[[1]],argv[[2]]); , , 1 [,1] [,2] [1,] 300 400 [2,] 3000 4000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign10# #argv <- list(structure(c(1, 0.870865388077469, -0.224541709419829, -0.331803324650025, -0.493630926048296, -0.413999601257247, 0.00943216495885559, -0.569185666759019, 0.183501080823027, -0.658299946719611, -0.563901271084431, -0.104454834691276, 0.715158727414282, -0.0805825981616209, -0.773816895694757, -0.253034783981378, -0.783775136777695, -0.439357063536005, -0.941680494841322, 0.227158249206389, -0.50752863656701, -0.0658964161620369, -0.0689244902651806, 0.185611518464636, 0.378167766177418, -0.0629003710494349, 0.487507055153686, -0.148876486655171), .Dim = c(1L, 28L)), value = c(1, 28));`dim<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [1,] 1 0.8708654 -0.2245417 -0.3318033 -0.4936309 -0.4139996 0.009432165 [,8] [,9] [,10] [,11] [,12] [,13] [,14] [1,] -0.5691857 0.1835011 -0.6582999 -0.5639013 -0.1044548 0.7151587 -0.0805826 [,15] [,16] [,17] [,18] [,19] [,20] [1,] -0.7738169 -0.2530348 -0.7837751 -0.4393571 -0.9416805 0.2271582 [,21] [,22] [,23] [,24] [,25] [,26] [1,] -0.5075286 -0.06589642 -0.06892449 0.1856115 0.3781678 -0.06290037 [,27] [,28] [1,] 0.4875071 -0.1488765 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign11# #argv <- list(structure(NA, .Dim = c(1L, 1L)), value = c(1L, 1L));`dim<-`(argv[[1]],argv[[2]]); [,1] [1,] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign12# #b <- c(a=1+2i,b=3+4i);dim(b) <- c(2,1);attributes(x) Error: object 'x' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign2# #argv <- list(structure(logical(0), .Dim = c(0L, 0L)), value = c(0L, 0L));`dim<-`(argv[[1]],argv[[2]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign3# #argv <- list(structure(1:12, .Dim = 12L), value = 12L);`dim<-`(argv[[1]],argv[[2]]); [1] 1 2 3 4 5 6 7 8 9 10 11 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign4# #argv <- list(structure(list(1:3, 4:6, 3.14159265358979, c('a', 'b', 'c')), .Dim = c(2L, 2L)), value = c(2, 2));`dim<-`(argv[[1]],argv[[2]]); [,1] [,2] [1,] Integer,3 3.141593 [2,] Integer,3 Character,3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign5# #argv <- list(structure(list(NULL, NULL, NULL, NULL, NULL, NULL), .Dim = 2:3), value = c(2, 3));`dim<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] NULL NULL NULL [2,] NULL NULL NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign6# #argv <- list(structure(list(1L, 3.14159265358979, 3+5i, 'testit', TRUE, structure(1L, .Label = 'foo', class = 'factor')), .Dim = c(1L, 6L)), value = c(1, 6));`dim<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [1,] 1 3.141593 3+5i "testit" TRUE factor,1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign7# #argv <- list(structure(1:12, .Dim = 3:4), value = 3:4);`dim<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] 1 4 7 10 [2,] 2 5 8 11 [3,] 3 6 9 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign8#Ignored.Unimplemented# #argv <- list(NULL, NULL);`dim<-`(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimassign.testdimassign9# #argv <- list(structure(c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 1L, 2L, 3L, 4L, 5L, 6L, 7L), .Dim = c(3L, 4L, 2L)), value = c(3, 4, 2));`dim<-`(argv[[1]],argv[[2]]); , , 1 [,1] [,2] [,3] [,4] [1,] 1 4 7 10 [2,] 2 5 8 11 [3,] 3 6 9 12 , , 2 [,1] [,2] [,3] [,4] [1,] 13 16 2 5 [2,] 14 17 3 6 [3,] 15 1 4 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimdataframe.testdimdataframe1# #argv <- structure(list(x = structure(list(c..1....4....7.. = structure(1:3, .Label = c('1', '4', '7'), class = 'factor'), c..2....5....8.. = structure(1:3, .Label = c('2', '5', '8'), class = 'factor'), c..3....6....9.. = structure(1:3, .Label = c('3', '6', '9'), class = 'factor')), .Names = c('c..1....4....7..', 'c..2....5....8..', 'c..3....6....9..'), row.names = c(NA, -3L), class = 'data.frame')), .Names = 'x');do.call('dim.data.frame', argv) [1] 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimdataframe.testdimdataframe2# #argv <- structure(list(x = structure(list(Sepal.Length = c(5.1, 4.9, 4.7, 4.6, 5, 5.4, 4.6, 5, 4.4, 4.9, 5.4, 4.8, 4.8, 4.3, 5.8, 5.7, 5.4, 5.1, 5.7, 5.1, 5.4, 5.1, 4.6, 5.1, 4.8, 5, 5, 5.2, 5.2, 4.7, 4.8, 5.4, 5.2, 5.5, 4.9, 5, 5.5, 4.9, 4.4, 5.1, 5, 4.5, 4.4, 5, 5.1, 4.8, 5.1, 4.6, 5.3, 5, 7, 6.4, 6.9, 5.5, 6.5, 5.7, 6.3, 4.9, 6.6, 5.2, 5, 5.9, 6, 6.1, 5.6, 6.7, 5.6, 5.8, 6.2, 5.6, 5.9, 6.1, 6.3, 6.1, 6.4, 6.6, 6.8, 6.7, 6, 5.7, 5.5, 5.5, 5.8, 6, 5.4, 6, 6.7, 6.3, 5.6, 5.5, 5.5, 6.1, 5.8, 5, 5.6, 5.7, 5.7, 6.2, 5.1, 5.7, 6.3, 5.8, 7.1, 6.3, 6.5, 7.6, 4.9, 7.3, 6.7, 7.2, 6.5, 6.4, 6.8, 5.7, 5.8, 6.4, 6.5, 7.7, 7.7, 6, 6.9, 5.6, 7.7, 6.3, 6.7, 7.2, 6.2, 6.1, 6.4, 7.2, 7.4, 7.9, 6.4, 6.3, 6.1, 7.7, 6.3, 6.4, 6, 6.9, 6.7, 6.9, 6.8, 6.7, 6.7, 6.3, 6.5, 6.2, 5.9), Sepal.Width = c(3.5, 3, 3.2, 3.1, 3.6, 3.9, 3.4, 3.4, 2.9, 3.1, 3.7, 3.4, 3, 3, 4, 4.4, 3.9, 3.5, 3.8, 3.8, 3.4, 3.7, 3.6, 3.3, 3.4, 3, 3.4, 3.5, 3.4, 3.2, 3.1, 3.4, 4.1, 4.2, 3.1, 3.2, 3.5, 3.6, 3, 3.4, 3.5, 2.3, 3.2, 3.5, 3.8, 3, 3.8, 3.2, 3.7, 3.3, 3.2, 3.2, 3.1, 2.3, 2.8, 2.8, 3.3, 2.4, 2.9, 2.7, 2, 3, 2.2, 2.9, 2.9, 3.1, 3, 2.7, 2.2, 2.5, 3.2, 2.8, 2.5, 2.8, 2.9, 3, 2.8, 3, 2.9, 2.6, 2.4, 2.4, 2.7, 2.7, 3, 3.4, 3.1, 2.3, 3, 2.5, 2.6, 3, 2.6, 2.3, 2.7, 3, 2.9, 2.9, 2.5, 2.8, 3.3, 2.7, 3, 2.9, 3, 3, 2.5, 2.9, 2.5, 3.6, 3.2, 2.7, 3, 2.5, 2.8, 3.2, 3, 3.8, 2.6, 2.2, 3.2, 2.8, 2.8, 2.7, 3.3, 3.2, 2.8, 3, 2.8, 3, 2.8, 3.8, 2.8, 2.8, 2.6, 3, 3.4, 3.1, 3, 3.1, 3.1, 3.1, 3.2, 3.3, 3, 2.5, 3, 3.4, 3), Petal.Length = c(1.4, 1.4, 1.3, 1.5, 1.4, 1.7, 1.4, 1.5, 1.4, 1.5, 1.5, 1.6, 1.4, 1.1, 1.2, 1.5, 1.3, 1.4, 1.7, 1.5, 1.7, 1.5, 1, 1.7, 1.9, 1.6, 1.6, 1.5, 1.4, 1.6, 1.6, 1.5, 1.5, 1.4, 1.5, 1.2, 1.3, 1.4, 1.3, 1.5, 1.3, 1.3, 1.3, 1.6, 1.9, 1.4, 1.6, 1.4, 1.5, 1.4, 4.7, 4.5, 4.9, 4, 4.6, 4.5, 4.7, 3.3, 4.6, 3.9, 3.5, 4.2, 4, 4.7, 3.6, 4.4, 4.5, 4.1, 4.5, 3.9, 4.8, 4, 4.9, 4.7, 4.3, 4.4, 4.8, 5, 4.5, 3.5, 3.8, 3.7, 3.9, 5.1, 4.5, 4.5, 4.7, 4.4, 4.1, 4, 4.4, 4.6, 4, 3.3, 4.2, 4.2, 4.2, 4.3, 3, 4.1, 6, 5.1, 5.9, 5.6, 5.8, 6.6, 4.5, 6.3, 5.8, 6.1, 5.1, 5.3, 5.5, 5, 5.1, 5.3, 5.5, 6.7, 6.9, 5, 5.7, 4.9, 6.7, 4.9, 5.7, 6, 4.8, 4.9, 5.6, 5.8, 6.1, 6.4, 5.6, 5.1, 5.6, 6.1, 5.6, 5.5, 4.8, 5.4, 5.6, 5.1, 5.9, 5.7, 5.2, 5, 5.2, 5.4, 5.1), Petal.Width = c(0.2, 0.2, 0.2, 0.2, 0.2, 0.4, 0.3, 0.2, 0.2, 0.1, 0.2, 0.2, 0.1, 0.1, 0.2, 0.4, 0.4, 0.3, 0.3, 0.3, 0.2, 0.4, 0.2, 0.5, 0.2, 0.2, 0.4, 0.2, 0.2, 0.2, 0.2, 0.4, 0.1, 0.2, 0.2, 0.2, 0.2, 0.1, 0.2, 0.2, 0.3, 0.3, 0.2, 0.6, 0.4, 0.3, 0.2, 0.2, 0.2, 0.2, 1.4, 1.5, 1.5, 1.3, 1.5, 1.3, 1.6, 1, 1.3, 1.4, 1, 1.5, 1, 1.4, 1.3, 1.4, 1.5, 1, 1.5, 1.1, 1.8, 1.3, 1.5, 1.2, 1.3, 1.4, 1.4, 1.7, 1.5, 1, 1.1, 1, 1.2, 1.6, 1.5, 1.6, 1.5, 1.3, 1.3, 1.3, 1.2, 1.4, 1.2, 1, 1.3, 1.2, 1.3, 1.3, 1.1, 1.3, 2.5, 1.9, 2.1, 1.8, 2.2, 2.1, 1.7, 1.8, 1.8, 2.5, 2, 1.9, 2.1, 2, 2.4, 2.3, 1.8, 2.2, 2.3, 1.5, 2.3, 2, 2, 1.8, 2.1, 1.8, 1.8, 1.8, 2.1, 1.6, 1.9, 2, 2.2, 1.5, 1.4, 2.3, 2.4, 1.8, 1.8, 2.1, 2.4, 2.3, 2.3, 2.5, 2.3, 1.9, 2, 2.3, 1.8), Species = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('setosa', 'versicolor', 'virginica'), class = 'factor')), .Names = c('Sepal.Length', 'Sepal.Width', 'Petal.Length', 'Petal.Width', 'Species'), row.names = c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 35L, 36L, 37L, 38L, 39L, 40L, 41L, 42L, 43L, 44L, 45L, 46L, 47L, 48L, 49L, 50L, 51L, 52L, 53L, 54L, 55L, 56L, 57L, 58L, 59L, 60L, 61L, 62L, 63L, 64L, 65L, 66L, 67L, 68L, 69L, 70L, 71L, 72L, 73L, 74L, 75L, 76L, 77L, 78L, 79L, 80L, 81L, 82L, 83L, 84L, 85L, 86L, 87L, 88L, 89L, 90L, 91L, 92L, 93L, 94L, 95L, 96L, 97L, 98L, 99L, 100L, 101L, 102L, 103L, 104L, 105L, 106L, 107L, 108L, 109L, 110L, 111L, 112L, 113L, 114L, 115L, 116L, 117L, 118L, 119L, 120L, 121L, 122L, 123L, 124L, 125L, 126L, 127L, 128L, 129L, 130L, 131L, 132L, 133L, 134L, 135L, 136L, 137L, 138L, 139L, 140L, 141L, 142L, 144L, 145L, 146L, 147L, 148L, 149L, 150L), class = 'data.frame')), .Names = 'x');do.call('dim.data.frame', argv) [1] 149 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames1# #argv <- list(structure(c(4L, 3L, 2L, 1L, 2L), .Label = c('0.6', '0.8', 'Area Examined', 'C2'), class = 'factor'));dimnames(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames10# #argv <- list(structure(list(Ozone = c(41L, 36L, 12L, 18L, NA, 28L, 23L, 19L, 8L, NA, 7L, 16L, 11L, 14L, 18L, 14L, 34L, 6L, 30L, 11L, 1L, 11L, 4L, 32L, NA, NA, NA, 23L, 45L, 115L, 37L), Solar.R = c(190L, 118L, 149L, 313L, NA, NA, 299L, 99L, 19L, 194L, NA, 256L, 290L, 274L, 65L, 334L, 307L, 78L, 322L, 44L, 8L, 320L, 25L, 92L, 66L, 266L, NA, 13L, 252L, 223L, 279L), Wind = c(7.4, 8, 12.6, 11.5, 14.3, 14.9, 8.6, 13.8, 20.1, 8.6, 6.9, 9.7, 9.2, 10.9, 13.2, 11.5, 12, 18.4, 11.5, 9.7, 9.7, 16.6, 9.7, 12, 16.6, 14.9, 8, 12, 14.9, 5.7, 7.4), Temp = c(67L, 72L, 74L, 62L, 56L, 66L, 65L, 59L, 61L, 69L, 74L, 69L, 66L, 68L, 58L, 64L, 66L, 57L, 68L, 62L, 59L, 73L, 61L, 61L, 57L, 58L, 57L, 67L, 81L, 79L, 76L), Month = c(5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L), Day = 1:31, Oz.Z = c(0.782229292792786, 0.557251841325834, -0.522639925715534, -0.252666983955192, NA, 0.197287918978711, -0.0276895324882403, -0.207671493661802, -0.702621886889095, NA, -0.747617377182486, -0.342657964541973, -0.567635416008924, -0.432648945128753, -0.252666983955192, -0.432648945128753, 0.467260860739053, -0.792612867475876, 0.287278899565492, -0.567635416008924, -1.01759031894283, -0.567635416008924, -0.882603848062657, 0.377269880152273, NA, NA, NA, -0.0276895324882403, 0.962211253966347, 4.11189557450367, 0.602247331619224)), .Names = c('Ozone', 'Solar.R', 'Wind', 'Temp', 'Month', 'Day', 'Oz.Z'), row.names = c(NA, 31L), class = 'data.frame'));dimnames(argv[[1]]); [[1]] [1] "1" "2" "3" "4" "5" "6" "7" "8" "9" "10" "11" "12" "13" "14" "15" [16] "16" "17" "18" "19" "20" "21" "22" "23" "24" "25" "26" "27" "28" "29" "30" [31] "31" [[2]] [1] "Ozone" "Solar.R" "Wind" "Temp" "Month" "Day" "Oz.Z" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames11# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));dimnames(argv[[1]]); [[1]] character(0) [[2]] [1] "c0" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames12# #argv <- list(structure(logical(0), .Dim = c(0L, 4L), .Dimnames = list(NULL, c('Estimate', 'Std. Error', 't value', 'Pr(>|t|)'))));dimnames(argv[[1]]); [[1]] NULL [[2]] [1] "Estimate" "Std. Error" "t value" "Pr(>|t|)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames13# #argv <- list(structure(c(1.00000000141919, 1.00000000141919, 1.00000000141919, 1.00000000141919, 1.00000000141919, 1.00000003943081, 0.999999963407572, 1.00000003943081, 0.999999887384338, 0.999999887384338, 1.00000110375608, 0.999998671012596, 1.00000353649956, 0.999993805525628, 1.0000132674735, 0.999993805525628, 0.999954881629886, 1.00003272942137, 1.00018842500434, 1.00018842500434, 0.998942860340576, 0.998942860340576, 1.00143398966811, 1.00641624832317, 0.996451731013043, 0.996451731013043, 0.996451731013043, 0.956593661772521, 1.11602593873461, 0.956593661772521, 0.637729107848348, 1.2754582156967, 0, 5.10183286278678, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.94013552497596, 3.76412613616612, 7.30291496677768, 14.1686451539795, 27.4890922070583, 53.3325661305982, 103.472408672272, 200.750502109581, 389.483191189237, 755.650202381997, 1466.06384193569, 2844.36258373045, 5518.44906703615, 10706.5393765913, 20772.1380196383, 40300.7636161042, 78188.9463884664, 151697.155845212, 294313.049942543, 571007.218374244, 1107831.42112573, 2149343.17429151, 4170017.13104157, 8090398.61389002, 15696470.311059, 30453280.1141634, 59083492.559312, 114629985.805561, 222397713.850125, 431481718.951103, 837133036.93017, 1624151587.48205, 3151074263.75394, 6113511302.83196, 11861040827.0204, 23012027206.5324, 44646452442.3573, 86620170794.9288, 168054874821.487, 326049245490.904, 632579733498.458, 1227290450360.24, 2381109863489.76, 4619676014664.61, 8962797733853.2, 17389042711398.3, 33737100912048.4, 65454549040847.5, 126990699928896, 246379175201939, 478009006423530, 927402279739830, 1799286146937082, 3490859083252747, 6772739936266967, 13140033736528760, 25493446790450148, 49460743386475336, 95960547120913696, 186176471759588736, 361207596842468544, 700791709787994368, 1359630936550262016, 2637868362903399936, 5117822236182886400, 9929268960054196224, 19264127970060791808, 37375020125774807040, 72512606973297393664, 1.40684287014036e+20, 2.7294659047997e+20, 5.29553390729944e+20, 1.02740538360686e+21, 1.99330573047582e+21, 3.86728338996836e+21, 7.50305404171627e+21, 1.45569421000466e+22, 2.82424412804067e+22, 5.47941653460064e+22, 1.06308109216746e+23, 2.06252146205912e+23, 4.00157124688985e+23, 7.76359070435321e+23, 1.50624186823988e+24, 2.9223134410489e+24, 5.66968428254813e+24, 1.09999562078627e+25, 2.13414063286361e+25, 4.14052220754691e+25, 8.03317433205064e+25, 1.55854473744651e+26, 3.02378808245954e+26, 5.8665589378512e+26, 1.1381919629553e+27, 2.20824672789753e+27, 4.28429802210817e+27, 8.31211904202342e+27, 1.6126637849175e+28, 3.12878639712715e+28, 6.07026977774323e+28, -1.69869203952449, -6.59138547321901, -19.1822720729097, -49.6216113971901, -120.340815686727, -280.172995242172, -634.16918707159, -1406.14196698717, -3069.11929954479, -6616.11942037001, -14119.7855095835, -29884.6887074354, -62812.0433183954, -131238.022320374, -272806.670597037, -564567.387887297, -1163795.8381508, -2390740.65186453, -4896047.65118829, -9998943.37840444, -20369271.0188994, -41401011.400719, -83974646.5467737, -170005771.46876, -343577337.860415, -693250079.585253, -1396729874.79437, -2810209917.82931, -5646909305.11788, -11333554766.2687, -22721587164.2141, -45504990439.9914, -91044782407.2254, -181991924578.337, -363473977210.141, -725337050553.89, -1446342551648.47, -2881941162160.65, -5738497521398.03, -11418936575319.8, -22708142164275.2, -45131432245311.6, -89645884346409.8, -177969941625094, -353133219287688, -700351348689777, -1388315183960579, -2750828581307066, -5448167546359572, -10785901526178346, -21344633431230288, -42223472396959864, -83494631109252016, -165047335865753888, -326144099824872960, -644268556323104896, -1272289222665704960, -2511719077288045568, -4957094068295422976, -9780441891046391808, -1.9291639356539e+19, -38041976425069862912, -74997019625717596160, -1.47813980522732e+20, -2.91260085798056e+20, -5.73777646929122e+20, -1.13007319819804e+21, -2.22521899361014e+21, -4.38071519248462e+21, -8.62235781974388e+21, -1.69675222834625e+22, -3.33829458816692e+22, -6.56669878434099e+22, -1.2914810481395e+23, -2.53950840681221e+23, -4.99268379737403e+23, -9.81393715458217e+23, -1.92876460684381e+24, -3.79004004348997e+24, -7.44626980645141e+24, -1.46273574426805e+25, -2.87294154406129e+25, -5.64187042306716e+25, -1.10778729236262e+26, -2.1748439290622e+26, -4.26913311245721e+26, -8.37900750248964e+26, -1.64432657900359e+27, -3.22646894393502e+27, -6.33012184999843e+27, -1.24177532894999e+28, -2.4356873672908e+28, -4.77692848222753e+28, -9.36754365223252e+28, -1.83676481719521e+29, -3.60108404728876e+29, -7.05936824038065e+29, -1.38373288587828e+30, -2.71202352823357e+30, -5.31484173040654e+30), .Dim = c(100L, 3L)));dimnames(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames14# #argv <- list(structure(c(0.0267062896727757, 0.0288568829806391, 0.0492797675063702, -0.0572758706635325, 0.0323212080834915, 0.0153959090462038, -0.0926263811460125, 0.063635852899097, -0.0487298690847772, 0.0550557154550753, -0.0198673280094324, -0.0926263811460125, 0.0140766975562449, 0.0582283948223117, 0.00131213541438663, 0.091788691086849, -0.047804624481445, 0.0620410336020094, -0.0572622511611348, 0.0287132484691924, -0.083909175260886, -0.078402304235417, 0.0355405280997754, 0.0717493130601819, -0.0215453924782896, 0.0433187167027035, -0.0391463972547204, 0.0355405280997753, -0.101433295142967, -0.0534964348088565, -0.0100532600167173, 0.115085165377514), .Dim = c(16L, 2L), .Dimnames = list(structure(c('M1', 'M2', 'M4', 'M5', 'BF', 'HF', 'NM', 'SF', 'U1', 'U2', 'U3', 'C0', 'C1', 'C2', 'C3', 'C4'), .Names = c('Mois1', 'Mois2', 'Mois3', 'Mois4', 'Manag1', 'Manag2', 'Manag3', 'Manag4', 'Use1', 'Use2', 'Use3', 'Manure1', 'Manure2', 'Manure3', 'Manure4', 'Manure5')), c('1', '2'))));dimnames(argv[[1]]); [[1]] Mois1 Mois2 Mois3 Mois4 Manag1 Manag2 Manag3 Manag4 Use1 Use2 "M1" "M2" "M4" "M5" "BF" "HF" "NM" "SF" "U1" "U2" Use3 Manure1 Manure2 Manure3 Manure4 Manure5 "U3" "C0" "C1" "C2" "C3" "C4" [[2]] [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames15# #argv <- list(structure('foo', .Dim = c(1L, 1L), .Dimnames = list(NULL, structure('object', simpleOnly = TRUE))));dimnames(argv[[1]]); [[1]] NULL [[2]] [1] "object" attr(,"simpleOnly") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames16# #argv <- list(structure(c('4.1-0', '4.1-0', '4.1-0', '4.1-0', '4.1-0', '4.1-0', '4.0-3', '4.0-3', '4.0-3', '4.0-3', '4.0-3', '4.0-2', '4.0-2', '4.0-1', '4.0-1', '4.0-1', '4.0-1', '4.0-1', '4.0-1', '4.0-1', '4.0-1', '3.1-55', '3.1-55', '3.1-55', '3.1-54', '3.1-53', '3.1-53', '3.1-52', '3.1-51', NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 'The C and R code has been reformatted for legibility.', 'The old compatibility function rpconvert() has been removed.', 'The cross-validation functions allow for user interrupt at the end\nof evaluating each split.', 'Variable Reliability in data set car90 is corrected to be an\nordered factor, as documented.', 'Surrogate splits are now considered only if they send two or more\ncases _with non-zero weight_ each way. For numeric/ordinal\nvariables the restriction to non-zero weights is new: for\ncategorical variables this is a new restriction.', 'Surrogate splits which improve only by rounding error over the\ndefault split are no longer returned. Where weights and missing\nvalues are present, the splits component for some of these was not\nreturned correctly.', 'A fit of class rpart now contains a component for variable\n‘importance’, which is reported by the summary() method.', 'The text() method gains a minlength argument, like the labels()\nmethod. This adds finer control: the default remains pretty =\nNULL, minlength = 1L.', 'The handling of fits with zero and fractional weights has been\ncorrected: the results may be slightly different (or even\nsubstantially different when the proportion of zero weights is\nlarge).', 'Some memory leaks have been plugged.', 'There is a second vignette, longintro.Rnw, a version of the\noriginal Mayo Tecnical Report on rpart.', 'Added dataset car90, a corrected version of the S-PLUS dataset\ncar.all (used with permission).', 'This version does not use paste0{} and so works with R 2.14.x.', 'Merged in a set of Splus code changes that had accumulated at Mayo\nover the course of a decade. The primary one is a change in how\nindexing is done in the underlying C code, which leads to a major\nspeed increase for large data sets. Essentially, for the lower\nleaves all our time used to be eaten up by bookkeeping, and this\nwas replaced by a different approach. The primary routine also\nuses .Call{} so as to be more memory efficient.', 'The other major change was an error for asymmetric loss matrices,\nprompted by a user query. With L=loss asymmetric, the altered\npriors were computed incorrectly - they were using L\' instead of L.\nUpshot - the tree would not not necessarily choose optimal splits\nfor the given loss matrix. Once chosen, splits were evaluated\ncorrectly. The printed “improvement” values are of course the\nwrong ones as well. It is interesting that for my little test\ncase, with L quite asymmetric, the early splits in the tree are\nunchanged - a good split still looks good.', 'Add the return.all argument to xpred.rpart().', 'Added a set of formal tests, i.e., cases with known answers to\nwhich we can compare.', 'Add a usercode vignette, explaining how to add user defined\nsplitting functions.', 'The class method now also returns the node probability.', 'Add the stagec data set, used in some tests.', 'The plot.rpart routine needs to store a value that will be visible\nto the rpartco routine at a later time. This is now done in an\nenvironment in the namespace.', 'Force use of registered symbols in R >= 2.16.0', 'Update Polish translations.', 'Work on message formats.', 'Add Polish translations', 'rpart, rpart.matrix: allow backticks in formulae.', 'tests/backtick.R: regession test', 'src/xval.c: ensure unused code is not compiled in.', 'Change description of margin in ?plot.rpart as suggested by Bill\nVenables.'), .Dim = c(29L, 4L)));dimnames(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames17# #argv <- list(structure(c(0, 0, 0, 0, 0, -1.43884556914512e-134, 0, 0, 0, -7.95468296571581e-252, 1.76099882882167e-260, 0, -9.38724727098368e-323, -0.738228974836154, 0, 0, 0, 0, 0, 0, 0, 0, 0, -6.84657791618065e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1.05931985100232e-174, 0, -3.41789378681991e-150, 0, 0, 0, 0, -1.07225492686949e-10, 0, 1.65068934474523e-67, 0, -6.49830035279282e-307, 0, 5.83184963977238e-90, 0, -9.81722610183938e-287, 6.25336419454196e-54, 0, 0, 0, -1.72840591500382e-274, 1.22894687952101e-13, 0.660132850077566, 0, 0, 7.79918925397516e-200, -2.73162827952857e-178, 1.32195942051179e-41, 0, 0, 0, 0, 2.036057023761e-45, -3.40425060445074e-186, 1.59974269220388e-26, 0, 6.67054294775317e-124, 0.158503117506202, 0, 0, 0, 0, 0, 0, 3.42455724859116e-97, 0, 0, -2.70246891320217e-272, 0, 0, -3.50562438899045e-06, 0, 0, 1.35101732326608e-274, 0, 0, 0, 0, 0, 0, 0, 7.24580295957621e-65, 0, -3.54887341172294e-149, 0, 0, 0, 0, 0, 0, 0, 0, 1.77584594753563e-133, 0, 0, 0, 2.88385135688311e-250, 1.44299633616158e-259, 0, 1.56124744085834e-321, 1.63995835868977, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2.01050064173383e-122, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.64868196850938e-172, 0, 6.28699823828692e-149, 0, 0, 0, 0, 5.0552295590188e-09, 0, 2.30420733561404e-66, 0, 7.0823279075443e-306, 0, 2.05009901740696e-88, 0, 7.41800724282869e-285, 7.18347043784483e-53, 0, 0, 0, 1.04251223075649e-273, 9.75816316577433e-13, 4.29519957592147, 0, 0, 1.33541454912682e-198, 2.34606233784019e-176, 8.38236726536896e-41, 0, 0, 0, 0, 1.35710537434521e-43, 1.15710503176511e-185, 1.25601735272233e-25, 0, 4.46811655846376e-123, 4.4196641795634, 0, 0, 0, 0, 0, 0, 3.74179015251531e-93, 0, 0, 3.62662047836582e-271, 0, 0, 1.26220330674453e-05, 0, 0, 1.72715562657338e-273, 0, 0, 0, 0, 0, 0, 0, 5.46372806810809e-64, 0, 2.47081972486962e-148, 0, 0, 0), .Dim = c(100L, 2L)));dimnames(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames18# #argv <- list(structure(list(Ozone = c(39L, 9L, 16L, 78L, 35L, 66L, 122L, 89L, 110L, NA, NA, 44L, 28L, 65L, NA, 22L, 59L, 23L, 31L, 44L, 21L, 9L, NA, 45L, 168L, 73L, NA, 76L, 118L, 84L, 85L), Solar.R = c(83L, 24L, 77L, NA, NA, NA, 255L, 229L, 207L, 222L, 137L, 192L, 273L, 157L, 64L, 71L, 51L, 115L, 244L, 190L, 259L, 36L, 255L, 212L, 238L, 215L, 153L, 203L, 225L, 237L, 188L), Wind = c(6.9, 13.8, 7.4, 6.9, 7.4, 4.6, 4, 10.3, 8, 8.6, 11.5, 11.5, 11.5, 9.7, 11.5, 10.3, 6.3, 7.4, 10.9, 10.3, 15.5, 14.3, 12.6, 9.7, 3.4, 8, 5.7, 9.7, 2.3, 6.3, 6.3), Temp = c(81L, 81L, 82L, 86L, 85L, 87L, 89L, 90L, 90L, 92L, 86L, 86L, 82L, 80L, 79L, 77L, 79L, 76L, 78L, 78L, 77L, 72L, 75L, 79L, 81L, 86L, 88L, 97L, 94L, 96L, 94L), Month = c(8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L), Day = 1:31, Oz.Z = c(-0.528248463997741, -1.28427378861836, -1.10786787954022, 0.454584458009066, -0.629051840613824, 0.152174328160817, 1.56342160078598, 0.731793743703293, 1.26101147093773, NA, NA, -0.402244243227638, -0.805457749691969, 0.126973484006797, NA, -0.956662814616093, -0.0242315809173275, -0.931461970462072, -0.729855217229907, -0.402244243227638, -0.981863658770114, -1.28427378861836, NA, -0.377043399073617, 2.72266043187093, 0.328580237238962, NA, 0.404182769701024, 1.46261822416989, 0.60578952293319, 0.63099036708721)), .Names = c('Ozone', 'Solar.R', 'Wind', 'Temp', 'Month', 'Day', 'Oz.Z'), row.names = 93:123, class = 'data.frame'));dimnames(argv[[1]]); [[1]] [1] "93" "94" "95" "96" "97" "98" "99" "100" "101" "102" "103" "104" [13] "105" "106" "107" "108" "109" "110" "111" "112" "113" "114" "115" "116" [25] "117" "118" "119" "120" "121" "122" "123" [[2]] [1] "Ozone" "Solar.R" "Wind" "Temp" "Month" "Day" "Oz.Z" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames19# #argv <- list(structure(c(28L, 138L, 16L), .Dim = 3L, .Dimnames = structure(list(object = c('FALSE', 'TRUE', NA)), .Names = 'object'), class = 'table'));dimnames(argv[[1]]); $object [1] "FALSE" "TRUE" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames2# #argv <- list(structure(c(0, 0, 0, 0, 0, 56.989995924654, 56.989995924654, 94.3649041101607, 94.3649041101607, 94.3649041101607, 94.3649041101607, 94.3649041101607, 94.3649041101607, 109.608811230383, 109.608811230383, 109.608811230383, 107.478028232287, 107.478028232287, 107.478028232287, 107.478028232287, 94.6057793667664, 94.6057793667664, 94.6057793667664, 94.6057793667664, 94.6057793667664, 94.6057793667664, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 39.6403646307366, 39.6403646307366, 39.6403646307366, 39.6403646307366, 39.6403646307366, 10.7055301785859, 0, 1.00000000551046, 1.00000000551046, 1.00000000551046, 1.00000000551046, 1.00000000551046, 0.914597467778369, 0.914597467778369, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.599195286063472, 0.599195286063472, 0.599195286063472, 0.446659102876937, 0.446659102876937, 0.446659102876937, 0.446659102876937, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.0889140940358009, 0.0889140940358009, 0.0889140940358009, 0.0889140940358009, 0.0889140940358009, 0.0202635232425103, 2.60032456603692e-08, 0, 0, 0, 0, 0, 0.165626203544259, 0.165626203544259, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.503396799290371, 0.503396799290371, 0.503396799290371, 0.638987326722699, 0.638987326722699, 0.638987326722699, 0.638987326722699, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.931061257482989, 0.931061257482989, 0.931061257482989, 0.931061257482989, 0.931061257482989, 0.984387422945875, 0.999999996451695), .Dim = c(52L, 3L)));dimnames(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames20# #argv <- list(structure(c('myTst', 'myLib', '1.0', NA, 'methods', NA, NA, NA, NA, 'What license is it under?', NA, NA, NA, NA, NA, NA, '3.0.1'), .Dim = c(1L, 17L), .Dimnames = list('ret0', c('Package', 'LibPath', 'Version', 'Priority', 'Depends', 'Imports', 'LinkingTo', 'Suggests', 'Enhances', 'License', 'License_is_FOSS', 'License_restricts_use', 'OS_type', 'Archs', 'MD5sum', 'NeedsCompilation', 'Built'))));dimnames(argv[[1]]); [[1]] [1] "ret0" [[2]] [1] "Package" "LibPath" "Version" [4] "Priority" "Depends" "Imports" [7] "LinkingTo" "Suggests" "Enhances" [10] "License" "License_is_FOSS" "License_restricts_use" [13] "OS_type" "Archs" "MD5sum" [16] "NeedsCompilation" "Built" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames21# #argv <- list(structure(list(Df = c(NA, 1, 1, 2), Deviance = c(12.2441566485997, 32.825622681839, 8.44399377410362, 11.9670615295804), AIC = c(73.9421143635373, 92.5235803967766, 72.1419514890412, 77.665019244518)), .Names = c('Df', 'Deviance', 'AIC'), row.names = c('', '- M.user', '+ Temp', '+ Soft'), class = c('anova', 'data.frame')));dimnames(argv[[1]]); [[1]] [1] "" "- M.user" "+ Temp" "+ Soft" [[2]] [1] "Df" "Deviance" "AIC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames22# #argv <- list(structure(c(1L, 2L, 1L), .Dim = 3L, .Dimnames = structure(list(c('1', '2', NA)), .Names = ''), class = 'table'));dimnames(argv[[1]]); [[1]] [1] "1" "2" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames23# #argv <- list(structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11), .Dim = c(10L, 2L), .Dimnames = list(NULL, c('tt', 'tt + 1')), .Tsp = c(1920.5, 1921.25, 12), class = c('mts', 'ts', 'matrix')));dimnames(argv[[1]]); [[1]] NULL [[2]] [1] "tt" "tt + 1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames24# #argv <- list(structure(c(1L, 1L, 1L, 1L, 2L, 1L, NA), .Label = c('no', 'yes'), class = 'factor'));dimnames(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames26# #argv <- list(structure(c(-15.7095066647243, 0.26727943386171, 0.297238382214578, 0.257897591876632, 0.340108731286838, 0.236310380889319, 0.317311605722827, 0.262866287094154, 0.338086383499512, 0.234905236792884, 0.325336667185977, 0.218927692395608, -7.51574917378772, 7.84743436370915, -0.381048703752012, -0.330615253498497, 0.244844953659604, 0.170120314286586, -0.406781840034597, -0.336984938523255, 0.243389061455961, 0.169108748250409, -0.417069674483433, -0.280657271719851, -5.36168424071406, 0.204399594459056, 7.44580265802875, 0.18731755950565, -0.56882795084156, -0.395226400731518, -0.439007571789656, -0.363681278343691, 0.147865047400615, 0.10273786720867, 0.236300269698257, 0.159012733501467, -5.07819471343419, -0.0276453301370831, -3.65602301353979, 6.37342950130462, 0.0099206539914638, 0.0068929530698134, 0.118301269982087, 0.0980027677458417, -0.620575419067553, -0.431180972906935, -0.48536920518568, -0.326617841666301), .Dim = c(12L, 4L), .Dimnames = list(c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), c('(Intercept)', 'M.userY', 'SoftMedium', 'SoftSoft'))));dimnames(argv[[1]]); [[1]] [1] "1" "3" "5" "7" "9" "11" "13" "15" "17" "19" "21" "23" [[2]] [1] "(Intercept)" "M.userY" "SoftMedium" "SoftSoft" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames27# #{ x <- array(1:6, dim=c(2,3)); dimnames(x) <- list(x=c('x1','x2'), y=c('y1','y2','y3')); z<-choose(x,2); dimnames(z)$x[[1]] <- 'onlyinz'; dimnames(x); } $x [1] "x1" "x2" $y [1] "y1" "y2" "y3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames3# #argv <- list(structure(c(FALSE, FALSE, FALSE), .Dim = c(3L, 1L)));dimnames(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames4# #argv <- list(structure(c(NA, 1, 2, 5.65604443125997, 8.44399377410362, 5.49523049516867, 71.3540021461976, 72.1419514890413, 75.1931882101063), .Dim = c(3L, 3L), .Dimnames = list(c('', '- M.user:Temp', '+ Soft'), c('Df', 'Deviance', 'AIC'))));dimnames(argv[[1]]); [[1]] [1] "" "- M.user:Temp" "+ Soft" [[2]] [1] "Df" "Deviance" "AIC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames5# #argv <- list(structure(c(0.0495149735282523, -0.108383943640066, 0.077846206317523, -0.0237949779538032, 0.00481774174809338, -0.108383943640066, 0.280303242453237, -0.276080245636638, 0.130604235856321, -0.0264432890328551, 0.077846206317523, -0.276080245636638, 0.443183251704797, -0.364557026828347, 0.119607814442664, -0.0237949779538032, 0.130604235856321, -0.364557026828347, 0.44886505191838, -0.191117282992552, 0.00481774174809338, -0.0264432890328551, 0.119607814442664, -0.191117282992552, 0.0931350158346494), .Dim = c(5L, 5L)));dimnames(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames6# #argv <- list(structure(c(3+2i, 3+2i, NA, 3+2i, 3+2i, 3+2i, 3+2i, 3+2i, 4-5i, 3-5i, NA, NA, 2-5i, 3-5i, 4-5i, 5-5i), .Dim = c(8L, 2L), .Dimnames = list(NULL, c('x1', 'x2'))));dimnames(argv[[1]]); [[1]] NULL [[2]] [1] "x1" "x2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames7# #argv <- list(structure(c(13.0879058831551, -0.0481782079188499, 0.0648397936975344, -0.0703016880559154, -0.433062454113996, -0.000149473169823967, -16.3229386445345, -0.0481782079188499, 1.42936577525521, 0.00346026862477374, 0.000168722552167122, -0.00850959684180395, -9.2926002743558e-06, -1.44812039916227, 0.0648397936975344, 0.00346026862477374, 0.0649221455479854, 1.50206888047831e-06, 0.0303152177308945, -5.59890220792902e-06, -0.238079760031664, -0.0703016880559154, 0.000168722552167122, 1.50206888047831e-06, 0.00876007504795771, 0.000744776618395879, -6.15610217329725e-06, -0.0811419414051802, -0.433062454113996, -0.00850959684180395, 0.0303152177308945, 0.000744776618395879, 10.728754385628, -6.46786616103191e-05, -11.116657381748, -0.000149473169823967, -9.2926002743558e-06, -5.59890220792902e-06, -6.15610217329725e-06, -6.46786616103191e-05, 0.00193527894824396, -0.000812297378584339, -16.3229386445345, -1.44812039916227, -0.238079760031664, -0.0811419414051802, -11.116657381748, -0.000812297378584339, 249.99918229946), .Dim = c(7L, 7L)));dimnames(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames8# #argv <- list(structure(list(visible = c(TRUE, TRUE, TRUE, TRUE, TRUE), from = structure(c(2L, 2L, 2L, 2L, 2L), .Label = c('CheckExEnv', 'package:base', 'package:datasets', 'package:graphics', 'package:grDevices', 'package:methods', 'package:stats', 'package:utils'), class = 'factor')), .Names = c('visible', 'from'), row.names = c('[[.data.frame', '[[.Date', '[[.factor', '[[.numeric_version', '[[.POSIXct'), class = 'data.frame'));dimnames(argv[[1]]); [[1]] [1] "[[.data.frame" "[[.Date" "[[.factor" [4] "[[.numeric_version" "[[.POSIXct" [[2]] [1] "visible" "from" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnames.testdimnames9# #argv <- list(structure(c(-0.148741651280925, -0.200659450546418, -0.0705810742857073, -0.356547323513813, -0.214670164989233, -0.161150909262745, -0.0362121726544447, -0.259637310505756, -0.142667503568732, -0.113509274827518, -0.0362121726544447, -0.221848749616356, -0.0809219076239261, -0.0969100130080564, 0, -0.113509274827518, -0.0362121726544447, 0, 0.0934216851622351, 0, 0.0644579892269184, 0.113943352306837, 0.161368002234975, 0.0969100130080564, 0.100370545117563, 0.139879086401236, 0.269512944217916, 0.193124598354462, 0.184691430817599, 0.201397124320452, 0.262451089730429, 0.269512944217916, 0.184691430817599, 0.315970345456918, 0.369215857410143, 0.352182518111362, 0.334453751150931, 0.385606273598312, 0.431363764158987, 0.352182518111362, 0.445604203273598, 0.534026106056135, 0.56702636615906, 0.556302500767287, 0.556302500767287, 0.635483746814912, 0.635483746814912, 0.607455023214668, 0.686636269262293, 0.702430536445525, 0.702430536445525, 0.644438589467839, 0.746634198937579, 0.76715586608218, 0.817565369559781, 0.725094521081469, 0.780317312140151, 0.8055008581584, 0.840733234611807, 0.76715586608218, 0.840733234611807, 0.888740960682893, 0.893761762057943, 0.786751422145561, 0.888740960682893, 0.949877704036875, 0.91803033678488, 0.835056101720116, 0.979548374704095, 1.0111473607758, 0.979548374704095, 0.94101424370557, 1.07481644064517, 1.08134730780413, 1.08457627793433, 0.949877704036875, 1.14736710779379, 1.11260500153457, 1.17172645365323, 0.999565488225982, 1.20951501454263, 1.16643011384328, 1.20466251174822, 1.06483221973857, -0.159187512164844, -0.175393808396786, -0.187687755757946, -0.207642507026642, -0.198621515607727, -0.176754605786408, -0.158836651491979, -0.149428697683695, -0.140952828307713, -0.131024527567456, -0.123872539048553, -0.114280817787828, -0.0994047163123464, -0.087368495856282, -0.0695543741081212, -0.0471907302590792, -0.0252858368758202, -0.00046875732235226, 0.0256791224090317, 0.0513817320777501, 0.0766209131410961, 0.0968522890603896, 0.10926580806596, 0.12423159770419, 0.140017729684574, 0.160995251972733, 0.186207523410629, 0.20145502677125, 0.212779940301236, 0.218492043424262, 0.230096897140732, 0.249642407137453, 0.267032743986859, 0.296832600908836, 0.324482776968729, 0.34857076887723, 0.365213423984069, 0.378158595546285, 0.395931013687348, 0.419646007489754, 0.460582747648703, 0.501139500862399, 0.536421474743013, 0.565667794936187, 0.583727648968917, 0.604807814936374, 0.625205889668605, 0.647621016647276, 0.667938096838737, 0.680279300032779, 0.691704012845436, 0.70875844749856, 0.731043761734682, 0.751082618736354, 0.768818358528044, 0.778037539482349, 0.783883770017724, 0.793567437831882, 0.808497952330164, 0.824527436015885, 0.837662628092942, 0.850394585087975, 0.86126020516377, 0.869685339227116, 0.881257746828503, 0.896341202762879, 0.909788792806972, 0.926007182864941, 0.946255773007512, 0.966071629523008, 0.986442844639348, 1.01212132840619, 1.03013203323943, 1.04537749097574, 1.05767268306294, 1.06939407179363, 1.08529788756315, 1.10060754122045, 1.11720247611807, 1.12845012932749, 1.1415063364534, 1.15405124613828, 1.16739846403236, 1.18260472251233, -0.500829194148537, -0.52138894326571, -0.395290556425639, -0.612473674589852, -0.501276350125614, -0.491690167245187, -0.390354415846618, -0.612811414694937, -0.50108691493379, -0.487593021259144, -0.410519772822145, -0.60198159752223, -0.486883827608277, -0.503288363976579, -0.42574385459525, -0.568147157695982, -0.507959098850015, -0.498398837847198, -0.433186387433784, -0.55201418458838, -0.518671455596172, -0.493155285150245, -0.444313944722341, -0.526234257426627, -0.532725645126928, -0.515368327315997, -0.429924874711845, -0.513474228757053, -0.535827355681639, -0.509755301472591, -0.457834384119355, -0.484020307382735, -0.566550518367581, -0.484439669223823, -0.460465869949124, -0.506741194861463, -0.536243725945176, -0.486859832443798, -0.457576573769744, -0.545126578784142, -0.515794992319117, -0.47384137864798, -0.476642594236321, -0.523341985476231, -0.522293038769951, -0.469249989654994, -0.486003635866052, -0.541938916235621, -0.49102139505142, -0.478259440132195, -0.481086490677911, -0.556698657805247, -0.48671796302777, -0.486157330493723, -0.461848039861244, -0.556823945253764, -0.498054862552783, -0.480860984756722, -0.4661755221955, -0.561135228990277, -0.497359948541683, -0.46413941340098, -0.470914891619888, -0.579021563367855, -0.488243746349874, -0.449175409103654, -0.488562751281115, -0.586017616755797, -0.467647247160106, -0.454360847750584, -0.499693656171344, -0.581118529375087, -0.458579410956407, -0.467570268776559, -0.473550583747953, -0.613665700345632, -0.438534120752666, -0.486034341320657, -0.452438304433326, -0.626272401483727, -0.43259461595065, -0.48652221719006, -0.460246994058915, -0.618889869869875), .Dim = c(84L, 3L), .Dimnames = list(NULL, c('JJ', 'sm[, 1]', 'sm[, 3] - 0.5')), .Tsp = c(1960, 1980.75, 4), class = c('mts', 'ts', 'matrix')));dimnames(argv[[1]]); [[1]] NULL [[2]] [1] "JJ" "sm[, 1]" "sm[, 3] - 0.5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testDimnamesAssign# #{ x<-data.frame(c(1,2),c(3,4)); dimnames(x) <- list(c("A", "B"), c("C", "D")); x } C D A 1 3 B 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testDimnamesElementAssign# #{ x<-matrix(12,3,4); dimnames(x)[[2]]<-c('a','b','c','d'); x } a b c d [1,] 12 12 12 12 [2,] 12 12 12 12 [3,] 12 12 12 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign1# #argv <- list(structure(c(300, 3000, 400, 4000), .Dim = c(2L, 2L, 1L), .Dimnames = list(c('happy', 'sad'), NULL, '')), value = list(c('happy', 'sad'), NULL, ''));`dimnames<-`(argv[[1]],argv[[2]]); , , [,1] [,2] happy 300 400 sad 3000 4000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign10# #argv <- list(structure(1:9, .Dim = c(3L, 3L), .Dimnames = list(c('x', 'y', NA), c('1', NA, '3'))), value = list(c('x', 'y', NA), c('1', NA, '3')));`dimnames<-`(argv[[1]],argv[[2]]); 1 3 x 1 4 7 y 2 5 8 3 6 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign11# #argv <- list(structure(c(0-0.5i, 0-0.577350269189626i, 0-0.707106781186548i, 0-1i, Inf+0i, 1+0i, 0.707106781186548+0i, 0.577350269189626+0i, 0.5+0i, 0.447213595499958+0i, 0.408248290463863+0i, 0.377964473009227+0i, 0.353553390593274+0i, 0.333333333333333+0i, 0.316227766016838+0i, 0.301511344577764+0i, 0.288675134594813+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 1+0i, 0+2i, 0+1.73205080756888i, 0+1.41421356237309i, 0+1i, 0+0i, 1+0i, 1.41421356237309+0i, 1.73205080756888+0i, 2+0i, 2.23606797749979+0i, 2.44948974278318+0i, 2.64575131106459+0i, 2.82842712474619+0i, 3+0i, 3.16227766016838+0i, 3.3166247903554+0i, 3.46410161513775+0i, -4+0i, -3+0i, -2+0i, -1+0i, 0+0i, 1+0i, 2+0i, 3+0i, 4+0i, 5+0i, 6+0i, 7+0i, 8+0i, 9+0i, 10+0i, 11+0i, 12+0i, 0-8i, 0-5.19615242270663i, 0-2.82842712474619i, 0-1i, 0+0i, 1+0i, 2.82842712474619+0i, 5.19615242270663+0i, 8+0i, 11.1803398874989+0i, 14.6969384566991+0i, 18.5202591774521+0i, 22.6274169979695+0i, 27+0i, 31.6227766016838+0i, 36.4828726939094+0i, 41.5692193816531+0i, 16+0i, 9+0i, 4+0i, 1+0i, 0+0i, 1+0i, 4+0i, 9+0i, 16+0i, 25+0i, 36+0i, 49+0i, 64+0i, 81+0i, 100+0i, 121+0i, 144+0i), .Dim = c(17L, 6L), .Dimnames = structure(list(c('-4', '-3', '-2', '-1', '0', '1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12'), `^` = c('-0.5', '0', '0.5', '1', '1.5', '2')), .Names = c('', '^'))), value = structure(list(c('-4', '-3', '-2', '-1', '0', '1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12'), `^` = c('-0.5', '0', '0.5', '1', '1.5', '2')), .Names = c('', '^')));`dimnames<-`(argv[[1]],argv[[2]]); ^ -0.5 0 0.5 1 1.5 -4 0.0000000-0.5000000i 1+0i 0.000000+2.000000i -4+0i 0.000000-8.000000i -3 0.0000000-0.5773503i 1+0i 0.000000+1.732051i -3+0i 0.000000-5.196152i -2 0.0000000-0.7071068i 1+0i 0.000000+1.414214i -2+0i 0.000000-2.828427i -1 0.0000000-1.0000000i 1+0i 0.000000+1.000000i -1+0i 0.000000-1.000000i 0 Inf+0.0000000i 1+0i 0.000000+0.000000i 0+0i 0.000000+0.000000i 1 1.0000000+0.0000000i 1+0i 1.000000+0.000000i 1+0i 1.000000+0.000000i 2 0.7071068+0.0000000i 1+0i 1.414214+0.000000i 2+0i 2.828427+0.000000i 3 0.5773503+0.0000000i 1+0i 1.732051+0.000000i 3+0i 5.196152+0.000000i 4 0.5000000+0.0000000i 1+0i 2.000000+0.000000i 4+0i 8.000000+0.000000i 5 0.4472136+0.0000000i 1+0i 2.236068+0.000000i 5+0i 11.180340+0.000000i 6 0.4082483+0.0000000i 1+0i 2.449490+0.000000i 6+0i 14.696938+0.000000i 7 0.3779645+0.0000000i 1+0i 2.645751+0.000000i 7+0i 18.520259+0.000000i 8 0.3535534+0.0000000i 1+0i 2.828427+0.000000i 8+0i 22.627417+0.000000i 9 0.3333333+0.0000000i 1+0i 3.000000+0.000000i 9+0i 27.000000+0.000000i 10 0.3162278+0.0000000i 1+0i 3.162278+0.000000i 10+0i 31.622777+0.000000i 11 0.3015113+0.0000000i 1+0i 3.316625+0.000000i 11+0i 36.482873+0.000000i 12 0.2886751+0.0000000i 1+0i 3.464102+0.000000i 12+0i 41.569219+0.000000i ^ 2 -4 16+0i -3 9+0i -2 4+0i -1 1+0i 0 0+0i 1 1+0i 2 4+0i 3 9+0i 4 16+0i 5 25+0i 6 36+0i 7 49+0i 8 64+0i 9 81+0i 10 100+0i 11 121+0i 12 144+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign12# #argv <- list(structure(list(fair = c(326L, 688L, 343L, 98L), red = c(38L, 116L, 84L, 48L), medium = c(241L, 584L, 909L, 403L), dark = c(110L, 188L, 412L, 681L), black = c(3L, 4L, 26L, 85L)), .Names = c('fair', 'red', 'medium', 'dark', 'black'), class = 'data.frame', row.names = c('blue', 'light', 'medium', 'dark')), value = list(c('blue', 'light', 'medium', 'dark'), c('F', 'R', 'M', 'D', 'B')));`dimnames<-`(argv[[1]],argv[[2]]); F R M D B blue 326 38 241 110 3 light 688 116 584 188 4 medium 343 84 909 412 26 dark 98 48 403 681 85 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign13# #argv <- list(structure(c(4L, 96L, 0L, 99L, 0L, 1L, 91L, 0L, 9L, 99L, 0L, 1L, 4L, 0L, 96L, 82L, 18L, 0L, 87L, 13L, 0L, 92L, 0L, 8L, 2L, 1L, 97L, 81L, 19L, 0L, 44L, 56L, 0L, 12L, 88L, 0L, 22L, 78L, 0L, 5L, 95L, 0L, 1L, 99L, 0L, 57L, 43L, 0L, 24L, 76L, 0L, 1L, 99L, 0L, 13L, 87L, 0L, 2L, 0L, 98L, 4L, 0L, 96L, 4L, 0L, 96L, 8L, 0L, 92L, 2L, 0L, 98L), .Dim = c(3L, 24L), .Dimnames = structure(list(cluster = c('1', '2', '3'), obs = c(' 30', ' 243', ' 245', ' 309', ' 562', ' 610', ' 708', ' 727', ' 770', '1038', '1081', '1120', '1248', '1289', '1430', '1610', '1644', '1683', '1922', '2070', '2380', '2662', '2821', '2983')), .Names = c('cluster', 'obs'))), value = structure(list(cluster = c('1', '2', '3'), obs = c(' 30', ' 243', ' 245', ' 309', ' 562', ' 610', ' 708', ' 727', ' 770', '1038', '1081', '1120', '1248', '1289', '1430', '1610', '1644', '1683', '1922', '2070', '2380', '2662', '2821', '2983')), .Names = c('cluster', 'obs')));`dimnames<-`(argv[[1]],argv[[2]]); obs cluster 30 243 245 309 562 610 708 727 770 1038 1081 1120 1248 1289 1 4 99 91 99 4 82 87 92 2 81 44 12 22 5 2 96 0 0 0 0 18 13 0 1 19 56 88 78 95 3 0 1 9 1 96 0 0 8 97 0 0 0 0 0 obs cluster 1430 1610 1644 1683 1922 2070 2380 2662 2821 2983 1 1 57 24 1 13 2 4 4 8 2 2 99 43 76 99 87 0 0 0 0 0 3 0 0 0 0 0 98 96 96 92 98 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign14# #argv <- list(structure(c(0, 0, 0, 0), .Dim = c(2L, 2L), .Dimnames = list(NULL, c('A', 'B'))), value = list(NULL, c('A', 'B')));`dimnames<-`(argv[[1]],argv[[2]]); A B [1,] 0 0 [2,] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign15# #argv <- list(structure(c('NULL', 'double', 'integer', 'complex', 'list', 'list', 'pairlist', 'builtin', 'closure', 'symbol', 'symbol', 'language', 'language', 'symbol', 'symbol', 'NULL', 'double', 'integer', 'complex', 'list', 'list', 'pairlist', 'function', 'function', 'symbol', 'symbol', 'language', 'language', 'symbol', 'symbol', 'NULL', 'numeric', 'numeric', 'complex', 'list', 'list', 'pairlist', 'function', 'function', 'name', 'name', 'call', '(', 'name', 'name'), .Dim = c(15L, 3L), .Dimnames = list( c('NULL', '1', '1:1', '1i', 'list(1)', 'data.frame(x = 1)', 'pairlist(pi)', 'c', 'lm', 'formals(lm)[[1]]', 'formals(lm)[[2]]', 'y ~ x', 'expression((1))[[1]]', '(y ~ x)[[1]]', 'expression(x <- pi)[[1]][[1]]'), c('typeof(.)', 'storage.mode(.)', 'mode(.)'))), value = list(c('NULL', '1', '1:1', '1i', 'list(1)', 'data.frame(x = 1)', 'pairlist(pi)', 'c', 'lm', 'formals(lm)[[1]]', 'formals(lm)[[2]]', 'y ~ x', 'expression((1))[[1]]', '(y ~ x)[[1]]', 'expression(x <- pi)[[1]][[1]]'), c('typeof(.)', 'storage.mode(.)', 'mode(.)')));`dimnames<-`(argv[[1]],argv[[2]]); typeof(.) storage.mode(.) mode(.) NULL "NULL" "NULL" "NULL" 1 "double" "double" "numeric" 1:1 "integer" "integer" "numeric" 1i "complex" "complex" "complex" list(1) "list" "list" "list" data.frame(x = 1) "list" "list" "list" pairlist(pi) "pairlist" "pairlist" "pairlist" c "builtin" "function" "function" lm "closure" "function" "function" formals(lm)[[1]] "symbol" "symbol" "name" formals(lm)[[2]] "symbol" "symbol" "name" y ~ x "language" "language" "call" expression((1))[[1]] "language" "language" "(" (y ~ x)[[1]] "symbol" "symbol" "name" expression(x <- pi)[[1]][[1]] "symbol" "symbol" "name" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign2# #argv <- list(structure(1:24, .Dim = 2:4, .Dimnames = list(c('A', 'B'), NULL, NULL)), value = list(c('A', 'B'), NULL, NULL));`dimnames<-`(argv[[1]],argv[[2]]); , , 1 [,1] [,2] [,3] A 1 3 5 B 2 4 6 , , 2 [,1] [,2] [,3] A 7 9 11 B 8 10 12 , , 3 [,1] [,2] [,3] A 13 15 17 B 14 16 18 , , 4 [,1] [,2] [,3] A 19 21 23 B 20 22 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign3# #argv <- list(structure(c(NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), .Dim = 3:4), value = NULL);`dimnames<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] NA NA NA NA [2,] NA NA NA NA [3,] NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign4# #argv <- list(structure(numeric(0), .Dim = c(0L, 20L)), value = NULL);`dimnames<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [,14] [,15] [,16] [,17] [,18] [,19] [,20] ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign5# #argv <- list(structure(c(0, 0, 0, 0, 0, 7, 0, 0, 0, 0, 12, 0, 0, 0, 0, 0, 0, 0, 0, 0, 22, 0, 0, 25, 0, 0, 0, 0, 30, 0, 0, 0, 0, 0, 0, 0, 38, 39, 0, 0, 0, 0, 0, 86, 0, 0, 0, 90, 91, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 103, 0, 0, 0, 0, 0, 0, 0, 0, 0, 113, 114, 0, 0, 0, 0, 0, 0, 121, 0, 0, 0, 0, 0, 128, 129, 0, 0, 132, 133, 0, 0, 0, 0, 138, 0, 0, 141, 142, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 159, 0, 1, 0, 0, 0, 2, 0, 0, 0, 1, 171, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 187, 0, 1, 0, 0, 0, 193, 0, 0, 196, 0, 0, 0, 1, 1, 202, 0, 0, 3, 0, 208, 0, 2, 0, 212, 0, 0, 0, 0, 0, 218, 0, 220, 1, 0, 0, 0, 0, 226, 227, 0, 2, 230, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 241, 0, 0, 0, 0, 0, 0, 0, 250, 251, 0, 0, 0, 255, 256, 257, 0, 0, 0, 261, 262, 0, 264, 0, 0, 0, 268, 0, 0, 0, 0, 0, 0, 275, 276, 0, 0, 0, 0, 0, 0, 0, 0, 0, 287, 0, 0, 290, 0, 292, 293, 0, 0, 0, 0, 0, 0, 300, 0, 0, 0, 0, 305, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 319, 0, 0, 0, 324, 0, 0, 0, 328, 329, 0, 0, 0, 0, 0, 335, 0, 0, 0, 339, 340, 0, 0, 343, 0, 0, 0, 0, 0, 0, 0, 351, 0, 0, 354, 0, 0, 0, 0, 0, 360, 0, 0, 0, 0, 0, 0, 0, 0, 0, 371, 0, 0, 0, 0, 0, 0, 0, 379, 0, 0, 0, 0, 0, 385, 0, 387, 0, 389, 0, 391, 0, 393, 394, 395, 396, 0, 0, 399, 0, 0, 0, 0, 405, 1, 407, 408, 0, 2, 0, 0, 0, 414, 415, 0, 417, 0, 0, 0, 0, 0, 0, 424, 0, 0, 0, 428, 1, 0, 431, 0, 433, 0, 435, 0, 0, 0, 439, 1, 441, 0, 0, 0, 0, 0, 0, 0, 0, 0, 452, 0, 0, 0, 0, 457, 0, 0, 0, 461, 0, 463, 0, 0, 0, 0, 0, 0, 0, 0, 0, 473, 474, 475, 0, 477, 0, 0, 0, 0, 482, 484, 0, 0, 487, 0, 0, 490, 491, 492, 0, 0, 0, 0, 0, 0, 499, 0, 501, 502, 0, 0, 0, 0, 0, 0, 0, 510, 0, 0, 0, 0, 515, 516, 0, 0, 519, 0, 0, 522, 524, 0, 0, 527, 528, 529, 530, 0, 532, 533, 0, 0, 0, 0, 538, 0, 0, 0, 0, 0, 0, 0, 0, 0, 548, 0, 0, 0, 0, 553, 0, 555, 0, 0, 0, 0, 560, 561, 0, 564, 0, 566, 0, 568, 0, 570, 0, 0, 0, 0, 0, 0, 0, 0, 0, 580, 0, 0, 0, 0, 0, 586, 0, 0, 589, 0, 0, 592, 593, 594, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 608, 0, 0, 0, 0, 0, 614, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 625, 626, 0, 628, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 640, 0, 0, 0, 645, 1, 0, 648, 0, 0, 0, 0, 653, 0, 0, 0, 657, 0, 0, 0, 0, 0, 0, 0, 665, 0, 0, 0, 0, 670, 671, 0, 0, 0, 675, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 691, 0, 0, 0, 695, 0, 697, 0, 0, 700, 0, 702, 0, 0, 0, 0, 0, 708, 0, 710, 711, 0, 0, 0, 0, 716, 0, 718, 0, 0, 0, 722, 0, 0, 0, 727, 728, 729, 0, 731, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 745, 0, 747, 0, 0, 750, 0, 0, 0, 0, 0, 0, 0, 0, 0, 760, 0, 0, 764, 0, 2, 0, 0, 0, 0, 0, 772, 0, 0, 0, 776, 777, 0, 0, 0, 1, 0, 0, 784, 0, 0, 0, 0, 2, 0, 0, 0, 0, 0, 0, 796, 0, 0, 0, 1), .Dim = c(39L, 19L)), value = NULL);`dimnames<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [1,] 0 0 121 1 1 241 0 0 0 0 441 0 0 [2,] 0 0 0 0 202 0 0 0 0 0 0 482 522 [3,] 0 0 0 0 0 0 0 324 0 0 0 484 524 [4,] 0 0 0 0 0 0 0 0 0 405 0 0 0 [5,] 0 86 0 2 3 0 0 0 0 1 0 0 0 [6,] 7 0 0 0 0 0 287 0 0 407 0 487 527 [7,] 0 0 128 0 208 0 0 328 0 408 0 0 528 [8,] 0 0 129 0 0 0 0 329 0 0 0 0 529 [9,] 0 90 0 1 2 250 290 0 0 2 0 490 530 [10,] 0 91 0 171 0 251 0 0 371 0 0 491 0 [11,] 12 0 132 0 212 0 292 0 0 0 452 492 532 [12,] 0 0 133 0 0 0 293 0 0 0 0 0 533 [13,] 0 0 0 0 0 0 0 0 0 414 0 0 0 [14,] 0 0 0 0 0 255 0 335 0 415 0 0 0 [15,] 0 0 0 0 0 256 0 0 0 0 0 0 0 [16,] 0 0 0 0 0 257 0 0 0 417 457 0 0 [17,] 0 0 138 0 218 0 0 0 0 0 0 0 538 [18,] 0 0 0 0 0 0 0 339 379 0 0 499 0 [19,] 0 0 0 0 220 0 300 340 0 0 0 0 0 [20,] 0 0 141 1 1 261 0 0 0 0 461 501 0 [21,] 22 0 142 0 0 262 0 0 0 0 0 502 0 [22,] 0 103 0 0 0 0 0 343 0 0 463 0 0 [23,] 0 0 0 0 0 264 0 0 0 424 0 0 0 [24,] 25 0 0 0 0 0 305 0 385 0 0 0 0 [25,] 0 0 0 0 226 0 0 0 0 0 0 0 0 [26,] 0 0 0 187 227 0 0 0 387 0 0 0 0 [27,] 0 0 0 0 0 268 0 0 0 428 0 0 548 [28,] 0 0 0 1 2 0 0 0 389 1 0 0 0 [29,] 30 0 0 0 230 0 0 0 0 0 0 510 0 [30,] 0 0 0 0 0 0 0 351 391 431 0 0 0 [31,] 0 0 0 0 0 0 0 0 0 0 0 0 0 [32,] 0 113 0 193 0 0 0 0 393 433 473 0 553 [33,] 0 114 0 0 0 0 0 354 394 0 474 0 0 [34,] 0 0 0 0 0 275 0 0 395 435 475 515 555 [35,] 0 0 0 196 0 276 0 0 396 0 0 516 0 [36,] 0 0 0 0 0 0 0 0 0 0 477 0 0 [37,] 38 0 0 0 0 0 0 0 0 0 0 0 0 [38,] 39 0 159 0 0 0 319 0 399 439 0 519 0 [39,] 0 0 0 1 0 0 0 360 0 1 0 0 560 [,14] [,15] [,16] [,17] [,18] [,19] [1,] 561 0 0 0 0 0 [2,] 0 0 0 0 722 0 [3,] 564 0 0 0 0 764 [4,] 0 0 645 0 0 0 [5,] 566 0 1 0 0 2 [6,] 0 0 0 0 727 0 [7,] 568 608 648 0 728 0 [8,] 0 0 0 0 729 0 [9,] 570 0 0 0 0 0 [10,] 0 0 0 691 731 0 [11,] 0 0 0 0 0 772 [12,] 0 0 653 0 0 0 [13,] 0 614 0 0 0 0 [14,] 0 0 0 695 0 0 [15,] 0 0 0 0 0 776 [16,] 0 0 657 697 0 777 [17,] 0 0 0 0 0 0 [18,] 0 0 0 0 0 0 [19,] 580 0 0 700 0 0 [20,] 0 0 0 0 0 1 [21,] 0 0 0 702 0 0 [22,] 0 0 0 0 0 0 [23,] 0 0 0 0 0 784 [24,] 0 625 665 0 745 0 [25,] 586 626 0 0 0 0 [26,] 0 0 0 0 747 0 [27,] 0 628 0 708 0 0 [28,] 589 0 0 0 0 2 [29,] 0 0 670 710 750 0 [30,] 0 0 671 711 0 0 [31,] 592 0 0 0 0 0 [32,] 593 0 0 0 0 0 [33,] 594 0 0 0 0 0 [34,] 0 0 675 0 0 0 [35,] 0 0 0 716 0 796 [36,] 0 0 0 0 0 0 [37,] 0 0 0 718 0 0 [38,] 0 0 0 0 0 0 [39,] 0 640 0 0 760 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign6# #argv <- list(structure(c(-75, 0, 103, 0, 124, -1, 0, -2.77555756156289e-17, 0, -1.66533453693773e-16, 0, 0, 0, 178, 0), .Dim = c(5L, 3L)), value = NULL);`dimnames<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] -75 -1.000000e+00 0 [2,] 0 0.000000e+00 0 [3,] 103 -2.775558e-17 0 [4,] 0 0.000000e+00 178 [5,] 124 -1.665335e-16 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign7# #argv <- list(structure(c(-0.0124410638457178, NA, 0.00669768951701377, NA, 0.00669754897238661, NA, 3.45036480545864, 2.52673085623929, 1, 2.64771226663238, 0.0632378108418818, 0.404928794321981), .Dim = c(2L, 6L), .Dimnames = list(c('linear', 'nonlin'), NULL)), value = list(c('linear', 'nonlin'), NULL));`dimnames<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] linear -0.01244106 0.00669769 0.006697549 3.450365 1.000000 0.06323781 nonlin NA NA NA 2.526731 2.647712 0.40492879 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign8# #argv <- list(structure(c(300, 3000, 400, 4000), .Dim = c(2L, 2L)), value = NULL);`dimnames<-`(argv[[1]],argv[[2]]); [,1] [,2] [1,] 300 400 [2,] 3000 4000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dimnamesassign.testdimnamesassign9# #argv <- list(structure(c(1259, 1360, 845, 1053, 719, 774, 390, 413), .Dim = c(2L, 4L), .Dimnames = list(c('a', 'b'), NULL)), value = list(c('a', 'b')));`dimnames<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] a 1259 845 719 390 b 1360 1053 774 413 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dir.testdir1# #argv <- structure(list(path = '.', pattern = 'myTst_.*tar[.]gz$'), .Names = c('path', 'pattern'));do.call('dir', argv) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dircreate.testlistdirs1# #dir.create('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple', showWarnings=F, recursive=F) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dircreate.testlistdirs1# #dir.create('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple', showWarnings=T, recursive=T) Warning message: In dir.create("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple", : 'com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple' already exists ##com.oracle.truffle.r.test.builtins.TestBuiltin_dircreate.testlistdirs1# #unlink('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1', recursive=T); dir.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1'); dir.create('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1'); dir.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1'); [1] FALSE [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_dircreate.testlistdirs1# #unlink('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1', recursive=T); dir.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1'); dir.create('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1/createDirTest2', recursive=T); dir.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1/createDirTest2') [1] FALSE [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_dircreate.testlistdirs1# #unlink('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1', recursive=T); dir.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1'); dir.create('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1/createDirTest2', showWarnings=F, recursive=F); dir.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1/createDirTest2') [1] FALSE [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_dircreate.testlistdirs1# #unlink('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1', recursive=T); dir.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1'); dir.create('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1/createDirTest2', showWarnings=T, recursive=F); dir.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1/createDirTest2') [1] FALSE Warning message: In dir.create("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1/createDirTest2", : cannot create dir 'com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/createDirTest1/createDirTest2', reason 'No such file or directory' [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_dirname.testdirname1# #argv <- list('/home/roman/r-instrumented/library/graphics'); .Internal(dirname(argv[[1]])) [1] "/home/roman/r-instrumented/library" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dirname.testdirname2# #argv <- list('/home/lzhao/hg/r-instrumented/tests/Packages/survival/inst/CITATION'); .Internal(dirname(argv[[1]])) [1] "/home/lzhao/hg/r-instrumented/tests/Packages/survival/inst" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dirname.testdirname3# #argv <- list(character(0)); .Internal(dirname(argv[[1]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dirname.testdirname4#Ignored.Unstable# #argv <- list(c('ChangeLog', 'DESCRIPTION', 'INDEX', 'MD5', 'NAMESPACE', 'PORTING', 'R/0aaa.R', 'R/agnes.q', 'R/clara.q', 'R/clusGap.R', 'R/coef.R', 'R/daisy.q', 'R/diana.q', 'R/ellipsoidhull.R', 'R/fanny.q', 'R/internal.R', 'R/mona.q', 'R/pam.q', 'R/plothier.q', 'R/plotpart.q', 'R/silhouette.R', 'R/zzz.R', 'README', 'data/agriculture.tab', 'data/animals.tab', 'data/chorSub.rda', 'data/flower.R', 'data/plantTraits.rda', 'data/pluton.tab', 'data/ruspini.tab', 'data/votes.repub.tab', 'data/xclara.rda', 'inst/CITATION', 'inst/po/de/LC_MESSAGES/R-cluster.mo', 'inst/po/en@quot/LC_MESSAGES/R-cluster.mo', 'inst/po/pl/LC_MESSAGES/R-cluster.mo', 'man/agnes.Rd', 'man/agnes.object.Rd', 'man/agriculture.Rd', 'man/animals.Rd', 'man/bannerplot.Rd', 'man/chorSub.Rd', 'man/clara.Rd', 'man/clara.object.Rd', 'man/clusGap.Rd', 'man/clusplot.default.Rd', 'man/clusplot.partition.Rd', 'man/cluster-internal.Rd', 'man/coef.hclust.Rd', 'man/daisy.Rd', 'man/diana.Rd', 'man/dissimilarity.object.Rd', 'man/ellipsoidhull.Rd', 'man/fanny.Rd', 'man/fanny.object.Rd', 'man/flower.Rd', 'man/lower.to.upper.tri.inds.Rd', 'man/mona.Rd', 'man/mona.object.Rd', 'man/pam.Rd', 'man/pam.object.Rd', 'man/partition.object.Rd', 'man/plantTraits.Rd', 'man/plot.agnes.Rd', 'man/plot.diana.Rd', 'man/plot.mona.Rd', 'man/plot.partition.Rd', 'man/pltree.Rd', 'man/pltree.twins.Rd', 'man/pluton.Rd', 'man/predict.ellipsoid.Rd', 'man/print.agnes.Rd', 'man/print.clara.Rd', 'man/print.diana.Rd', 'man/print.dissimilarity.Rd', 'man/print.fanny.Rd', 'man/print.mona.Rd', 'man/print.pam.Rd', 'man/ruspini.Rd', 'man/silhouette.Rd', 'man/sizeDiss.Rd', 'man/summary.agnes.Rd', 'man/summary.clara.Rd', 'man/summary.diana.Rd', 'man/summary.mona.Rd', 'man/summary.pam.Rd', 'man/twins.object.Rd', 'man/volume.ellipsoid.Rd', 'man/votes.repub.Rd', 'man/xclara.Rd', 'po/R-cluster.pot', 'po/R-de.po', 'po/R-en@quot.po', 'po/R-pl.po', 'po/update-me.sh', 'src/clara.c', 'src/cluster.h', 'src/daisy.f', 'src/dysta.f', 'src/fanny.c', 'src/ind_2.h', 'src/init.c', 'src/mona.f', 'src/pam.c', 'src/sildist.c', 'src/spannel.c', 'src/twins.c', 'tests/agnes-ex.R', 'tests/agnes-ex.Rout.save', 'tests/clara-NAs.R', 'tests/clara-NAs.Rout.save', 'tests/clara-ex.R', 'tests/clara.R', 'tests/clara.Rout.save', 'tests/clusplot-out.R', 'tests/clusplot-out.Rout.save', 'tests/daisy-ex.R', 'tests/daisy-ex.Rout.save', 'tests/diana-boots.R', 'tests/diana-ex.R', 'tests/diana-ex.Rout.save', 'tests/ellipsoid-ex.R', 'tests/ellipsoid-ex.Rout.save', 'tests/fanny-ex.R', 'tests/mona.R', 'tests/mona.Rout.save', 'tests/pam.R', 'tests/pam.Rout.save', 'tests/silhouette-default.R', 'tests/silhouette-default.Rout.save', 'tests/sweep-ex.R')); .Internal(dirname(argv[[1]])) [1] "." "." [3] "." "." [5] "." "." [7] "R" "R" [9] "R" "R" [11] "R" "R" [13] "R" "R" [15] "R" "R" [17] "R" "R" [19] "R" "R" [21] "R" "R" [23] "." "data" [25] "data" "data" [27] "data" "data" [29] "data" "data" [31] "data" "data" [33] "inst" "inst/po/de/LC_MESSAGES" [35] "inst/po/en@quot/LC_MESSAGES" "inst/po/pl/LC_MESSAGES" [37] "man" "man" [39] "man" "man" [41] "man" "man" [43] "man" "man" [45] "man" "man" [47] "man" "man" [49] "man" "man" [51] "man" "man" [53] "man" "man" [55] "man" "man" [57] "man" "man" [59] "man" "man" [61] "man" "man" [63] "man" "man" [65] "man" "man" [67] "man" "man" [69] "man" "man" [71] "man" "man" [73] "man" "man" [75] "man" "man" [77] "man" "man" [79] "man" "man" [81] "man" "man" [83] "man" "man" [85] "man" "man" [87] "man" "man" [89] "man" "man" [91] "po" "po" [93] "po" "po" [95] "po" "src" [97] "src" "src" [99] "src" "src" [101] "src" "src" [103] "src" "src" [105] "src" "src" [107] "src" "tests" [109] "tests" "tests" [111] "tests" "tests" [113] "tests" "tests" [115] "tests" "tests" [117] "tests" "tests" [119] "tests" "tests" [121] "tests" "tests" [123] "tests" "tests" [125] "tests" "tests" [127] "tests" "tests" [129] "tests" "tests" [131] "tests" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dirname.testdirname5# #argv <- list(structure('/home/lzhao/hg/r-instrumented/library/utils', .Names = 'Dir')); .Internal(dirname(argv[[1]])) [1] "/home/lzhao/hg/r-instrumented/library" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dirname.testdirname7# #argv <- structure(list(path = character(0)), .Names = 'path');do.call('dirname', argv) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dirname.testdirname8# #dirname('.') [1] "." ##com.oracle.truffle.r.test.builtins.TestBuiltin_dirname.testdirname8# #dirname('/') [1] "/" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dnorm.testDnorm# #dnorm(c(0,1,-1,10,-10,3.14,0.1), log=FALSE) [1] 3.989423e-01 2.419707e-01 2.419707e-01 7.694599e-23 7.694599e-23 [6] 2.883534e-03 3.969525e-01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dnorm.testDnorm# #dnorm(c(0,1,-1,10,-10,3.14,0.1), log=TRUE) [1] -0.9189385 -1.4189385 -1.4189385 -50.9189385 -50.9189385 -5.8487385 [7] -0.9239385 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dnorm.testDnorm# #dnorm(c(0,1,-1,10,-10,3.14,0.1), mean=3) [1] 4.431848e-03 5.399097e-02 1.338302e-04 9.134720e-12 7.998828e-38 [6] 3.950517e-01 5.952532e-03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dnorm.testDnormSigma# #dnorm(42, mean=42, sd=-1) [1] NaN Warning message: In dnorm(42, mean = 42, sd = -1) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_dnorm.testDnormSigma# #dnorm(c(0,1,-1,10,-10,3.14,0.1), sd=-1) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In dnorm(c(0, 1, -1, 10, -10, 3.14, 0.1), sd = -1) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_dnorm.testDnormSigma# #dnorm(c(0,1,-1,10,-10,3.14,0.1), sd=0) [1] Inf 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dnorm.testDnormSigma# #dnorm(c(0,1,-1,10,-10,3.14,0.1), sd=0.5) [1] 7.978846e-01 1.079819e-01 1.079819e-01 1.104190e-87 1.104190e-87 [6] 2.177711e-09 7.820854e-01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dnorm.testDnormWithInfinity# #dnorm(1/0) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dnorm.testDnormWithInfinity# #dnorm(10, mean=1/0) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dnorm.testDnormWithInfinity# #dnorm(10, sd=1/0) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_doTrace.testdoTrace1# #argv <- list(c(1, 1, 2));.doTrace(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_doTrace.testdoTrace3# #argv <- structure(list(expr = expression(quote(x <- c(1, x)))), .Names = 'expr');do.call('.doTrace', argv) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #do.call('c', list()) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall#Output.IgnoreErrorContext# #typeof(do.call(function(x) x, list(as.symbol('foo')))) Error in (function (x) : object 'foo' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #typeof(do.call(function(x) x, list(as.symbol('foo')), quote=TRUE)) [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #v1 <- as.numeric_version('3.0.0'); v2 <- as.numeric_version('3.1.0'); do.call('<', list(quote(v1), quote(v2))) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #v1 <- as.numeric_version('3.0.0'); v2 <- as.numeric_version('3.1.0'); do.call('<', list(v1, v2)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ boo <- function(c) ls(parent.frame(2)); foo <- function(a,b) boo(a); bar <- function(x,z) do.call('foo', list(1,2)); bar() } [1] "x" "z" ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ boo <- function(c) ls(parent.frame(2)); foo <- function(a,b) boo(a); bar <- function(x,z) do.call('foo', list(parse(text='goo()'),2)); bar() } [1] "x" "z" ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ boo <- function(c) ls(parent.frame(3)); foo <- function(a,b) boo(a); bar <- function(x,z) do.call('foo', list(parse(text='goo()'),2)); baz <- function(bazX) bar(bazX,1); baz(); } [1] "bazX" ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ do.call("+", list(quote(1), 2))} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ do.call('+', list(data.frame(1), data.frame(2)), envir = new.env()); do.call('assign', list('a',2,new.env()), envir = new.env()); } ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ do.call(quote, list(quote(1)))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ do.call(quote, list(quote(x)))} x ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ do.call(quote, list(quote(x+1)))} x + 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ e <- new.env(); assign('a', 42, e); a <- 1; foo <- function(x) force(x); do.call('foo', list(as.name('a')), envir=e); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ e <- new.env(); assign('a', 42, e); a <- 1; foo <- function(x) force(x); do.call('foo', list(as.name('a')), envir=e, quote=T); } a ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ e <- new.env(); assign('foo', 42, e); foo <- function(x) 1; do.call('foo', list(), envir=e); } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ e <- new.env(); assign('foo', function() 42, e); foo <- function(x) 1; do.call('foo', list(), envir=e); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ f <- function() typeof(sys.call(0)[[1]]); do.call('f', list()); } [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall#Output.IgnoreErrorContext# #{ f <- function(x) x; do.call(f, list(quote(y + 1)))} Error in (function (x) : object 'y' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall#Output.IgnoreErrorContext# #{ f <- function(x) x; do.call(f, list(quote(y)))} Error in (function (x) : object 'y' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ f1 <- function(a) ls(parent.frame(2)); f2 <- function(b) f1(b); f3 <- function(c) f2(c); f4 <- function(d) do.call('f3', list(d)); f4(42); } [1] "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ foo <- function() ls(parent.frame()); bar <- function(a,b,c) do.call('foo', list()); bar(a=1,b=2,c=3); } [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ foo <- function() ls(parent.frame()); bar <- function(a,b,c) do.call('foo', list(), envir=globalenv()); bar(a=1,b=2,c=3) } [1] "bar" "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ foo <- function(a,b) list(a=a,b=b); e <- new.env(); assign('a', 2); assign('b', 3); a<-0; b<-1; do.call('foo', list(a,b), env=e); } $a [1] 0 $b [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ foo <- function(a,b) list(a=a,b=b); e <- new.env(); assign('a', 2); assign('b', 3); a<-0; b<-1; do.call('foo', list(a=as.name('a'),as.name('b')), env=e) } $a [1] 0 $b [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ foo <- function(a,b,c) { cat('foo called.'); list(a=a,b=b,c=c); }; side <- function() { cat('side effect!'); 42 }; do.call('foo', list(parse(text='side()')[[1]], 0, 0)); } foo called.side effect!$a [1] 42 $b [1] 0 $c [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_docall.testDoCall# #{ x<-list(c(1,2)); do.call("as.matrix", x) } [,1] [1,] 1 [2,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdotelt1# #tst <- function(n,...) ...elt(n); b <- function() {print('b')}; tst(1, b()) [1] "b" [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdotelt1# #tst <- function(n,...) ...elt(n); a <- 1; tst(a, 1, 2, 3) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdotelt1# #tst <- function(n,...) ...elt(n); f <- function() {print('hello')}; tst(1, f(), f(), 3) [1] "hello" [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdotelt1# #tst <- function(n,...) ...elt(n); tst(1, 1, 2, 3) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdotelt1# #tst <- function(n,...) ...elt(n); tst(1, NA) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdotelt1# #tst <- function(n,...) ...elt(n); tst(1.6, 1, 2, 3) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdotelt1# #tst <- function(n,...) ...elt(n); tst(c(1), c(1,2,3)) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdotelt1# #tst <- function(n,...) {print('a'); ...elt(n); print('c')}; b <- function() {print('b')}; tst(1, b()) [1] "a" [1] "b" [1] "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError#Output.IgnoreErrorMessage# #tst <- function(n,...) ...elt(); tst(c(1), c(1,2,3)) Error in ...elt() : 0 arguments passed to '...elt' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError# #tst <- function(n,...) ...elt(n); tst(' ', 1, 2) Error in ...elt(n) : indexing '...' with an invalid index ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError# #tst <- function(n,...) ...elt(n); tst('1', 1, 2, 3) Error in ...elt(n) : indexing '...' with an invalid index ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError# #tst <- function(n,...) ...elt(n); tst(-1, 1) Error in tst(-1, 1) : indexing '...' with non-positive index -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError# #tst <- function(n,...) ...elt(n); tst(0, 1) Error in tst(0, 1) : indexing '...' with non-positive index 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError# #tst <- function(n,...) ...elt(n); tst(1) Error in tst(1) : the ... list contains fewer than 1 element ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError# #tst <- function(n,...) ...elt(n); tst(1+1i, 1, 2, 3) Error in ...elt(n) : indexing '...' with an invalid index ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError# #tst <- function(n,...) ...elt(n); tst(5, 1, 2, 3) Error in tst(5, 1, 2, 3) : the ... list contains fewer than 5 elements ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError# #tst <- function(n,...) ...elt(n); tst(NA, 1, 2, 3) Error in tst(NA, 1, 2, 3) : indexing '...' with non-positive index -2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError# #tst <- function(n,...) ...elt(n); tst(c(3,2,1), 1, 2, 3) Error in ...elt(n) : indexing '...' with an invalid index ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotelt.testdotdotdoteltError# #tst <- function(n,...) ...elt(n); tst(list(1), 1, 2, 3) Error in ...elt(n) : indexing '...' with an invalid index ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotlength.testdotdotdotLength# #tst <- function(...) ...length(); a <- 1; tst(a, 1) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotlength.testdotdotdotLength# #tst <- function(...) ...length(); tst() [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotlength.testdotdotdotLength# #tst <- function(...) ...length(); tst(1, 2, 3) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotlength.testdotdotdotLength# #tst <- function(..., a) ...length(); tst(c(3,2,1), 'a', TRUE, 3.6) [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotlength.testdotdotdotLength# #tst <- function(a, b, c, ...) ...length(); tst(c(3,2,1), 'a', TRUE, 3.6, print('hi')) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotlength.testdotdotdotLengthErr# #tst <- function() ...length(); tst() Error in tst() : incorrect context: the current call has no '...' to look in ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotlength.testdotdotdotLengthErr#Ignored.ImplementationError# #tst <- function() ...length(n); tst() Error in tst() : object 'n' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_dotdotdotlength.testdotdotdotLengthErr# #tst <- function(a) ...length(); tst(1, 2, 3) Error in tst(1, 2, 3) : unused arguments (2, 3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_double.testdouble1# #argv <- list();do.call('double', argv) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dput.testdput# #x <- structure(list(A = c(1L, 1L), B = structure(c(1L, 1L), .Label = c('G', 'D'), class = 'factor'), C = structure(c(1L, 1L), .Label = c('G', 'D'), class = 'factor')), .Names = c('A', 'B', 'C'), row.names = 1:2, class = 'data.frame'); dput(x) structure(list(A = c(1L, 1L), B = structure(c(1L, 1L), .Label = c("G", "D"), class = "factor"), C = structure(c(1L, 1L), .Label = c("G", "D"), class = "factor")), row.names = 1:2, class = "data.frame") ##com.oracle.truffle.r.test.builtins.TestBuiltin_dput.testdput1# #argv <- list(logical(0), structure(1L, class = c('terminal', 'connection')), 69); .Internal(dput(argv[[1]], argv[[2]], argv[[3]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dput.testdput2# #argv <- list(structure(1, .Dim = 1L), structure(1L, class = c('terminal', 'connection')), 95); .Internal(dput(argv[[1]], argv[[2]], argv[[3]])) structure(1, .Dim = 1L) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dput.testdput3# #argv <- list(character(0), structure(1L, class = c('terminal', 'connection')), 69); .Internal(dput(argv[[1]], argv[[2]], argv[[3]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dput.testdput4# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)), structure(1L, class = c('terminal', 'connection')), 69); .Internal(dput(argv[[1]], argv[[2]], argv[[3]])) structure(numeric(0), .Dim = c(0L, 0L)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dput.testdput5# #argv <- list(NULL, structure(1L, class = c('terminal', 'connection')), 69); .Internal(dput(argv[[1]], argv[[2]], argv[[3]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_dput.testdput6# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')), structure(1L, class = c('terminal', 'connection')), 69); .Internal(dput(argv[[1]], argv[[2]], argv[[3]])) structure(list(structure(integer(0), .Label = character(0), class = "factor")), .Names = "c0", row.names = character(0), class = c(c0 = "integer(0)")) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dput.testdput7# #argv <- list(FALSE, structure(1L, class = c('terminal', 'connection')), 69); .Internal(dput(argv[[1]], argv[[2]], argv[[3]])) FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_dput.testdput8# #argv <- list(c(0.00508571428571428, 0.876285714285715), structure(1L, class = c('terminal', 'connection')), 69); .Internal(dput(argv[[1]], argv[[2]], argv[[3]])) c(0.00508571428571428, 0.876285714285715) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dqr.testdqrcf# #.Fortran(.F_dqrcf, 1, 1L, 1L, 1, 1, 1L, 1, 1L) [[1]] [1] 1 [[2]] [1] 1 [[3]] [1] 1 [[4]] [1] 1 [[5]] [1] 1 [[6]] [1] 1 [[7]] [1] 1 [[8]] [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dqr.testdqrdc2#Ignored.OutputFormatting# #.Fortran(.F_dqrdc2, 1, 1L, 1L, 1L, 1, 1L, 1, 1L, 1) [[1]] [1] 1 [[2]] [1] 1 [[3]] [1] 1 [[4]] [1] 1 [[5]] [1] 1 [[6]] [1] 1 [[7]] [1] 1 [[8]] NULL [[9]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dqr.testdqrqty# #.Fortran(.F_dqrqty, 1, 1L, 1L, 1, 1, 1L, qty=1) [[1]] [1] 1 [[2]] [1] 1 [[3]] [1] 1 [[4]] [1] 1 [[5]] [1] 1 [[6]] [1] 1 $qty [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dqr.testdqrqy# #.Fortran(.F_dqrqy, 1, 1L, 1L, 1, 1, 1L, 1) [[1]] [1] 1 [[2]] [1] 1 [[3]] [1] 1 [[4]] [1] 1 [[5]] [1] 1 [[6]] [1] 1 [[7]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dqr.testdqrrsd# #.Fortran(.F_dqrrsd, 1, 1L, 1L, 1, 1, 1L, 1) [[1]] [1] 1 [[2]] [1] 1 [[3]] [1] 1 [[4]] [1] 1 [[5]] [1] 1 [[6]] [1] 1 [[7]] [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dqr.testdqrxb# #.Fortran(.F_dqrxb, 1, 1L, 1L, 1, 1, 1L, 1) [[1]] [1] 1 [[2]] [1] 1 [[3]] [1] 1 [[4]] [1] 1 [[5]] [1] 1 [[6]] [1] 1 [[7]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testDrop# #a <- matrix(1:6, 3, 2, dimnames=list(1:3, c(' ','x'))); b <- array(c(1,2), dim=c(2), dimnames=list(c('int', 'x'))); drop(a %*% b); 1 2 3 9 12 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testDrop# #drop(array(1:9, c(3,3,1), list(1:3, 4:6, 'b'))) 4 5 6 1 1 4 7 2 2 5 8 3 3 6 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testDrop# #drop(structure(c(0, 0), .Dim = c(2L, 1L), .Dimnames = list(NULL, 'abc'))) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testDrop# #{ x <- array(1:12, dim = c(1,3,1,1,2,1,2)); drop(x) } , , 1 [,1] [,2] [1,] 1 4 [2,] 2 5 [3,] 3 6 , , 2 [,1] [,2] [1,] 7 10 [2,] 8 11 [3,] 9 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop1# #argv <- list(structure(c(1.50117937791368, 1.64775918264914, 1.38492642933039, 2.16331573723593, 2.09255307288088, 1.44052566560935, 0.318431987979291, 1.53656071009121, 2.26440525774314, 1.31416376497534, 0.495338648866914, 1.09176681985947, 1.27372795677245, 1.95608222019614, 1.5112883299644, 1.48096147381224, 1.88531955584109, 2.15826126121057, 1.49107042586296, 1.77412108328316, 1.19791081639204, 0.884533302819684, 1.21307424446813, 1.68314051482667, 0.181961135294554, 1.71346737097883, 1.29900033689926, 1.4860159498376, 1.00078625140298, 1.52139728201513, 1.42030776150791, 0.505447600917635, 1.5112883299644, 1.33438166907678, 1.81455689148604, -1.61842961254877e-09, 1.40008985740647, 2.10771650095696, 0.611591597450209, 0.136470851066308, 1.10693024793555, 1.61237785047162, 0.990677299352257, 1.28383690882317, 1.33438166907678, 1.44558014163472, 1.15747500818916, 1.30910928894998, 0.753116926160307, 1.4860159498376, 2.10771650095696, 2.40087611042788, 1.27372795677245, 1.16252948421452, 0.985622823326897, 2.05211726467799, 1.3444906211275, 0.768280354236389, 0.844097494616799, 1.22823767254421, 0.980568347301536, 1.10693024793555, 0.899696730895766, 1.67303156277594, 0.995731775377618, 1.68314051482667, 1.42030776150791, 1.55172413816729, 1.55172413816729, 0.722790070008143, 1.98135460032294, 1.39503538138111, 1.14231158011308, 1.07154891575803, 1.08671234383411, 0.662136357703815, 0.808716162439274, 1.91564641199326, 2.08749859685552, 1.15747500818916, 1.3192182410007, 1.02605863152978, 1.18274738831596, 1.23329214856957, 0.783443782312471, 1.65786813469986, 0.965404919225454, 2.27451420979386, 1.25351005267101, 1.22823767254421, 1.74884870315635, 1.54666966214193, 1.99651802839903, 1.22318319651885, 1.09682129588483, 2.06222621672871, 1.82972031956212, 0.808716162439274, 1.66797708675058, 1.74884870315635), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100'))); .Internal(drop(argv[[1]])) 1 2 3 4 5 1.501179e+00 1.647759e+00 1.384926e+00 2.163316e+00 2.092553e+00 6 7 8 9 10 1.440526e+00 3.184320e-01 1.536561e+00 2.264405e+00 1.314164e+00 11 12 13 14 15 4.953386e-01 1.091767e+00 1.273728e+00 1.956082e+00 1.511288e+00 16 17 18 19 20 1.480961e+00 1.885320e+00 2.158261e+00 1.491070e+00 1.774121e+00 21 22 23 24 25 1.197911e+00 8.845333e-01 1.213074e+00 1.683141e+00 1.819611e-01 26 27 28 29 30 1.713467e+00 1.299000e+00 1.486016e+00 1.000786e+00 1.521397e+00 31 32 33 34 35 1.420308e+00 5.054476e-01 1.511288e+00 1.334382e+00 1.814557e+00 36 37 38 39 40 -1.618430e-09 1.400090e+00 2.107717e+00 6.115916e-01 1.364709e-01 41 42 43 44 45 1.106930e+00 1.612378e+00 9.906773e-01 1.283837e+00 1.334382e+00 46 47 48 49 50 1.445580e+00 1.157475e+00 1.309109e+00 7.531169e-01 1.486016e+00 51 52 53 54 55 2.107717e+00 2.400876e+00 1.273728e+00 1.162529e+00 9.856228e-01 56 57 58 59 60 2.052117e+00 1.344491e+00 7.682804e-01 8.440975e-01 1.228238e+00 61 62 63 64 65 9.805683e-01 1.106930e+00 8.996967e-01 1.673032e+00 9.957318e-01 66 67 68 69 70 1.683141e+00 1.420308e+00 1.551724e+00 1.551724e+00 7.227901e-01 71 72 73 74 75 1.981355e+00 1.395035e+00 1.142312e+00 1.071549e+00 1.086712e+00 76 77 78 79 80 6.621364e-01 8.087162e-01 1.915646e+00 2.087499e+00 1.157475e+00 81 82 83 84 85 1.319218e+00 1.026059e+00 1.182747e+00 1.233292e+00 7.834438e-01 86 87 88 89 90 1.657868e+00 9.654049e-01 2.274514e+00 1.253510e+00 1.228238e+00 91 92 93 94 95 1.748849e+00 1.546670e+00 1.996518e+00 1.223183e+00 1.096821e+00 96 97 98 99 100 2.062226e+00 1.829720e+00 8.087162e-01 1.667977e+00 1.748849e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop10# #argv <- list(structure(c(-2.12168716972669e-05, 7.51519194600216e-05, -6.21732236176711e-06), .Dim = c(3L, 1L))); .Internal(drop(argv[[1]])) [1] -2.121687e-05 7.515192e-05 -6.217322e-06 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop11#Output.IgnoreWhitespace# #argv <- list(structure(c(' 16', ' 16', '144', ' 16', ' 16', '128', ' 16', ' 16', '112', ' 16'), .Dim = 10L, .Dimnames = structure(list(c('1', '6', '7', '8', '13', '14', '15', '20', '21', '22')), .Names = ''))); .Internal(drop(argv[[1]])) 1 6 7 8 13 14 15 20 21 22 " 16" " 16" "144" " 16" " 16" "128" " 16" " 16" "112" " 16" ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop13# #argv <- structure(list(x = structure(c(8, 4, 2), .Dim = c(3L, 1L))), .Names = 'x');do.call('drop', argv) [1] 8 4 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop2# #argv <- list(structure(c(FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE), .Dim = c(40L, 1L), .Dimnames = list(c('r1', 'r2', 'r3', 'r4', 'r5', 'r6', 'r7', 'r8', 'r9', 'r10', 'r11', 'r12', 'r13', 'r14', 'r15', 'r16', 'r17', 'r18', 'r19', 'r20', 'r21', 'r22', 'r23', 'r24', 'r25', 'r26', 'r27', 'r28', 'r29', 'r30', 'r31', 'r32', 'r33', 'r34', 'r35', 'r36', 'r37', 'r38', 'r39', 'r40'), 'c1'))); .Internal(drop(argv[[1]])) r1 r2 r3 r4 r5 r6 r7 r8 r9 r10 r11 r12 r13 FALSE FALSE TRUE FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE TRUE FALSE r14 r15 r16 r17 r18 r19 r20 r21 r22 r23 r24 r25 r26 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE TRUE FALSE r27 r28 r29 r30 r31 r32 r33 r34 r35 r36 r37 r38 r39 FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE r40 FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop3# #argv <- list(structure(c(-0.146170181357627, 24.3243243243243, NA, 84.2105263157895, 2.13784643479304), .Dim = c(5L, 1L))); .Internal(drop(argv[[1]])) [1] -0.1461702 24.3243243 NA 84.2105263 2.1378464 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop4# #argv <- list(structure(1, .Dim = c(1L, 1L))); .Internal(drop(argv[[1]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop5# #argv <- list(structure(1:4, .Dim = c(4L, 1L), .Dimnames = list(c('a', 'b', 'c', 'd'), NULL))); .Internal(drop(argv[[1]])) a b c d 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop6# #argv <- list(structure(c(0.0394556761478965, 0.0353930191803619, 0.0421772348795039, 0.0302920451103359, 0.0377457762283076, 0.0338591835815583, 0.0403493901288877, 0.0289792716248635, 0.0342125137383397, 0.0306897327119817, 0.0365724115929804, 0.0262666138482847, 0.0422657427158027, 0.0379137398889158, 0.0451811331581029, 0.032449470138841), .Dim = c(1L, 4L, 4L), .Dimnames = list('1', c('DAX', 'SMI', 'CAC', 'FTSE'), c('DAX', 'SMI', 'CAC', 'FTSE')))); .Internal(drop(argv[[1]])) DAX SMI CAC FTSE DAX 0.03945568 0.03774578 0.03421251 0.04226574 SMI 0.03539302 0.03385918 0.03068973 0.03791374 CAC 0.04217723 0.04034939 0.03657241 0.04518113 FTSE 0.03029205 0.02897927 0.02626661 0.03244947 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop7# #argv <- list(c(10.8924449093617, 19.1956646477802, 5.83862354833301, 8.94491073999977, 10.0151293814506)); .Internal(drop(argv[[1]])) [1] 10.892445 19.195665 5.838624 8.944911 10.015129 ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop8# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0'))); .Internal(drop(argv[[1]])) $c0 factor(0) Levels: attr(,"row.names") character(0) attr(,"class") c0 "integer(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_drop.testdrop9# #argv <- list(structure(FALSE, .Tsp = c(1, 1, 1), class = 'ts')); .Internal(drop(argv[[1]])) Time Series: Start = 1 End = 1 Frequency = 1 [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_dump.testDumpData#Output.IgnoreWhitespace# #{ x <- 10; .Internal(dump("x", stdout(), environment(), .deparseOpts("all"), TRUE))} x <- 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dump.testDumpData#Output.IgnoreWhitespace# #{ x <- 1:10; .Internal(dump("x", stdout(), environment(), .deparseOpts("all"), TRUE))} x <- 1:10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dump.testDumpData#Output.IgnoreWhitespace# #{ x <- c(10,20,25); .Internal(dump("x", stdout(), environment(), .deparseOpts("all"), TRUE))} x <- c(10, 20, 25) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dump.testDumpData# #{ x <- list(a=10,b=20); .Internal(dump("x", stdout(), environment(), .deparseOpts("all"), TRUE))} x <- list(a = 10, b = 20) ##com.oracle.truffle.r.test.builtins.TestBuiltin_dump.testDumpFunctions#Output.IgnoreWhitespace# #{ foo <- function() cat("Hello"); bar <- function() cat("World"); .Internal(dump(c("foo", "bar"), stdout(), environment(), .deparseOpts("all"), TRUE))} foo <- function() cat("Hello") bar <- function() cat("World") ##com.oracle.truffle.r.test.builtins.TestBuiltin_dump.testDumpFunctions#Output.IgnoreWhitespace# #{ fun <- function() print("Hello, World!"); .Internal(dump("fun", stdout(), environment(), .deparseOpts("all"), TRUE))} fun <- function() print("Hello, World!") ##com.oracle.truffle.r.test.builtins.TestBuiltin_dump.testDumpLanguage#Output.IgnoreWhitespace# #{ x <- 2 + 3; .Internal(dump("x", stdout(), environment(), .deparseOpts("all"), FALSE))} x <- 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_dump.testDumpLanguage#Output.IgnoreWhitespace# #{ x <- quote(2 + 3); .Internal(dump("x", stdout(), environment(), .deparseOpts("all"), FALSE))} x <- quote(2 + 3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(NULL, 0); } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c("TRUE", "TRUE", "FALSE", "FALSE"), 1) } [1] FALSE TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c("TRUE", "TRUE", "FALSE", "FALSE"), FALSE) } [1] FALSE TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c("TRUE", "TRUE", "FALSE", "FALSE"), TRUE) } [1] FALSE FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c("abc", "good", "hello", "hello", "abc")) } [1] FALSE FALSE FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1+0i, 6+7i, 1+0i), TRUE)} [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1+1i, 4-6i, 4-6i, 6+7i)) } [1] FALSE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1, 1, 4, 5, 4), TRUE, TRUE) } [1] FALSE FALSE TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1, 4+6i, 7+7i, 1), incomparables = c(1, 2)) } [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1,2,1)) } [1] FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated#Output.IgnoreErrorContext# #{ duplicated(c(1,2,1), incomparables=function() 42) } Error in duplicated.default(c(1, 2, 1), incomparables = function() 42) : cannot coerce type 'closure' to vector of type 'double' ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1,2,3,2), incomparables = c(2+6i)) } [1] FALSE FALSE FALSE FALSE Warning message: In duplicated.default(c(1, 2, 3, 2), incomparables = c(2 + (0+6i))) : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1,2,3,4)) } [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1L, 2L, 1L, 1L, 3L, 2L), incomparables = "cat") } [1] FALSE FALSE TRUE TRUE FALSE TRUE Warning message: In duplicated.default(c(1L, 2L, 1L, 1L, 3L, 2L), incomparables = "cat") : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1L, 2L, 3L, 4L, 2L, 3L)) } [1] FALSE FALSE FALSE FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1L, 2L, 3L, 4L, 2L, 3L), fromLast = TRUE) } [1] FALSE TRUE TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(1L, 2L, 3L, 4L, 2L, 3L), incomparables = TRUE )} [1] FALSE FALSE FALSE FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(27.2, 68.4, 94.3, 22.2)) } [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(TRUE, FALSE, TRUE), TRUE) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(c(TRUE, FALSE, TRUE), TRUE, fromLast = 1) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(list(76.5, 5L, 5L, 76.5, 5, 5), incomparables = c(5L, 76.5)) } [1] FALSE FALSE TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ duplicated(list(list(1,"aaa"),list(1,"aaa"))) } [1] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ x<-function() 42; duplicated(x) } Error in duplicated.default(x) : duplicated() applies only to vectors ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{ x<-quote(f(7, 42)); duplicated(x) } Error in duplicated.default(x) : duplicated() applies only to vectors ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{duplicated(c("abc"))} [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{duplicated(c("abc", "def", "abc"))} [1] FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{duplicated(c("abc", "def", "ghi", "jkl"))} [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{duplicated(c(2+2i)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{duplicated(c(2+2i, 3+3i, 2+2i)) } [1] FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{duplicated(c(2+2i, 3+3i, 4+4i, 5+5i)) } [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{duplicated(c(FALSE))} [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{duplicated(c(FALSE, TRUE))} [1] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testDuplicated# #{duplicated(c(FALSE, TRUE, FALSE))} [1] FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated1# #argv <- list(c('methods', 'base'), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated10# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')), FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated11# #argv <- list(c('\\title', '\\name', '\\alias', '\\alias', '\\keyword', '\\keyword', '\\description', '\\usage', '\\arguments', '\\details', '\\value', '\\section', '\\section', '\\seealso', '\\examples'), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE FALSE FALSE TRUE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE [13] TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated12# #argv <- list(structure(c(-0.838428742794102, 0.838428742794102, 0.838428742794102, 0.838428742794102, -0.838428742794102, -0.838428742794102), .Dim = c(6L, 1L), .Dimnames = list(c('1', '3', '4', '5', '6', '7'), NULL)), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE FALSE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated13# #argv <- list(c(-1628571, -1628571, -1200000, -1200000, -1057143, -914286, -771429, -771429, -771429, -628571, -628571, -485714, -485714, -485714, -485714, -342857, -342857, -342857, -342857, -2e+05, -2e+05, -2e+05, -2e+05, -57143, -57143, -57143, 85714, 85714, 228571, 228571, 228571, 371429, 371429, 371429, 371429, 514286, 514286, 514286, 657143, 657143, 657143, 657143, 657143, 942857, 1085714, 1228571, 1228571, 1228571, 1228571, 1371429), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE TRUE FALSE TRUE FALSE FALSE FALSE TRUE TRUE FALSE TRUE FALSE [13] TRUE TRUE TRUE FALSE TRUE TRUE TRUE FALSE TRUE TRUE TRUE FALSE [25] TRUE TRUE FALSE TRUE FALSE TRUE TRUE FALSE TRUE TRUE TRUE FALSE [37] TRUE TRUE FALSE TRUE TRUE TRUE TRUE FALSE FALSE FALSE TRUE TRUE [49] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated14# #argv <- list(c(1, 0.778249191273129, 0.65570344192776, 0.65570344192776, 0.105668080308148, 0.0451091129154675, 0.0451091129154675, 1.49604383156071e-06, 8.3976239365668e-11, 2.13195391672632e-15, 1.4298180954663e-20, 1.47541167362595e-26, 1.09353648287987e-33, 1.6858825926109e-42, 1.6858825926109e-42, 1.6858825926109e-42), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated2# #argv <- list(list('!', '%%', '%*%', '%/%', '&', '*', '+', '-', '/', 'Arith', 'BunchKaufman', 'Cholesky', 'Compare', 'Logic', 'Math2', 'Math', 'Ops', 'Schur', 'Summary', '[', '[<-', '^', 'all.equal', 'all', 'any', 'as.array', 'as.integer', 'as.logical', 'as.matrix', 'as.numeric', 'as.vector', 'band', 'cbind2', 'chol2inv', 'chol', 'coerce', 'coerce<-', 'colMeans', 'colSums', 'cov2cor', 'crossprod', 'determinant', 'diag', 'diag<-', 'diff', 'dim', 'dim<-', 'dimnames', 'dimnames<-', 'drop', 'expand', 'expm', 'facmul', 'forceSymmetric', 'format', 'head', 'image', 'initialize', 'is.finite', 'is.infinite', 'is.na', 'isDiagonal', 'isSymmetric', 'isTriangular', 'kronecker', 'length', 'lu', 'mean', 'nnzero', 'norm', 'pack', 'print', 'prod', 'qr.Q', 'qr.R', 'qr.coef', 'qr.fitted', 'qr.qty', 'qr.qy', 'qr.resid', 'qr', 'rbind2', 'rcond', 'rep', 'rowMeans', 'rowSums', 'show', 'skewpart', 'solve', 'sum', 'summary', 'symmpart', 't', 'tail', 'tcrossprod', 'toeplitz', 'tril', 'triu', 'unname', 'unpack', 'update', 'updown', 'which', 'writeMM', 'zapsmall', 'Ops', '[', 'Math'), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [37] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [49] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [61] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated3# #argv <- list(c(3L, 8L, 18L), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated4# #argv <- list(c(0, 0.700492869640978, NA), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated5# #argv <- list(1L, FALSE, TRUE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated6# #argv <- list(character(0), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated7# #argv <- list(list('plot', 'Ops', '[', 'Math'), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_duplicated.testduplicated8# #argv <- list(structure('lattice', .Names = ''), FALSE, FALSE, NA); .Internal(duplicated(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_eSoftVersion.testESoftVersion# #{ v <- .Internal(eSoftVersion()); !is.null(v) && length(v) > 0 } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ e <- new.env(); e$a <- 1; e$b <- 2; e$z <- 100; e$.a <- 'dot.a'; l <- eapply(e, function(v) {v}, all.names=F); l[order(names(l))] } $a [1] 1 $b [1] 2 $z [1] 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ e <- new.env(); e$a <- 1; e$b <- 2; e$z <- 100; e$.a <- 'dot.a'; l <- eapply(e, function(v) {v}, all.names=T); l[order(names(l))] } $.a [1] "dot.a" $a [1] 1 $b [1] 2 $z [1] 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ e <- new.env(); e$a <- 1; e$b <- 2; e$z <- 100; e$.a <- 'dot.a'; l <- eapply(e, function(v) {v}, all.names=T, USE.NAMES=F); l[order(names(l))] } Error in order(names(l)) : argument 1 is not a vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ e <- new.env(); e$a <- 1; e$b <- 2; e$z <- 100; e$.a <- 'dot.a'; l <- eapply(e, function(v) {v}, all.names=T, USE.NAMES=T); l[order(names(l))] } $.a [1] "dot.a" $a [1] 1 $b [1] 2 $z [1] 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply#Output.IgnoreErrorContext# #{ eapply() } Error in match.fun(FUN) : argument "FUN" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ eapply(1, function(v) {v}) } Error in eapply(1, function(v) { : argument must be an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ eapply(FUN=function(v) {v}) } Error in eapply(FUN = function(v) { : argument "env" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ eapply(list2env(list(a=1)), function(v) {sys.call()}) } $a FUN(X[[i]], ...) ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply#Output.IgnoreErrorContext# #{ eapply(new.env()) } Error in match.fun(FUN) : argument "FUN" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ eapply(new.env(), 1) } Error in match.fun(FUN) : '1' is not a function, character or symbol ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ eapply(new.env(), function(v) {v}, all.names='abc') } named list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ eapply(new.env(), function(v) {v}, all.names=NA) } named list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ eapply(new.env(), function(v) {v}, all.names=T, USE.NAMES='abc') } list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_eapply.testLapply# #{ eapply(new.env(), function(v) {v}, all.names=T, USE.NAMES=NA) } list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_enc2native.testInvalidArguments#Output.IgnoreErrorMessage# #enc2native(42); Error in enc2native(42) : argument is not a character vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_enc2native.testenc2native1# #argv <- list(character(0));enc2native(argv[[1]]); character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_enc2native.testenc2native3# #argv <- list(structure(character(0), .Names = character(0)));enc2native(argv[[1]]); named character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_enc2native.testenc2native4# #argv <- list('José Pinheiro [aut] (S version)');enc2native(argv[[1]]); [1] "José Pinheiro [aut] (S version)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_enc2utf8.testInvalidArguments#Output.IgnoreErrorMessage# #enc2utf8(42); Error in enc2utf8(42) : argument is not a character vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_enc2utf8.testenc2utf81# #argv <- list('Add Text to a Plot');enc2utf8(argv[[1]]); [1] "Add Text to a Plot" ##com.oracle.truffle.r.test.builtins.TestBuiltin_enc2utf8.testenc2utf82# #argv <- list('Modes');enc2utf8(argv[[1]]); [1] "Modes" ##com.oracle.truffle.r.test.builtins.TestBuiltin_enc2utf8.testenc2utf83# #argv <- list(c('', '(De)compress I/O Through Connections'));enc2utf8(argv[[1]]); [1] "" [2] "(De)compress I/O Through Connections" ##com.oracle.truffle.r.test.builtins.TestBuiltin_enc2utf8.testenc2utf84# #argv <- list(character(0));enc2utf8(argv[[1]]); character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_enc2utf8.testenc2utf86# #argv <- list(NA_character_);do.call('enc2utf8', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='"', justify='c', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='"', justify='c', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='"', justify='l', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='"', justify='l', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='"', justify='n', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='"', justify='n', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='"', justify='r', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='"', justify='r', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='\'', justify='c', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='\'', justify='c', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='\'', justify='l', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='\'', justify='l', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='\'', justify='n', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='\'', justify='n', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='\'', justify='r', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='\'', justify='r', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='a', justify='c', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='a', justify='c', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='a', justify='l', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='a', justify='l', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='a', justify='n', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='a', justify='n', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='a', justify='r', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote='a', justify='r', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote=, justify='c', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote=, justify='c', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote=, justify='l', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote=, justify='l', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote=, justify='n', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote=, justify='n', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote=, justify='r', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 0, quote=, justify='r', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='"', justify='c', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='"', justify='c', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='"', justify='l', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='"', justify='l', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='"', justify='n', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='"', justify='n', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='"', justify='r', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='"', justify='r', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='\'', justify='c', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='\'', justify='c', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='\'', justify='l', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='\'', justify='l', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='\'', justify='n', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='\'', justify='n', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='\'', justify='r', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='\'', justify='r', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='a', justify='c', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='a', justify='c', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='a', justify='l', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='a', justify='l', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='a', justify='n', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='a', justify='n', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='a', justify='r', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote='a', justify='r', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote=, justify='c', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote=, justify='c', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote=, justify='l', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote=, justify='l', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote=, justify='n', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote=, justify='n', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote=, justify='r', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 1, quote=, justify='r', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='"', justify='c', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='"', justify='c', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA " "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='"', justify='l', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='"', justify='l', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA " "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='"', justify='n', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='"', justify='n', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='"', justify='r', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='"', justify='r', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] " NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='\'', justify='c', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='\'', justify='c', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA " "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='\'', justify='l', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='\'', justify='l', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA " "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='\'', justify='n', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='\'', justify='n', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='\'', justify='r', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='\'', justify='r', na=T) [1] "'a'" "'ab'" "'abcde'" [4] " NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='a', justify='c', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='a', justify='c', na=T) [1] "aaa" "aaba" "aabcdea" "NA " [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='a', justify='l', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='a', justify='l', na=T) [1] "aaa" "aaba" "aabcdea" "NA " [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='a', justify='n', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='a', justify='n', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='a', justify='r', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote='a', justify='r', na=T) [1] "aaa" "aaba" "aabcdea" " NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote=, justify='c', na=F) [1] " a " "ab " "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote=, justify='c', na=T) [1] " a " "ab " "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote=, justify='l', na=F) [1] "a " "ab " "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote=, justify='l', na=T) [1] "a " "ab " "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote=, justify='n', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote=, justify='n', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote=, justify='r', na=F) [1] " a" " ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 3, quote=, justify='r', na=T) [1] " a" " ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='"', justify='c', na=F) [1] " \"a\" " " \"ab\" " "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='"', justify='c', na=T) [1] " \"a\" " " \"ab\" " "\"abcde\"" [4] " NA " "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='"', justify='l', na=F) [1] "\"a\" " "\"ab\" " "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='"', justify='l', na=T) [1] "\"a\" " "\"ab\" " "\"abcde\"" [4] "NA " "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='"', justify='n', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='"', justify='n', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='"', justify='r', na=F) [1] " \"a\"" " \"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='"', justify='r', na=T) [1] " \"a\"" " \"ab\"" "\"abcde\"" [4] " NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='\'', justify='c', na=F) [1] " 'a' " " 'ab' " "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='\'', justify='c', na=T) [1] " 'a' " " 'ab' " "'abcde'" [4] " NA " "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='\'', justify='l', na=F) [1] "'a' " "'ab' " "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='\'', justify='l', na=T) [1] "'a' " "'ab' " "'abcde'" [4] "NA " "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='\'', justify='n', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='\'', justify='n', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='\'', justify='r', na=F) [1] " 'a'" " 'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='\'', justify='r', na=T) [1] " 'a'" " 'ab'" "'abcde'" [4] " NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='a', justify='c', na=F) [1] " aaa " " aaba " "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='a', justify='c', na=T) [1] " aaa " " aaba " "aabcdea" " NA " [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='a', justify='l', na=F) [1] "aaa " "aaba " "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='a', justify='l', na=T) [1] "aaa " "aaba " "aabcdea" "NA " [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='a', justify='n', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='a', justify='n', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='a', justify='r', na=F) [1] " aaa" " aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote='a', justify='r', na=T) [1] " aaa" " aaba" "aabcdea" " NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote=, justify='c', na=F) [1] " a " " ab " " abcde " NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote=, justify='c', na=T) [1] " a " " ab " " abcde " " " [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote=, justify='l', na=F) [1] "a " "ab " "abcde " NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote=, justify='l', na=T) [1] "a " "ab " "abcde " " " [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote=, justify='n', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote=, justify='n', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote=, justify='r', na=F) [1] " a" " ab" " abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = 7, quote=, justify='r', na=T) [1] " a" " ab" " abcde" " " [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='"', justify='c', na=F) [1] " \"a\" " " \"ab\" " " \"abcde\" " [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='"', justify='c', na=T) [1] " \"a\" " " \"ab\" " " \"abcde\" " [4] " NA " "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='"', justify='l', na=F) [1] "\"a\" " "\"ab\" " "\"abcde\" " [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='"', justify='l', na=T) [1] "\"a\" " "\"ab\" " "\"abcde\" " [4] "NA " "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='"', justify='n', na=F) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='"', justify='n', na=T) [1] "\"a\"" "\"ab\"" "\"abcde\"" [4] "NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='"', justify='r', na=F) [1] " \"a\"" " \"ab\"" " \"abcde\"" [4] NA "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='"', justify='r', na=T) [1] " \"a\"" " \"ab\"" " \"abcde\"" [4] " NA" "\"\\t\\nሴfoo\\\"'\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='\'', justify='c', na=F) [1] " 'a' " " 'ab' " " 'abcde' " [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='\'', justify='c', na=T) [1] " 'a' " " 'ab' " " 'abcde' " [4] " NA " "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='\'', justify='l', na=F) [1] "'a' " "'ab' " "'abcde' " [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='\'', justify='l', na=T) [1] "'a' " "'ab' " "'abcde' " [4] "NA " "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='\'', justify='n', na=F) [1] "'a'" "'ab'" "'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='\'', justify='n', na=T) [1] "'a'" "'ab'" "'abcde'" [4] "NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='\'', justify='r', na=F) [1] " 'a'" " 'ab'" " 'abcde'" [4] NA "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='\'', justify='r', na=T) [1] " 'a'" " 'ab'" " 'abcde'" [4] " NA" "'\\t\\nሴfoo\"\\''" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='a', justify='c', na=F) [1] " aaa " " aaba " " aabcdea " NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='a', justify='c', na=T) [1] " aaa " " aaba " " aabcdea " " NA " [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='a', justify='l', na=F) [1] "aaa " "aaba " "aabcdea " NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='a', justify='l', na=T) [1] "aaa " "aaba " "aabcdea " "NA " [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='a', justify='n', na=F) [1] "aaa" "aaba" "aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='a', justify='n', na=T) [1] "aaa" "aaba" "aabcdea" "NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='a', justify='r', na=F) [1] " aaa" " aaba" " aabcdea" NA [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote='a', justify='r', na=T) [1] " aaa" " aaba" " aabcdea" " NA" [5] "a\\t\\nሴfoo\"'a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote=, justify='c', na=F) [1] " a " " ab " " abcde " NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote=, justify='c', na=T) [1] " a " " ab " " abcde " " " [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote=, justify='l', na=F) [1] "a " "ab " "abcde " NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote=, justify='l', na=T) [1] "a " "ab " "abcde " " " [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote=, justify='n', na=F) [1] "a" "ab" "abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote=, justify='n', na=T) [1] "a" "ab" "abcde" "" [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote=, justify='r', na=F) [1] " a" " ab" " abcde" NA [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a','ab','abcde',NA,'\t\n\u1234foo\"\''), width = NA, quote=, justify='r', na=T) [1] " a" " ab" " abcde" " " [5] "\\t\\nሴfoo\"'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='"', justify='c', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='"', justify='c', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='"', justify='l', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='"', justify='l', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='"', justify='n', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='"', justify='n', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='"', justify='r', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='"', justify='r', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='\'', justify='c', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='\'', justify='c', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='\'', justify='l', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='\'', justify='l', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='\'', justify='n', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='\'', justify='n', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='\'', justify='r', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='\'', justify='r', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='a', justify='c', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='a', justify='c', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='a', justify='l', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='a', justify='l', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='a', justify='n', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='a', justify='n', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='a', justify='r', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote='a', justify='r', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote=, justify='c', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote=, justify='c', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote=, justify='l', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote=, justify='l', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote=, justify='n', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote=, justify='n', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote=, justify='r', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 0, quote=, justify='r', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='"', justify='c', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='"', justify='c', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='"', justify='l', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='"', justify='l', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='"', justify='n', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='"', justify='n', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='"', justify='r', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='"', justify='r', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='\'', justify='c', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='\'', justify='c', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='\'', justify='l', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='\'', justify='l', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='\'', justify='n', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='\'', justify='n', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='\'', justify='r', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='\'', justify='r', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='a', justify='c', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='a', justify='c', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='a', justify='l', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='a', justify='l', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='a', justify='n', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='a', justify='n', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='a', justify='r', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote='a', justify='r', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote=, justify='c', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote=, justify='c', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote=, justify='l', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote=, justify='l', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote=, justify='n', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote=, justify='n', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote=, justify='r', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 1, quote=, justify='r', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='"', justify='c', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='"', justify='c', na=T) [1] "\"a\"" "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='"', justify='l', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='"', justify='l', na=T) [1] "\"a\"" "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='"', justify='n', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='"', justify='n', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='"', justify='r', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='"', justify='r', na=T) [1] "\"a\"" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='\'', justify='c', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='\'', justify='c', na=T) [1] "'a'" "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='\'', justify='l', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='\'', justify='l', na=T) [1] "'a'" "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='\'', justify='n', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='\'', justify='n', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='\'', justify='r', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='\'', justify='r', na=T) [1] "'a'" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='a', justify='c', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='a', justify='c', na=T) [1] "aaa" "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='a', justify='l', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='a', justify='l', na=T) [1] "aaa" "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='a', justify='n', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='a', justify='n', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='a', justify='r', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote='a', justify='r', na=T) [1] "aaa" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote=, justify='c', na=F) [1] " a " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote=, justify='c', na=T) [1] " a " "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote=, justify='l', na=F) [1] "a " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote=, justify='l', na=T) [1] "a " "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote=, justify='n', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote=, justify='n', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote=, justify='r', na=F) [1] " a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 3, quote=, justify='r', na=T) [1] " a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='"', justify='c', na=F) [1] " \"a\" " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='"', justify='c', na=T) [1] " \"a\" " " NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='"', justify='l', na=F) [1] "\"a\" " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='"', justify='l', na=T) [1] "\"a\" " "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='"', justify='n', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='"', justify='n', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='"', justify='r', na=F) [1] " \"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='"', justify='r', na=T) [1] " \"a\"" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='\'', justify='c', na=F) [1] " 'a' " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='\'', justify='c', na=T) [1] " 'a' " " NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='\'', justify='l', na=F) [1] "'a' " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='\'', justify='l', na=T) [1] "'a' " "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='\'', justify='n', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='\'', justify='n', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='\'', justify='r', na=F) [1] " 'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='\'', justify='r', na=T) [1] " 'a'" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='a', justify='c', na=F) [1] " aaa " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='a', justify='c', na=T) [1] " aaa " " NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='a', justify='l', na=F) [1] "aaa " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='a', justify='l', na=T) [1] "aaa " "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='a', justify='n', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='a', justify='n', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='a', justify='r', na=F) [1] " aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote='a', justify='r', na=T) [1] " aaa" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote=, justify='c', na=F) [1] " a " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote=, justify='c', na=T) [1] " a " " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote=, justify='l', na=F) [1] "a " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote=, justify='l', na=T) [1] "a " " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote=, justify='n', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote=, justify='n', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote=, justify='r', na=F) [1] " a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = 7, quote=, justify='r', na=T) [1] " a" " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='"', justify='c', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='"', justify='c', na=T) [1] "\"a\" " " NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='"', justify='l', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='"', justify='l', na=T) [1] "\"a\" " "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='"', justify='n', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='"', justify='n', na=T) [1] "\"a\"" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='"', justify='r', na=F) [1] "\"a\"" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='"', justify='r', na=T) [1] " \"a\"" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='\'', justify='c', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='\'', justify='c', na=T) [1] "'a' " " NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='\'', justify='l', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='\'', justify='l', na=T) [1] "'a' " "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='\'', justify='n', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='\'', justify='n', na=T) [1] "'a'" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='\'', justify='r', na=F) [1] "'a'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='\'', justify='r', na=T) [1] " 'a'" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='a', justify='c', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='a', justify='c', na=T) [1] "aaa " " NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='a', justify='l', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='a', justify='l', na=T) [1] "aaa " "NA " ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='a', justify='n', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='a', justify='n', na=T) [1] "aaa" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='a', justify='r', na=F) [1] "aaa" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote='a', justify='r', na=T) [1] " aaa" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote=, justify='c', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote=, justify='c', na=T) [1] "a " "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote=, justify='l', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote=, justify='l', na=T) [1] "a " "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote=, justify='n', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote=, justify='n', na=T) [1] "a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote=, justify='r', na=F) [1] "a" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testEncodeString# #encodeString(c('a',NA), width = NA, quote=, justify='r', na=T) [1] " a" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString1# #argv <- list(c('1', '2', NA), 0L, '\'', 0L, FALSE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "'1'" "'2'" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString10# #argv <- list('\'class\' is a reserved slot name and cannot be redefined', 0L, '\'', 0L, FALSE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "'\\'class\\' is a reserved slot name and cannot be redefined'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString11# #argv <- list(structure(character(0), .Dim = c(0L, 0L)), 0L, '', 0L, TRUE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString12#Ignored.ReferenceError# #argv <- list(character(0), logical(0), '', 0L, TRUE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString13# #argv <- list(structure('integer(0)', .Names = 'c0', row.names = character(0)), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')), '', 0L, TRUE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) c0 "integer(0)" attr(,"row.names") character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString3# #argv <- list(c('a', 'ab', 'abcde'), NA, '', 0L, TRUE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "a " "ab " "abcde" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString4# #argv <- list(c('a', 'ab', 'abcde'), NA, '', 1L, TRUE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] " a" " ab" "abcde" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString6# #argv <- list(c('NA', 'a', 'b', 'c', 'd', NA), 0L, '', 0L, TRUE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "NA" "a" "b" "c" "d" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString7# #argv <- list('ab\bc\ndef', 0L, '', 0L, TRUE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "ab\\bc\\ndef" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString8# #argv <- list(c('FALSE', NA), 0L, '', 0L, TRUE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "FALSE" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_encodeString.testencodeString9# #argv <- list(structure('integer(0)', .Names = 'c0', row.names = character(0)), 0L, '', 0L, TRUE); .Internal(encodeString(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) c0 "integer(0)" attr(,"row.names") character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_env2list.testEnv2list# # { r <- (function(a,b,...) .Internal(env2list(environment(),TRUE,TRUE)))(list(1,'a'), c(1,2,4), cat('[should not be executed]')); list(r$a, r$b, sort(names(r))) } [[1]] [[1]][[1]] [1] 1 [[1]][[2]] [1] "a" [[2]] [1] 1 2 4 [[3]] [1] "..." "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_env2list.testEnv2list# #{ e <- new.env(); e$lst <- list(1,'a'); e$vec <- c(1,2,4); r <- as.list.environment(e); e$lst[[1]] <- 42; e$vec[[1]] <- 42; list(r$lst, r$vec, e$lst, e$vec) } [[1]] [[1]][[1]] [1] 1 [[1]][[2]] [1] "a" [[2]] [1] 1 2 4 [[3]] [[3]][[1]] [1] 42 [[3]][[2]] [1] "a" [[4]] [1] 42 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_env2list.testEnv2list# #{ e2 <- new.env(); e2$vec <- c(1,2,4); e <- new.env(); e$a <- e2; l <- .Internal(env2list(e,TRUE,TRUE)); l$a$vec[[1]] <- 42; list(e$a$vec, e2$vec, l$a$vec) } [[1]] [1] 42 2 4 [[2]] [1] 42 2 4 [[3]] [1] 42 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_env2list.testEnv2list# #{ e<-new.env(); e$x=pairlist(1:3); l<-.Internal(env2list(e, TRUE, TRUE)); print(l$x); typeof(l$x) } [[1]] [1] 1 2 3 [1] "pairlist" ##com.oracle.truffle.r.test.builtins.TestBuiltin_env2list.testEnv2list# #{ vec <- c(1,2,4); e <- new.env(); delayedAssign('a', {cat('[evaluating a]'); vec}, assign.env=e); l <- .Internal(env2list(e,TRUE,TRUE)); cat('[result created]'); l$a[[1]] <- 42; list(l$a, vec) } [evaluating a][result created][[1]] [1] 42 2 4 [[2]] [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_env2list.testEnv2list# #{ vec <- c(1,2,4); r <- (function(a) .Internal(env2list(environment(),TRUE,TRUE)))({ cat('[side effect]'); vec }); cat('[result created]'); r$a[[1]] <- 42; list(vec, r$a) } [side effect][result created][[1]] [1] 1 2 4 [[2]] [1] 42 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_env2list.testEnv2listArgValidation# #.Internal(env2list(list(1,2,3),TRUE,TRUE)) Error: argument must be an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_env2list.testEnv2listArgValidation# #.Internal(env2list(new.env(),'string',list())) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testEnvironment# #environment() ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testEnvironment# #environment(FALSE) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testEnvironment# #environment(NULL) ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testEnvironment# #environment(`+`) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testEnvironment# #environment(a~b) ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testEnvironment# #environment(function(x) 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testEnvironment# #environment(print) ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testEnvironment# #{ env <- list2env(list(customenvvar = 42)); fst <- function(fstvar) do.call(environment, list(), envir = env); a <- fst(0); ls(a) } [1] "customenvvar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testEnvironment# #{ f <- y~z; class(f) <- c('myclass', class(f)); environment(f) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testEnvironment# #{ x <- as.pairlist(c(1,2,3)); e <- as.environment(list(x=x)); print(x); print(e$x) } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testenvironment1# #argv <- list(quote(cbind(X, M) ~ M.user + Temp + M.user:Temp + Soft)); .Internal(environment(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testenvironment2# #argv <- list(FALSE); .Internal(environment(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testenvironment3# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L))); .Internal(environment(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_environment.testenvironment4# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0'))); .Internal(environment(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentName.test# #environmentName(baseenv()) [1] "base" ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentName.test# #environmentName(emptyenv()) [1] "R_EmptyEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentName.test# #environmentName(environment(lm)) [1] "stats" ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentName.test# #environmentName(environment(sum)) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentName.test# #environmentName(globalenv()) [1] "R_GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentName.test# #environmentName(parent.env(globalenv())) [1] "package:stats" ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentName.testenvironmentName1# #argv <- list(FALSE); .Internal(environmentName(argv[[1]])) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentName.testenvironmentName2# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0'))); .Internal(environmentName(argv[[1]])) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentName.testenvironmentName3# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L))); .Internal(environmentName(argv[[1]])) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ e1 <- 1; e2 <- new.env(); environment(e1) <- e2 } ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ e1 <- 1; environment(e1) <- 3 } Error in environment(e1) <- 3 : replacement object is not an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ e1 <- 1; environment(e1) <- NULL } ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ e1 <- new.env(); e2 <- new.env(); environment(e1) <- e2 } ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ e1 <- new.env(); environment(e1) <- 3 } Error in environment(e1) <- 3 : replacement object is not an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ e1 <- new.env(); environment(e1) <- NULL } ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ f <- NULL; environment(f) <- new.env() } Error in environment(f) <- new.env() : attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ f <- asS4(function(x) x+1); r <- isS4(f); environment(f) <- new.env(); r && isS4(f) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ f <- function() x; f2 <- f; e <- new.env(); assign('x', 2, envir=e); x <- 1; environment(f) <- e; c(f(), f2())} [1] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ f <- function() {}; e1 <- new.env(); environment(f) <- e1 } ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ f <- function() {}; environment(f) <- NULL } Error in environment(f) <- NULL : use of NULL environment is defunct ##com.oracle.truffle.r.test.builtins.TestBuiltin_environmentassign.testenvironmentassign1# #{ jh <- function(x) x+1; attributes(jh) <- list(myMetaData ='hello'); environment(jh) <- new.env(); attr(jh, 'myMetaData') } [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #eval('foo') [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #eval(as.symbol('baseenv')) function () .Primitive("baseenv") ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #eval(as.symbol('foo')) Error in eval(as.symbol("foo")) : object 'foo' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #eval({ xx <- pi; xx^2}) ; xx [1] 9.869604 [1] 3.141593 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval#Ignored.ImplementationError# #{ .Internal(eval(quote(foo()), list2env(list(foo=function() {sys.calls()})), baseenv()))[[1]] } Error in sys.calls() : attempt to set an attribute on NULL Error during wrapup: attempt to set an attribute on NULL Error: no more error handlers available (recursive errors?); invoking 'abort' restart ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval#Ignored.ReferenceError# #{ .Internal(eval(quote(foo()), list2env(list(foo=function() {sys.calls()})), baseenv()))[[2]] } Error in sys.calls() : attempt to set an attribute on NULL Error during wrapup: attempt to set an attribute on NULL Error: no more error handlers available (recursive errors?); invoking 'abort' restart ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ a <- 1; eval(a + 1) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ a <- 1; eval(a) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ a <- 1; eval(expression(a + 1)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ e1 <- new.env(); assign("x", 100, e1); e2 <- new.env(parent = e1); evalq(x, e2) } [1] 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ eval(2 ^ 2 ^ 3)} [1] 256 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ eval(x <- 1); ls() } [1] "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ eval({ xx <- pi; xx^2}) ; xx } [1] 3.141593 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ f <- function(x) { eval(x) }; f(1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ f <- function(z) {z}; e<-as.call(c(expression(f), 7)); eval(e) } [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ f<-function(...) { substitute(list(...)) }; eval(f(c(1,2))) } [[1]] [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ f<-function(...) { substitute(list(...)) }; eval(f(c(x=1,2))) } [[1]] x 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ f<-function(...) { substitute(list(...)) }; x<-1; eval(f(c(x,2))) } [[1]] [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ g<-function() { f<-function() { 42 }; substitute(f()) } ; eval(g()) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ g<-function(y) { f<-function(x) { x }; substitute(f(y)) } ; eval(g(42)) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ l <- list(a=1, b=2); eval(quote(a), l)} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval#Ignored.ReferenceError# #{ length(.Internal(eval(quote(foo()), list2env(list(foo=function() {sys.calls()})), baseenv()))) } Error in sys.calls() : attempt to set an attribute on NULL Error during wrapup: attempt to set an attribute on NULL Error: no more error handlers available (recursive errors?); invoking 'abort' restart ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ ne <- new.env(); eval(x <- 1, ne); ls() } [1] "ne" "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ ne <- new.env(); evalq(envir=ne, expr=x <- 1); ls(ne) } [1] "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEval# #{ ne <- new.env(); evalq(x <- 1, ne); ls(ne) } [1] "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEvalVisibility# #eval(parse(text='1+1')) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testEvalVisibility# #eval(parse(text='x<-1')) ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testReturnInEvalExpr# #f1 <- function(x) { eval(quote(if(x>2){return()}else 1)); 10 };f1(5);f1(0) [1] 10 [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testWithEnvirAndEnclose# #a <- 1; lang <- quote(list(a)); eval(lang, NULL, NULL) Error in eval(lang, NULL, NULL) : object 'a' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testWithEnvirAndEnclose# #a <- 1; lang <- quote(list(a)); eval(lang, data.frame(), NULL) Error in eval(lang, data.frame(), NULL) : object 'a' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testWithEnvirAndEnclose# #a <- 1; lang <- quote(list(a)); eval(lang, new.env(), new.env()) [[1]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testWithEnvirAndEnclose#Output.IgnoreErrorMessage# #y <- 2; x <- 2 ; eval(quote(x+y), c(-1, -2)) Error in eval(quote(x + y), c(-1, -2)) : numeric 'envir' arg not of length one ##com.oracle.truffle.r.test.builtins.TestBuiltin_eval.testWithEnvirAndEnclose# #{ df <- list(a=c(1,2,3), b=c(3,4,5)); df$c <- with(df, a^2); df; } $a [1] 1 2 3 $b [1] 3 4 5 $c [1] 1 4 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='double'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='integer'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='numeric'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 1L; exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='double'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='integer'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='numeric'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- 3.4; exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='NULL'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- NULL; exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='logical'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- T; exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='pairlist'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.pairlist(1); exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='raw'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.raw(c(1,3)); exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='name'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- as.symbol('a'); exists('foo', mode='symbol'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='double'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='integer'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='numeric'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1.2, 3.3); exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='double'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='integer'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='numeric'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(1L,3L); exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='NULL'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='character'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='complex'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='double'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='expression'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='externalptr'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='function'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='integer'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='language'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='list'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='logical'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='name'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='new.env()'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='numeric'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='pairlist'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='raw'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(3+i, 1+i); exists('foo', mode='symbol'); } Error: object 'i' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='logical'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- c(T,F); exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='function'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- environment; exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='expression'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- expression(a+3); exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='function'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- function() 42; exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='externalptr'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='language'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- quote(a+3); exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='NULL'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='character'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='complex'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='double'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='expression'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='externalptr'); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='function'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='integer'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='language'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='list'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='logical'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='name'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='new.env()'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='numeric'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='pairlist'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='raw'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testExistsWithMode# #{ foo <- stats:::C_acf$address; exists('foo', mode='symbol'); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testexists1#Ignored.NativeGridGraphics# #argv <- structure(list(x = '.Device'), .Names = 'x');do.call('exists', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testexists1# #exists('.Device', inherit=FALSE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testexists1# #exists('foo', mode='helloworld') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testexists1# #exists('somethingthatdoesnotexist123456789') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testexists1# #x <- '42'; exists('x', mode='numeric') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testexists1# #x <- 42; exists('x', mode='numeric') [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exists.testexists1# #{ foo <- 42L; exists('foo', mode='helloworld') } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testExp# #{ round( exp(1+2i), digits=5 ) } [1] -1.1312+2.47173i ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testExp# #{ round( exp(c(1+1i,-2-3i)), digits=5 ) } [1] 1.46869+2.28736i -0.13398-0.01910i ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testTrigExp# #{ exp() } Error in exp() : 0 arguments passed to 'exp' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testTrigExp# #{ exp(1) } [1] 2.718282 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testTrigExp# #{ exp(c(1,2,3)) } [1] 2.718282 7.389056 20.085537 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testexp1# #argv <- list(-3.99290891786396);exp(argv[[1]]); [1] 0.01844598 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testexp10# #argv <- list(c(47.5645940356179, -6.38155741912049, -4.72835558025993, -9.12276173822938, 16.7269898773273, 1.72738845624351, 2.57214256243276, -6.38155741912049, 54.3235157345705, -1.01577550708815, 1.03229146110395, -7.85550713095368, -0.907238963715769, -0.92327375484205, -4.72835558025993, -1.01577550708815, 46.5450612116912, 4.59443066488959, -2.69397762349353, -13.3238428844397, -4.89920529326131, -9.12276173822938, 1.03229146110395, 4.59443066488959, 47.7416929123262, -3.84567249122941, -9.99434616922533, -0.0518296900644576, 16.7269898773273, -7.85550713095368, -2.69397762349353, -3.84567249122941, 49.4381847193856, 8.76151535039852, 0.371991514317358, 1.72738845624351, -0.907238963715769, -13.3238428844397, -9.99434616922533, 8.76151535039852, 50.1823716395239, -1.41801229530673, 2.57214256243276, -0.92327375484205, -4.89920529326131, -0.0518296900644576, 0.371991514317358, -1.41801229530673, 44.6019728197531));exp(argv[[1]]); [1] 4.539842e+20 1.692485e-03 8.840997e-03 1.091528e-04 1.838397e+07 [6] 5.625942e+00 1.309385e+01 1.692485e-03 3.912039e+23 3.621215e-01 [11] 2.807492e+00 3.876115e-04 4.036371e-01 3.972165e-01 8.840997e-03 [16] 3.621215e-01 1.637809e+20 9.893179e+01 6.761147e-02 1.635041e-06 [21] 7.452503e-03 1.091528e-04 2.807492e+00 9.893179e+01 5.419432e+20 [26] 2.137202e-02 4.565734e-05 9.494906e-01 1.838397e+07 3.876115e-04 [31] 6.761147e-02 2.137202e-02 2.956180e+21 6.383778e+03 1.450621e+00 [36] 5.625942e+00 4.036371e-01 1.635041e-06 4.565734e-05 6.383778e+03 [41] 6.221958e+21 2.421950e-01 1.309385e+01 3.972165e-01 7.452503e-03 [46] 9.494906e-01 1.450621e+00 2.421950e-01 2.346339e+19 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testexp11# #argv <- list(c(-745, -744, -743, -742, -741, -740, -730, -720, -710, -709, -708, -707, -706, -705));exp(argv[[1]]); [1] 4.940656e-324 9.881313e-324 1.976263e-323 5.434722e-323 1.531604e-322 [6] 4.199558e-322 9.226315e-318 2.032231e-313 4.476286e-309 1.216781e-308 [11] 3.307553e-308 8.990861e-308 2.443969e-307 6.643398e-307 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testexp2# #argv <- list(structure(3.3059560902335, .Names = 'lymax'));exp(argv[[1]]); lymax 27.27461 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testexp3# #argv <- list(structure(c(-0.00324566582797463, -0.0174366299092001, -0.0697465196367962, -0.00678668749718479, -0.0364599944879883, -0.145839977951944, -0.014190964081224, -0.0762378512927396, -0.304951405170939, -0.0296733069908004, -0.159413352946301, -0.637653411785165, -0.0620468872115091, -0.333333333333361, -1.33333333333336, -0.129740045955487, -0.697000025766712, -2.78800010306667, -0.271286446121824, -1.45742710775627, -5.8297084310247, -0.567259979811165, -3.04748019497741, -12.1899207799089, -1.18614066163432, -6.37228132326786, -25.4891252930698), .Dim = c(3L, 9L), .Dimnames = list(c('x', 'x', ''), NULL)));exp(argv[[1]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] x 0.9967596 0.9932363 0.9859093 0.9707626 0.9398388 0.87832373 0.762398079 x 0.9827145 0.9641967 0.9265958 0.8526438 0.7165313 0.49807728 0.232834563 0.9326302 0.8642960 0.7371592 0.5285312 0.2635971 0.06154417 0.002938934 [,8] [,9] x 5.670771e-01 3.053976e-01 x 4.747841e-02 1.708258e-03 5.081415e-06 8.515566e-12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testexp4# #argv <- list(c(0, 0, 0, 0, 0, 0.312525079410893, 0.312525079410893, 0.519628781161469, 0.519628781161469, 0.519628781161469, 0.519628781161469, 0.519628781161469, 0.519628781161469, 0.656871985321733, 0.656871985321733, 0.656871985321733, 0.747820128348458, 0.747820128348458, 0.747820128348458, 0.747820128348458, 0.808089522163767, 0.808089522163767, 0.808089522163767, 0.808089522163767, 0.808089522163767, 0.808089522163767, 0.848028763471832, 0.848028763471832, 0.848028763471832, 0.848028763471832, 0.848028763471832, 0.848028763471832, 0.848028763471832, 0.848028763471832, 0.848028763471832, 0.874495646499593, 0.874495646499593, 0.874495646499593, 0.874495646499593, 0.874495646499593, 0.874495646499593, 0.874495646499593, 0.874495646499593, 0.874495646499593, 0.874495646499593, 0.892034685155886, 0.892034685155886, 0.892034685155886, 0.892034685155886, 0.892034685155886, 0.911359578074335, 0.916463626041527));exp(argv[[1]]); [1] 1.000000 1.000000 1.000000 1.000000 1.000000 1.366872 1.366872 1.681403 [9] 1.681403 1.681403 1.681403 1.681403 1.681403 1.928750 1.928750 1.928750 [17] 2.112390 2.112390 2.112390 2.112390 2.243618 2.243618 2.243618 2.243618 [25] 2.243618 2.243618 2.335039 2.335039 2.335039 2.335039 2.335039 2.335039 [33] 2.335039 2.335039 2.335039 2.397666 2.397666 2.397666 2.397666 2.397666 [41] 2.397666 2.397666 2.397666 2.397666 2.397666 2.440089 2.440089 2.440089 [49] 2.440089 2.440089 2.487702 2.500432 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testexp5# #argv <- list(c(0+0.392699081698724i, 0+0.785398163397448i, 0+1.17809724509617i, 0+1.5707963267949i, 0+1.96349540849362i, 0+2.35619449019234i, 0+2.74889357189107i, 0+3.14159265358979i, 0+3.53429173528852i, 0+3.92699081698724i, 0+4.31968989868597i, 0+4.71238898038469i, 0+5.10508806208341i, 0+5.49778714378214i, 0+5.89048622548086i, 0+6.28318530717959i));exp(argv[[1]]); [1] 0.9238795+0.3826834i 0.7071068+0.7071068i 0.3826834+0.9238795i [4] 0.0000000+1.0000000i -0.3826834+0.9238795i -0.7071068+0.7071068i [7] -0.9238795+0.3826834i -1.0000000+0.0000000i -0.9238795-0.3826834i [10] -0.7071068-0.7071068i -0.3826834-0.9238795i 0.0000000-1.0000000i [13] 0.3826834-0.9238795i 0.7071068-0.7071068i 0.9238795-0.3826834i [16] 1.0000000+0.0000000i ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testexp6# #argv <- list(c(-0.1, -3.16227766016838, -100));exp(argv[[1]]); [1] 9.048374e-01 4.232922e-02 3.720076e-44 ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testexp8# #argv <- list(logical(0));exp(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_exp.testexp9# #argv <- list(c(4.92585186838819, 4.80249477012754, 4.18570927882429, 4.06235218056364, 3.81563798404234, 3.32220959099974, 3.19885249273909, 2.95213829621779, 2.45870990317518, 2.33535280491453, 2.08863860839323, 1.59521021535063, 1.47185311708998, 1.34849601882933, 0.608353429265429, 0.361639232744128, -0.131789160298473, -0.255146258559123, -1.11864594638368, -1.24200304464433, -1.85878853594758, -1.98214563420823, -2.84564532203278, -3.09235951855408, -3.70914500985733));exp(argv[[1]]); [1] 137.80668481 121.81393653 65.74011245 58.11083763 45.40571527 [6] 27.72153619 24.50439509 19.14685163 11.68972094 10.33310486 [11] 8.07391592 4.92936519 4.35730226 3.85162840 1.83740349 [16] 1.43568090 0.87652578 0.77480317 0.32672189 0.28880515 [21] 0.15586134 0.13777331 0.05809676 0.04539472 0.02449846 ##com.oracle.truffle.r.test.builtins.TestBuiltin_expm1.testTrigExp# #{ expm1() } Error in expm1() : 0 arguments passed to 'expm1' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_expm1.testTrigExp# #{ expm1(2) } [1] 6.389056 ##com.oracle.truffle.r.test.builtins.TestBuiltin_expm1.testTrigExp# #{ expm1(c(1,2,3)) } [1] 1.718282 6.389056 19.085537 ##com.oracle.truffle.r.test.builtins.TestBuiltin_expm1.testTrigExp#Ignored.ReferenceError# #{ round( expm1(1+2i), digits=5 ) } Error in expm1(1 + (0+2i)) : unimplemented complex function ##com.oracle.truffle.r.test.builtins.TestBuiltin_expm1.testTrigExp#Ignored.ReferenceError# #{ round( expm1(c(1+1i,-2-3i)), digits=5 ) } Error in expm1(c(1 + (0+1i), -2 - (0+3i))) : unimplemented complex function ##com.oracle.truffle.r.test.builtins.TestBuiltin_expm1.testexpm11# #argv <- list(-0.518798300715899);expm1(argv[[1]]); [1] -0.4047646 ##com.oracle.truffle.r.test.builtins.TestBuiltin_expm1.testexpm12# #argv <- list(-1.5314339531682e-113);expm1(argv[[1]]); [1] -1.531434e-113 ##com.oracle.truffle.r.test.builtins.TestBuiltin_expm1.testexpm13# #argv <- list(structure(c(-0.0996985539253204, -0.208486018303182, -0.412624920187971, -0.781459230080118, -1.41933833538431, -2.49413413365086, -4.24041092023363, -7.0213317713299), .Names = c('1', '2', '3', '4', '5', '6', '7', '8')));expm1(argv[[1]]); 1 2 3 4 5 6 -0.09488978 -0.18818761 -0.33808949 -0.54226242 -0.75812600 -0.91743209 7 8 -0.98559833 -0.99910736 ##com.oracle.truffle.r.test.builtins.TestBuiltin_expm1.testexpm14# #argv <- list(logical(0));expm1(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_expm1.testexpm15# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));expm1(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_expression.testExpression# #{ class(expression(1)) } [1] "expression" ##com.oracle.truffle.r.test.builtins.TestBuiltin_expression.testExpression#Ignored.OutputFormatting# #{ expression(a=1, 2, b=3) } expression(a = 1, 2, b = 3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_expression.testExpression# #{ f <- function(z) {z}; e<-c(expression(f), 7); eval(e) } [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_expression.testExpression# #{ f <- function(z) {z}; e<-expression(f); e2<-c(e, 7); eval(e2) } [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_expression.testExpression# #{ names(expression(a=1, 2, b=3)) } [1] "a" "" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_expression.testExpression# #{ x<-expression(1); typeof(x[[1]]) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_expression.testExpression# #{ x<-expression(1); y<-c(x,2); typeof(y[[1]]) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_expression.testExpression# #{ x<-expression(1); y<-c(x,2); typeof(y[[2]]) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_expression.testExpression# #{ x<-expression(a); typeof(x[[1]]) } [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractDataFrameWithNAinNames# #{ fr <- data.frame(1:3,4:6); attr(fr,'names') <- c(NA,'col'); fr[1,2,drop=0] } col 1 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractDataFrameWithNAinNames# #{ fr <- data.frame(1:3,4:6); attr(fr,'names') <- c(NA,'col'); fr[1,2] } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractDataFrameWithNULLNames# #{ fr <- data.frame(1:3,4:6); attr(fr,'names') <- NULL; fr['col'] } 1 NULL 2 3 Warning message: In format.data.frame(if (omit) x[seq_len(n0), , drop = FALSE] else x, : corrupt data frame: columns will be truncated or padded with NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractDataFrameWithNULLNames# #{ fr <- data.frame(1:3,4:6); attr(fr,'names') <- NULL; fr[1,2] } 1 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractNormalDataFrame# #mtcars['cyl'] cyl Mazda RX4 6 Mazda RX4 Wag 6 Datsun 710 4 Hornet 4 Drive 6 Hornet Sportabout 8 Valiant 6 Duster 360 8 Merc 240D 4 Merc 230 4 Merc 280 6 Merc 280C 6 Merc 450SE 8 Merc 450SL 8 Merc 450SLC 8 Cadillac Fleetwood 8 Lincoln Continental 8 Chrysler Imperial 8 Fiat 128 4 Honda Civic 4 Toyota Corolla 4 Toyota Corona 4 Dodge Challenger 8 AMC Javelin 8 Camaro Z28 8 Pontiac Firebird 8 Fiat X1-9 4 Porsche 914-2 4 Lotus Europa 4 Ford Pantera L 8 Ferrari Dino 6 Maserati Bora 8 Volvo 142E 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractNormalDataFrame# #mtcars[-3] mpg cyl hp drat wt qsec vs am gear carb Mazda RX4 21.0 6 110 3.90 2.620 16.46 0 1 4 4 Mazda RX4 Wag 21.0 6 110 3.90 2.875 17.02 0 1 4 4 Datsun 710 22.8 4 93 3.85 2.320 18.61 1 1 4 1 Hornet 4 Drive 21.4 6 110 3.08 3.215 19.44 1 0 3 1 Hornet Sportabout 18.7 8 175 3.15 3.440 17.02 0 0 3 2 Valiant 18.1 6 105 2.76 3.460 20.22 1 0 3 1 Duster 360 14.3 8 245 3.21 3.570 15.84 0 0 3 4 Merc 240D 24.4 4 62 3.69 3.190 20.00 1 0 4 2 Merc 230 22.8 4 95 3.92 3.150 22.90 1 0 4 2 Merc 280 19.2 6 123 3.92 3.440 18.30 1 0 4 4 Merc 280C 17.8 6 123 3.92 3.440 18.90 1 0 4 4 Merc 450SE 16.4 8 180 3.07 4.070 17.40 0 0 3 3 Merc 450SL 17.3 8 180 3.07 3.730 17.60 0 0 3 3 Merc 450SLC 15.2 8 180 3.07 3.780 18.00 0 0 3 3 Cadillac Fleetwood 10.4 8 205 2.93 5.250 17.98 0 0 3 4 Lincoln Continental 10.4 8 215 3.00 5.424 17.82 0 0 3 4 Chrysler Imperial 14.7 8 230 3.23 5.345 17.42 0 0 3 4 Fiat 128 32.4 4 66 4.08 2.200 19.47 1 1 4 1 Honda Civic 30.4 4 52 4.93 1.615 18.52 1 1 4 2 Toyota Corolla 33.9 4 65 4.22 1.835 19.90 1 1 4 1 Toyota Corona 21.5 4 97 3.70 2.465 20.01 1 0 3 1 Dodge Challenger 15.5 8 150 2.76 3.520 16.87 0 0 3 2 AMC Javelin 15.2 8 150 3.15 3.435 17.30 0 0 3 2 Camaro Z28 13.3 8 245 3.73 3.840 15.41 0 0 3 4 Pontiac Firebird 19.2 8 175 3.08 3.845 17.05 0 0 3 2 Fiat X1-9 27.3 4 66 4.08 1.935 18.90 1 1 4 1 Porsche 914-2 26.0 4 91 4.43 2.140 16.70 0 1 5 2 Lotus Europa 30.4 4 113 3.77 1.513 16.90 1 1 5 2 Ford Pantera L 15.8 8 264 4.22 3.170 14.50 0 1 5 4 Ferrari Dino 19.7 6 175 3.62 2.770 15.50 0 1 5 6 Maserati Bora 15.0 8 335 3.54 3.570 14.60 0 1 5 8 Volvo 142E 21.4 4 109 4.11 2.780 18.60 1 1 4 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractNormalDataFrame# #mtcars[1,2,drop=0] cyl Mazda RX4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractNormalDataFrame# #mtcars[1,2] [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractNormalDataFrame# #mtcars[1:4,'cyl'] [1] 6 6 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractNormalDataFrame# #mtcars[4] hp Mazda RX4 110 Mazda RX4 Wag 110 Datsun 710 93 Hornet 4 Drive 110 Hornet Sportabout 175 Valiant 105 Duster 360 245 Merc 240D 62 Merc 230 95 Merc 280 123 Merc 280C 123 Merc 450SE 180 Merc 450SL 180 Merc 450SLC 180 Cadillac Fleetwood 205 Lincoln Continental 215 Chrysler Imperial 230 Fiat 128 66 Honda Civic 52 Toyota Corolla 65 Toyota Corona 97 Dodge Challenger 150 AMC Javelin 150 Camaro Z28 245 Pontiac Firebird 175 Fiat X1-9 66 Porsche 914-2 91 Lotus Europa 113 Ford Pantera L 264 Ferrari Dino 175 Maserati Bora 335 Volvo 142E 109 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractNormalDataFrame# #mtcars[] mpg cyl disp hp drat wt qsec vs am gear carb Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4 Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4 Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1 Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1 Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2 Valiant 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1 Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4 Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2 Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2 Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4 Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4 Merc 450SE 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3 Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3 Merc 450SLC 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3 Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4 Lincoln Continental 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4 Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4 Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1 Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2 Toyota Corolla 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1 Toyota Corona 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1 Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2 AMC Javelin 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2 Camaro Z28 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4 Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2 Fiat X1-9 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1 Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2 Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2 Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4 Ferrari Dino 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6 Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8 Volvo 142E 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractNormalDataFrame# #mtcars[c(1,2,10,5)] mpg cyl gear drat Mazda RX4 21.0 6 4 3.90 Mazda RX4 Wag 21.0 6 4 3.90 Datsun 710 22.8 4 4 3.85 Hornet 4 Drive 21.4 6 3 3.08 Hornet Sportabout 18.7 8 3 3.15 Valiant 18.1 6 3 2.76 Duster 360 14.3 8 3 3.21 Merc 240D 24.4 4 4 3.69 Merc 230 22.8 4 4 3.92 Merc 280 19.2 6 4 3.92 Merc 280C 17.8 6 4 3.92 Merc 450SE 16.4 8 3 3.07 Merc 450SL 17.3 8 3 3.07 Merc 450SLC 15.2 8 3 3.07 Cadillac Fleetwood 10.4 8 3 2.93 Lincoln Continental 10.4 8 3 3.00 Chrysler Imperial 14.7 8 3 3.23 Fiat 128 32.4 4 4 4.08 Honda Civic 30.4 4 4 4.93 Toyota Corolla 33.9 4 4 4.22 Toyota Corona 21.5 4 3 3.70 Dodge Challenger 15.5 8 3 2.76 AMC Javelin 15.2 8 3 3.15 Camaro Z28 13.3 8 3 3.73 Pontiac Firebird 19.2 8 3 3.08 Fiat X1-9 27.3 4 4 4.08 Porsche 914-2 26.0 4 5 4.43 Lotus Europa 30.4 4 5 3.77 Ford Pantera L 15.8 8 5 4.22 Ferrari Dino 19.7 6 5 3.62 Maserati Bora 15.0 8 5 3.54 Volvo 142E 21.4 4 4 4.11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.extractNormalDataFrame# #mtcars[matrix(c(1,2,10,5),nrow=2,ncol=2)] [1] 4.0 3.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dataframe.undefinedColumnGivesError#Output.IgnoreErrorContext# #mtcars[42] Error in `[.data.frame`(mtcars, 42) : undefined columns selected ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dollar_assign_dataframe.testextract_dollar_assign_dataframe1# #argv <- structure(list(x = structure(list(hours = c(216.27793530786, 14.3454081012111, 16.2639155548331, 77.062914516272, 42.3463070611469, 8.07456175870417, 42.818290162948, 84.9982217741369, 6.97921341420927, 143.155918813582, 16.0908251257365, 214.204015006233)), .Names = 'hours', row.names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12'), class = 'data.frame'), name = 'hours', value = c(216.27793530786, 14.3454081012111, 16.2639155548331, 77.062914516272, 42.3463070611469, 8.07456175870417, 42.818290162948, 84.9982217741369, 6.97921341420927, 143.155918813582, 16.0908251257365, 214.204015006233)), .Names = c('x', 'name', 'value'));do.call('$<-.data.frame', argv) hours 1 216.277935 2 14.345408 3 16.263916 4 77.062915 5 42.346307 6 8.074562 7 42.818290 8 84.998222 9 6.979213 10 143.155919 11 16.090825 12 214.204015 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dollar_assign_dataframe.testextract_dollar_assign_dataframe2# #argv <- structure(list(x = structure(list(distance = c(26, 25, 29, 31, 21.5, 22.5, 23, 26.5, 23, 22.5, 24, 27.5, 25.5, 27.5, 26.5, 27, 20, 23.5, 22.5, 26, 24.5, 25.5, 27, 28.5, 22, 22, 24.5, 26.5, 24, 21.5, 24.5, 25.5, 23, 20.5, 31, 26, 27.5, 28, 31, 31.5, 23, 23, 23.5, 25, 21.5, 23.5, 24, 28, 17, 24.5, 26, 29.5, 22.5, 25.5, 25.5, 26, 23, 24.5, 26, 30, 22, 21.5, 23.5, 25, 21, 20, 21.5, 23, 21, 21.5, 24, 25.5, 20.5, 24, 24.5, 26, 23.5, 24.5, 25, 26.5, 21.5, 23, 22.5, 23.5, 20, 21, 21, 22.5, 21.5, 22.5, 23, 25, 23, 23, 23.5, 24, 20, 21, 22, 21.5, 16.5, 19, 19, 19.5, 24.5, 25, 28, 28), age = c(8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14), Subject = structure(c(15L, 15L, 15L, 15L, 3L, 3L, 3L, 3L, 7L, 7L, 7L, 7L, 14L, 14L, 14L, 14L, 2L, 2L, 2L, 2L, 13L, 13L, 13L, 13L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 11L, 11L, 11L, 11L, 16L, 16L, 16L, 16L, 4L, 4L, 4L, 4L, 8L, 8L, 8L, 8L, 9L, 9L, 9L, 9L, 10L, 10L, 10L, 10L, 12L, 12L, 12L, 12L, 1L, 1L, 1L, 1L, 20L, 20L, 20L, 20L, 23L, 23L, 23L, 23L, 25L, 25L, 25L, 25L, 26L, 26L, 26L, 26L, 21L, 21L, 21L, 21L, 19L, 19L, 19L, 19L, 22L, 22L, 22L, 22L, 24L, 24L, 24L, 24L, 18L, 18L, 18L, 18L, 17L, 17L, 17L, 17L, 27L, 27L, 27L, 27L), .Label = c('M16', 'M05', 'M02', 'M11', 'M07', 'M08', 'M03', 'M12', 'M13', 'M14', 'M09', 'M15', 'M06', 'M04', 'M01', 'M10', 'F10', 'F09', 'F06', 'F01', 'F05', 'F07', 'F02', 'F08', 'F03', 'F04', 'F11'), class = c('ordered', 'factor')), Sex = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Male', 'Female'), class = 'factor'), newAge = c(-3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3)), .Names = c('distance', 'age', 'Subject', 'Sex', 'newAge'), row.names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100', '101', '102', '103', '104', '105', '106', '107', '108'), outer = ~Sex, formula = distance ~ age | Subject, labels = structure(list(x = 'Age', y = 'Distance from pituitary to pterygomaxillary fissure'), .Names = c('x', 'y')), units = structure(list(x = '(yr)', y = '(mm)'), .Names = c('x', 'y')), FUN = function(x) max(x, na.rm = TRUE), order.groups = TRUE, class = c('nfnGroupedData', 'nfGroupedData', 'groupedData', 'data.frame')), name = 'newAge', value = c(-3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3, -3, -1, 1, 3)), .Names = c('x', 'name', 'value'));do.call('$<-.data.frame', argv) distance age Subject Sex newAge 1 26.0 8 M01 Male -3 2 25.0 10 M01 Male -1 3 29.0 12 M01 Male 1 4 31.0 14 M01 Male 3 5 21.5 8 M02 Male -3 6 22.5 10 M02 Male -1 7 23.0 12 M02 Male 1 8 26.5 14 M02 Male 3 9 23.0 8 M03 Male -3 10 22.5 10 M03 Male -1 11 24.0 12 M03 Male 1 12 27.5 14 M03 Male 3 13 25.5 8 M04 Male -3 14 27.5 10 M04 Male -1 15 26.5 12 M04 Male 1 16 27.0 14 M04 Male 3 17 20.0 8 M05 Male -3 18 23.5 10 M05 Male -1 19 22.5 12 M05 Male 1 20 26.0 14 M05 Male 3 21 24.5 8 M06 Male -3 22 25.5 10 M06 Male -1 23 27.0 12 M06 Male 1 24 28.5 14 M06 Male 3 25 22.0 8 M07 Male -3 26 22.0 10 M07 Male -1 27 24.5 12 M07 Male 1 28 26.5 14 M07 Male 3 29 24.0 8 M08 Male -3 30 21.5 10 M08 Male -1 31 24.5 12 M08 Male 1 32 25.5 14 M08 Male 3 33 23.0 8 M09 Male -3 34 20.5 10 M09 Male -1 35 31.0 12 M09 Male 1 36 26.0 14 M09 Male 3 37 27.5 8 M10 Male -3 38 28.0 10 M10 Male -1 39 31.0 12 M10 Male 1 40 31.5 14 M10 Male 3 41 23.0 8 M11 Male -3 42 23.0 10 M11 Male -1 43 23.5 12 M11 Male 1 44 25.0 14 M11 Male 3 45 21.5 8 M12 Male -3 46 23.5 10 M12 Male -1 47 24.0 12 M12 Male 1 48 28.0 14 M12 Male 3 49 17.0 8 M13 Male -3 50 24.5 10 M13 Male -1 51 26.0 12 M13 Male 1 52 29.5 14 M13 Male 3 53 22.5 8 M14 Male -3 54 25.5 10 M14 Male -1 55 25.5 12 M14 Male 1 56 26.0 14 M14 Male 3 57 23.0 8 M15 Male -3 58 24.5 10 M15 Male -1 59 26.0 12 M15 Male 1 60 30.0 14 M15 Male 3 61 22.0 8 M16 Male -3 62 21.5 10 M16 Male -1 63 23.5 12 M16 Male 1 64 25.0 14 M16 Male 3 65 21.0 8 F01 Female -3 66 20.0 10 F01 Female -1 67 21.5 12 F01 Female 1 68 23.0 14 F01 Female 3 69 21.0 8 F02 Female -3 70 21.5 10 F02 Female -1 71 24.0 12 F02 Female 1 72 25.5 14 F02 Female 3 73 20.5 8 F03 Female -3 74 24.0 10 F03 Female -1 75 24.5 12 F03 Female 1 76 26.0 14 F03 Female 3 77 23.5 8 F04 Female -3 78 24.5 10 F04 Female -1 79 25.0 12 F04 Female 1 80 26.5 14 F04 Female 3 81 21.5 8 F05 Female -3 82 23.0 10 F05 Female -1 83 22.5 12 F05 Female 1 84 23.5 14 F05 Female 3 85 20.0 8 F06 Female -3 86 21.0 10 F06 Female -1 87 21.0 12 F06 Female 1 88 22.5 14 F06 Female 3 89 21.5 8 F07 Female -3 90 22.5 10 F07 Female -1 91 23.0 12 F07 Female 1 92 25.0 14 F07 Female 3 93 23.0 8 F08 Female -3 94 23.0 10 F08 Female -1 95 23.5 12 F08 Female 1 96 24.0 14 F08 Female 3 97 20.0 8 F09 Female -3 98 21.0 10 F09 Female -1 99 22.0 12 F09 Female 1 100 21.5 14 F09 Female 3 101 16.5 8 F10 Female -3 102 19.0 10 F10 Female -1 103 19.0 12 F10 Female 1 104 19.5 14 F10 Female 3 105 24.5 8 F11 Female -3 106 25.0 10 F11 Female -1 107 28.0 12 F11 Female 1 108 28.0 14 F11 Female 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dollar_assign_language.testUpdateExisting# #{ func <- function(a, b) { mf<-match.call(); mf$a <- 42L; mf }; func('a', 'b') } func(a = 42L, b = "b") ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dollar_assign_language.testUpdateExisting# #{ func <- function(a, b) { mf<-match.call(); mf$a <- NULL; mf }; func('a', 'b') } func(b = "b") ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dollar_assign_language.testUpdateNonExisting# #{ func <- function(a, b) { mf<-match.call(); mf$nonexist <- 42L; mf }; func('a', 'b') } func(a = "a", b = "b", nonexist = 42L) ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dollar_assign_language.testUpdateNonExisting# #{ func <- function(a, b) { mf<-match.call(); mf$nonexist <- NULL; mf }; func('a', 'b') } func(a = "a", b = "b") ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_dollar_dataframe.testextract_dollar_dataframe1# #argv <- structure(list(x = structure(list(distance = c(26, 25, 29, 31, 21.5, 22.5, 23, 26.5, 23, 22.5, 24, 27.5, 25.5, 27.5, 26.5, 27, 20, 23.5, 22.5, 26, 24.5, 25.5, 27, 28.5, 22, 22, 24.5, 26.5, 24, 21.5, 24.5, 25.5, 23, 20.5, 31, 26, 27.5, 28, 31, 31.5, 23, 23, 23.5, 25, 21.5, 23.5, 24, 28, 17, 24.5, 26, 29.5, 22.5, 25.5, 25.5, 26, 23, 24.5, 26, 30, 22, 21.5, 23.5, 25, 21, 20, 21.5, 23, 21, 21.5, 24, 25.5, 20.5, 24, 24.5, 26, 23.5, 24.5, 25, 26.5, 21.5, 23, 22.5, 23.5, 20, 21, 21, 22.5, 21.5, 22.5, 23, 25, 23, 23, 23.5, 24, 20, 21, 22, 21.5, 16.5, 19, 19, 19.5, 24.5, 25, 28, 28), age = c(8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14, 8, 10, 12, 14), Subject = structure(c(15L, 15L, 15L, 15L, 3L, 3L, 3L, 3L, 7L, 7L, 7L, 7L, 14L, 14L, 14L, 14L, 2L, 2L, 2L, 2L, 13L, 13L, 13L, 13L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 11L, 11L, 11L, 11L, 16L, 16L, 16L, 16L, 4L, 4L, 4L, 4L, 8L, 8L, 8L, 8L, 9L, 9L, 9L, 9L, 10L, 10L, 10L, 10L, 12L, 12L, 12L, 12L, 1L, 1L, 1L, 1L, 20L, 20L, 20L, 20L, 23L, 23L, 23L, 23L, 25L, 25L, 25L, 25L, 26L, 26L, 26L, 26L, 21L, 21L, 21L, 21L, 19L, 19L, 19L, 19L, 22L, 22L, 22L, 22L, 24L, 24L, 24L, 24L, 18L, 18L, 18L, 18L, 17L, 17L, 17L, 17L, 27L, 27L, 27L, 27L), .Label = c('M16', 'M05', 'M02', 'M11', 'M07', 'M08', 'M03', 'M12', 'M13', 'M14', 'M09', 'M15', 'M06', 'M04', 'M01', 'M10', 'F10', 'F09', 'F06', 'F01', 'F05', 'F07', 'F02', 'F08', 'F03', 'F04', 'F11'), class = c('ordered', 'factor')), Sex = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Male', 'Female'), class = 'factor')), .Names = c('distance', 'age', 'Subject', 'Sex'), row.names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100', '101', '102', '103', '104', '105', '106', '107', '108'), outer = ~Sex, class = c('nfnGroupedData', 'nfGroupedData', 'groupedData', 'data.frame'), formula = distance ~ age | Subject, labels = structure(list(x = 'Age', y = 'Distance from pituitary to pterygomaxillary fissure'), .Names = c('x', 'y')), units = structure(list(x = '(yr)', y = '(mm)'), .Names = c('x', 'y')), FUN = function(x) max(x, na.rm = TRUE), order.groups = TRUE), name = 'age'), .Names = c('x', 'name'));argv[[1L]]$age [1] 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 [26] 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 [51] 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 [76] 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 8 10 12 14 [101] 8 10 12 14 8 10 12 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_parentasis_Date.testextract_parentasis_Date1# #argv <- structure(list(x = structure(c(14579, 14580), class = 'Date'), 2), .Names = c('x', ''));do.call('[.Date', argv) [1] "2009-12-02" ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_parentasis_assign_factor.testextract_parentasis_assign_factor1# #argv <- structure(list(x = structure(c(4L, 1L, 4L, 4L, 6L, 4L, 5L, 5L, 4L, 6L, 6L, 2L, 3L, 6L, 4L, 2L, 1L, 6L, 1L, 3L, 3L, 5L, 2L, 2L, 2L, 5L, 3L, 3L, 1L, 2L, 5L, 6L, 6L, 6L, 6L, 2L, 6L, 1L, 5L, 1L, 2L, 4L, 4L, 6L, 5L, 5L, 2L, 6L, 4L, 6L, 5L, 1L, 2L, 5L, 1L, 1L, 4L, 3L, 3L, 4L, 4L, 2L, 5L, 3L, 4L, 5L, 4L, 6L, 4L, 5L, 2L, 6L, 2L, 4L, 2L, 2L, 4L, 4L, 1L, 6L, 2L, 1L, 5L, 3L, 5L, 1L, 2L, 2L, 4L, 2L, 4L, 2L, 5L, 6L, 5L, 6L, 3L, 1L, 2L, 4L, 6L, 6L, 3L, 3L, 2L, 6L, 2L, 5L, 3L, 4L, 3L, 4L, 6L, 3L, 4L, 2L, 3L, 1L, 6L, 2L, 4L, 4L, 1L, 3L, 4L, 3L, 4L, 1L, 4L, 1L, 3L, 5L, 5L, 5L, 4L, 4L, 6L, 2L, 6L, 3L, 2L, 1L, 1L, 6L, 2L, 2L, 5L, 1L, 5L, 3L, 2L, 2L, 5L, 1L, 6L, 3L, 6L, 4L, 2L, 2L, 5L, 6L, 6L, 1L, 1L, 6L, 6L, 5L, 2L, 5L, 6L, 5L, 4L, 6L, 2L, 5L, 4L, 3L, 5L, 1L, 3L, 4L, 4L, 3L, 1L, 1L, 5L, 4L, 1L, 3L, 5L, 4L, 5L, 4L, 6L, 6L, 2L, 4L, 3L, 3L), .Label = c('a', 'b', 'c', 'd', 'e', 'f'), class = 'factor'), c(189L, 84L, 154L, 9L, 130L, 44L, 137L, 12L, 50L, 1L, 42L, 174L, 194L, 131L, 157L, 101L, 37L, 128L, 117L, 181L, 51L, 109L, 110L, 67L, 69L, 124L, 192L, 65L, 171L, 168L), value = NA), .Names = c('x', '', 'value'));do.call('[<-.factor', argv) [1] a d d f d e e f f c f d [16] b a f a c c e b b b e c c a b [31] e f f f f b a e a b d e [46] e b f d a b e a a d c c d [61] d b e c e f e b f b d b [76] b d d a f b a e e a b b d b [91] d b e f e f c a b d f c c b [106] f b e c d f c d b a f b [121] d d a d c d d e e e d [136] d b f c b a a f b b e a e c [151] b b e f c d b b e f f a a [166] f f b e e d b e d c e a [181] d d c a a e d c e e f [196] f b d c c Levels: a b c d e f ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_parentasis_extract_parentasis_assign_factor.testextract_parentasis_extract_parentasis_assign_factor1# #argv <- structure(list(x = structure(c(2L, 2L, 3L), .Label = c('One', 'Two', 'Three'), class = 'factor'), 2, value = 'One'), .Names = c('x', '', 'value'));do.call('[[<-.factor', argv) [1] Two One Three Levels: One Two Three ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_parentasis_extract_parentasis_factor.testextract_parentasis_extract_parentasis_factor1# #argv <- structure(list(x = structure(2:4, .Label = c('A', 'B', 'C', 'D', 'E'), class = 'factor'), 2), .Names = c('x', ''));do.call('[[.factor', argv) [1] C Levels: A B C D E ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_parentasis_factor.testextract_parentasis_factor1# #argv <- structure(list(x = structure(c(111L, 88L, 93L, 74L, 138L, 103L, 46L, 114L, 112L, 24L, 99L, 97L, 57L, 40L, 86L, 37L, 124L, 9L, 20L, 54L, 145L, 3L, 7L, 134L, 98L, 143L, 131L, 47L, 128L, 116L, 137L, 5L, 132L, 21L, 81L, 58L, 108L, 17L, 107L, 126L, 2L, 18L, 75L, 4L, 63L, 121L, 84L, 101L, 123L, 102L, 36L, 48L, 12L, 105L, 100L, 90L, 34L, 55L, 68L, 10L, 52L, 91L, 146L, 127L, 1L, 29L, 106L, 26L, 115L, 118L, 25L, 82L, 16L, 45L, 95L, 69L, 72L, 15L, 120L, 104L, 125L, 6L, 140L, 65L, 62L, 39L, 35L, 38L, 83L, 117L, 42L, 13L, 87L, 22L, 53L, 41L, 113L, 73L, 133L, 23L, 80L, 8L, 19L, 78L, 60L, 31L, 33L, 147L, 139L, 56L, 130L, 64L, 71L, 43L, 136L, 89L, 94L, 96L, 70L, 59L, 129L, 27L, 92L, 51L, 77L, 50L, 66L, 119L, 135L, 110L, 144L, 109L, 67L, 44L, 32L, 141L, 76L, 79L, 49L, 142L, 30L, 14L, 85L, 28L, 11L, 61L, 122L), .Label = c('1415787_at', '1415904_at', '1415993_at', '1416164_at', '1416181_at', '1416221_at', '1416481_s_at', '1416812_at', '1416855_at', '1416949_s_at', '1417129_a_at', '1417425_at', '1417447_at', '1417466_at', '1417572_at', '1417624_at', '1417667_a_at', '1417964_at', '1418084_at', '1418382_at', '1418424_at', '1418471_at', '1418479_at', '1418486_at', '1418516_at', '1418560_at', '1418649_at', '1418835_at', '1419361_at', '1419430_at', '1419686_at', '1419833_s_at', '1420011_s_at', '1420643_at', '1420886_a_at', '1421045_at', '1421180_at', '1421773_at', '1422018_at', '1422557_s_at', '1422671_s_at', '1422809_at', '1422850_at', '1422979_at', '1423095_s_at', '1423110_at', '1423123_at', '1423124_x_at', '1423176_at', '1423319_at', '1423852_at', '1423924_s_at', '1424107_at', '1424186_at', '1424212_at', '1424243_at', '1424474_a_at', '1424749_at', '1425494_s_at', '1425534_at', '1425779_a_at', '1426083_a_at', '1426295_at', '1426371_at', '1426485_at', '1426510_at', '1426628_at', '1426845_at', '1427120_at', '1427208_at', '1427256_at', '1427314_at', '1427672_a_at', '1428922_at', '1428942_at', '1429177_x_at', '1429514_at', '1429859_a_at', '1431830_at', '1433512_at', '1434326_x_at', '1434485_a_at', '1434831_a_at', '1434920_a_at', '1435129_at', '1435327_at', '1435357_at', '1436392_s_at', '1436528_at', '1436886_x_at', '1437163_x_at', '1437223_s_at', '1437434_a_at', '1437455_a_at', '1438312_s_at', '1438651_a_at', '1439148_a_at', '1439373_x_at', '1439381_x_at', '1439962_at', '1448131_at', '1448143_at', '1448147_at', '1448259_at', '1448269_a_at', '1448466_at', '1448601_s_at', '1448630_a_at', '1448823_at', '1448943_at', '1448995_at', '1449059_a_at', '1449376_at', '1449623_at', '1449630_s_at', '1449697_s_at', '1449699_s_at', '1449755_at', '1449773_s_at', '1449885_at', '1450070_s_at', '1450723_at', '1450846_at', '1450857_a_at', '1450941_at', '1451103_at', '1451266_at', '1451317_at', '1451332_at', '1451415_at', '1451418_a_at', '1451532_s_at', '1451536_at', '1452003_at', '1452110_at', '1452183_a_at', '1452665_at', '1452671_s_at', '1452869_at', '1453030_at', '1455056_at', '1455517_at', '1456174_x_at', '1456393_at', '1456434_x_at', '1460260_s_at', '1460359_at'), class = 'factor'), 1:25), .Names = c('x', ''));do.call('[.factor', argv) [1] 1448995_at 1436392_s_at 1437434_a_at 1428922_at 1452671_s_at [6] 1448147_at 1423110_at 1449623_at 1449059_a_at 1418486_at [11] 1439381_x_at 1439148_a_at 1424474_a_at 1422557_s_at 1435327_at [16] 1421180_at 1450857_a_at 1416855_at 1418382_at 1424186_at [21] 1456434_x_at 1415993_at 1416481_s_at 1452003_at 1439373_x_at 147 Levels: 1415787_at 1415904_at 1415993_at 1416164_at ... 1460359_at ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_replace.extractAndReplaceByItself# #tmp <- c(1,8,NA,3); pivot <- c(1,2,4,3); tmp[pivot] <- tmp; tmp [1] 1 8 3 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_replace.extractReplaceIntroducesNA#Output.IgnoreWhitespace# #{ x <- c(1,2,3); x[[2147483648]] <- 42 } Error in x[[2147483648]] <- 42 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_replace.extractReplaceIntroducesNA# #{ x <- c(1,2,3); x[[2147483648]] } Error in x[[2147483648]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_replace.replaceExpressionInLanguage#Ignored.OutputFormatting# #e1 <- expression(x^2); l1 <- quote(y^2); l1[1] <- e1; l1 (x^2)(y, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_replace.replaceExpressionInLanguage# #e1 <- expression(x^2); l1 <- quote(y^2); l1[1] <- e1; l1[[1]]==e1[[1]] [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_replace.replaceInLanguagePreservesAttributes# #f <- quote(a+b); attr(f, 'mya') <- 42; f[[2]] <- quote(q); f q + b attr(,"mya") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_extract_replace.replaceWithPositionNames# #{ foo <- function(x, idx) { x[idx] <- F; x }; foo(c(T,T,T,T), structure(c('a'), .Names = c('a'))); r <- foo(c(T,T,T,T), structure(c('a', 'b'), .Names = c('a', 'b'))); r } a b TRUE TRUE TRUE TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ as.logical(factor(c("a", "b", "a"))) } [1] NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ as.logical(factor(integer())) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x <- factor(c("a", "b", "a")); attr(x, "levels")<-c(7+7i, 42+42i); is.complex(levels(x)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x <- factor(c("a", "b", "a")); attr(x, "levels")<-c(7, 42); is.double(levels(x)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x <- factor(c("a", "b", "a")); attr(x, "levels")<-c(7L, 42L); is.integer(levels(x)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x <- factor(c("a", "b", "a")); attr(x, "levels")<-c(FALSE, TRUE); is.logical(levels(x)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x <- factor(c("a", "b", "a")); attr(x, "levels")<-c(as.raw(7), as.raw(42)); is.raw(levels(x)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x <- factor(c("a", "b", "a")); levels(x)<-c(7, 42); is.character(levels(x)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-c("1","2","3"); class(x)<-"factor"; x } Error in class(x) <- "factor" : adding class "factor" to an invalid object ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-c(1,2,3); class(x)<-"factor"; x } Error in class(x) <- "factor" : adding class "factor" to an invalid object ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreWarningContext# #{ x<-c(1L, 2L, 1L); class(x)<-c("factor", "ordered"); levels(x)<-c("a", "b"); x + "a" } [1] NA NA NA Warning message: In Ops.factor(x, "a") : ‘+’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreWarningContext# #{ x<-c(1L, 2L, 1L); class(x)<-c("factor", "ordered"); levels(x)<-c("a", "b"); x > "a" } [1] NA NA NA Warning message: In Ops.factor(x, "a") : ‘>’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreWarningContext# #{ x<-c(1L, 2L, 1L); class(x)<-c("ordered", "factor"); levels(x)<-c("a", "b"); x + "a" } [1] NA NA NA Warning message: In Ops.ordered(x, "a") : '+' is not meaningful for ordered factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-c(1L, 2L, 1L); class(x)<-c("ordered", "factor"); levels(x)<-c("a", "b"); x > "a" } [1] FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreErrorContext# #{ x<-c(1L,2L,3L); class(x)<-"factor"; x } Error in as.character.factor(x) : malformed factor ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreErrorContext# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-NULL; as.character(x) } Error in as.character.factor(x) : malformed factor ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-c(+7+7i, +42+42i); x == 7+7i } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-c(+7, +42); x == 7 } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-c(+7L, +42L); x == 7 } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreErrorContext# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-c(7+7i, 42+42i); x } Error in as.character.factor(x) : malformed factor ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreErrorContext# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-c(7, 42); x } Error in as.character.factor(x) : malformed factor ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreErrorContext# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-c(7L, 42L); x } Error in as.character.factor(x) : malformed factor ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreErrorContext# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-c(FALSE, TRUE); x } Error in as.character.factor(x) : malformed factor ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-c(as.raw(7), as.raw(42)); x == as.raw(7) } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreErrorContext# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-c(as.raw(7), as.raw(42)); x } Error in as.character.factor(x) : malformed factor ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreErrorContext# #{ x<-factor(c("a", "b", "a")); attr(x, "levels")<-character(); as.character(x) } Error in as.character.factor(x) : malformed factor ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); is.atomic(x) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); levels(x)<-c(7,42); is.character(levels(x)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); levels(x)<-c(7,42); x } [1] 7 42 7 Levels: 7 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreWarningContext# #{ x<-factor(c("a", "b", "a")); x + "a" } [1] NA NA NA Warning message: In Ops.factor(x, "a") : ‘+’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreWarningContext# #{ x<-factor(c("a", "b", "a")); x + c("a", "b") } [1] NA NA NA Warning message: In Ops.factor(x, c("a", "b")) : ‘+’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); x == "a" } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreWarningContext# #{ x<-factor(c("a", "b", "a")); x == c("a", "b") } [1] TRUE TRUE TRUE Warning messages: 1: In `==.default`(x, c("a", "b")) : longer object length is not a multiple of shorter object length 2: In is.na(e1) | is.na(e2) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreWarningContext# #{ x<-factor(c("a", "b", "a")); x > "a" } [1] NA NA NA Warning message: In Ops.factor(x, "a") : ‘>’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreWarningContext# #{ x<-factor(c("a", "b", "a")); x > c("a", "b") } [1] NA NA NA Warning message: In Ops.factor(x, c("a", "b")) : ‘>’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); x[1] } [1] a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); x[2] } [1] b Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); x[[1]] } [1] a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); x[[2]] } [1] b Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); x[c(1,2)] } [1] a b Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a")); x[c(1,2,3,4)] } [1] a b a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a"), ordered=TRUE); is.atomic(x) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreWarningContext# #{ x<-factor(c("a", "b", "a"), ordered=TRUE); x + "a" } [1] NA NA NA Warning message: In Ops.ordered(x, "a") : '+' is not meaningful for ordered factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a"), ordered=TRUE); x > "a" } [1] FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("a", "b", "a", "c")); x == c("a", "b") } [1] TRUE TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("c", "b", "a", "c")); y<-c(1); y[1]<-x; y } [1] 3 Warning message: In y[1] <- x : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("c", "b", "a", "c")); y<-c(1); y[[1]]<-x; y } Error in y[[1]] <- x : more elements supplied than there are to replace ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("c", "b", "a", "c")); y<-list(1); y[1]<-x; y } [[1]] [1] 3 Warning message: In y[1] <- x : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-factor(c("c", "b", "a", "c")); y<-list(1); y[[1]]<-x; y } [[1]] [1] c b a c Levels: a b c ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-structure(c(1,2,1), .Label=c("a", "b"), class = c('factor'), .Names=c("111","112","113")); names(x) } [1] "111" "112" "113" ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor#Output.IgnoreWarningContext# #{ x<-structure(c(1,2,1), .Label=c("a", "b"), class = c('factor'), .Names=c("111","112","113")); y<-structure(c(1,2,1), .Label=c("a", "b"), class = c('factor'), .Names=c("111","112","113")); x+y } [1] NA NA NA Warning message: In Ops.factor(x, y) : ‘+’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-structure(c(1,2,1), .Label=c("a", "b"), class = c('factor'), .Names=c("111","112","113")); y<-structure(c(1,2,1), .Label=c("a", "b"), class = c('factor'), .Names=c("111","112","113")); x==y } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-structure(c(1.1,2.2,1.1), .Label=c("a", "b"), class = c('factor')); attributes(x) } $levels [1] "a" "b" $class [1] "factor" ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-structure(c(1.1,2.2,1.1), .Label=c("a", "b"), class = c('factor')); x } [1] a b a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-structure(c(1.2,2.2,1.1), .Label=c("a", "b"), class = c('factor')); x } [1] a b a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-structure(c(2.2,3.2,2.1), .Label=c("a", "b"), class = c('factor')); as.integer(x) } [1] 2 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ x<-structure(factor(c("a","b","c")), class=NULL); x } [1] 1 2 3 attr(,"levels") [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ z=factor(c("a", "b", "a")); z[1] = "b"; z } [1] b b a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{data = c(1,2,2,3,1,2,3,3,1,2,3,3,1);fdata<-factor(data);fdata} [1] 1 2 2 3 1 2 3 3 1 2 3 3 1 Levels: 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{data = c(1,2,2,3,1,2,3,3,1,2,3,3,1);fdata<-factor(data);levels(fdata) = c('I','II','III');fdata;} [1] I II II III I II III III I II III III I Levels: I II III ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{data = c(1,2,2,3,1,2,3,3,1,2,3,3,1);rdata = factor(data,labels=c("I","II","III"));rdata;} [1] I II II III I II III III I II III III I Levels: I II III ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{ses <- c("low", "middle", "low", "low", "low", "low", "middle", "low", "middle", "middle", "middle", "middle", "middle", "high", "high", "low", "middle", "middle", "low", "high"); ses.f.bad.order <- factor(ses); is.factor(ses.f.bad.order);levels(ses.f.bad.order);ses.f <- factor(ses, levels = c("low", "middle", "high"));ses.order <- ordered(ses, levels = c("low", "middle", "high"));ses.order; } [1] low middle low low low low middle low middle middle [11] middle middle middle high high low middle middle low high Levels: low < middle < high ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{set.seed(124); schtyp <- sample(0:1, 20, replace = TRUE);schtyp.f <- factor(schtyp, labels = c("private", "public")); schtyp.f;} [1] private private public private private public public private public [10] private private private public public public public public public [19] public public Levels: private public ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testFactor# #{set.seed(124);l1 = factor(sample(letters,size=10,replace=TRUE));set.seed(124);l2 = factor(sample(letters,size=10,replace=TRUE));l12 = factor(c(levels(l1)[l1],levels(l2)[l2]));l12;} [1] a g j e x f m j a o a g j e x f m j a o Levels: a e f g j m o x ##com.oracle.truffle.r.test.builtins.TestBuiltin_factor.testfactor1# #argv <- structure(list(x = c(1L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 1L, 1L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 0L, 0L, 1L, 0L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 1L, 0L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 1L, 1L, 0L, 0L, 1L, 1L, 1L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 1L, 1L, 0L, 1L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 0L, 0L, 1L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 1L, 1L, 0L, 1L, 1L, 0L, 1L, 1L, 0L, 1L, 1L, 1L, 0L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 0L, 0L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 0L, 0L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 1L, 1L, 1L, 1L, 0L, 1L, 1L, 0L, 1L, 0L, 1L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 1L, 1L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 1L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 0L, 0L, 1L, 0L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 1L, 1L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 1L, 0L, 0L, 1L, 1L, 0L, 0L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 1L, 1L, 0L, 0L, 1L, 0L, 1L, 1L, 0L, 1L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 0L, 1L, 1L, 0L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 1L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 1L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 0L, 1L, 1L, 0L, 1L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 1L, 1L, 0L, 1L, 0L, 1L)), .Names = 'x');do.call('factor', argv) [1] 1 0 1 1 1 1 1 1 0 0 0 0 1 1 0 1 0 1 1 1 0 1 0 0 1 1 0 0 1 1 0 0 0 0 0 0 1 [38] 0 0 0 1 0 0 1 1 1 1 0 0 0 1 1 0 1 1 1 0 1 0 1 1 0 1 1 1 1 1 0 0 1 0 1 1 1 [75] 0 0 0 1 0 1 0 0 0 1 0 0 0 0 1 0 1 1 0 0 0 1 0 0 1 0 1 0 1 1 1 0 1 1 1 1 1 [112] 1 1 1 1 1 0 0 1 0 0 0 0 1 1 1 0 0 0 0 0 0 1 1 0 1 1 1 0 0 1 1 1 0 0 1 1 1 [149] 1 0 1 1 0 0 0 1 0 0 0 1 1 1 0 1 0 0 0 1 1 0 0 0 0 1 0 0 0 0 1 0 0 1 1 1 0 [186] 1 0 0 1 1 1 0 1 1 1 0 0 0 1 0 0 1 0 0 0 1 0 0 1 0 1 0 0 1 0 0 1 0 1 1 0 1 [223] 1 0 1 0 1 0 1 0 0 1 1 1 0 1 1 1 1 1 0 0 1 0 1 0 0 0 0 1 0 0 0 1 1 1 0 1 0 [260] 1 0 1 0 1 1 1 1 0 0 1 0 0 1 0 1 1 1 1 1 1 0 1 1 1 1 1 1 1 0 1 0 0 0 0 0 1 [297] 1 0 0 0 0 1 1 0 1 1 1 1 1 1 1 1 1 1 1 0 0 0 0 1 1 1 0 1 1 1 1 1 1 1 0 0 0 [334] 0 0 0 0 0 1 0 1 1 1 0 1 1 0 1 1 0 1 1 1 0 1 1 0 1 1 1 1 0 0 0 0 0 0 0 0 1 [371] 0 0 0 0 0 0 0 0 0 0 1 1 1 1 1 1 1 0 1 1 1 0 0 1 0 1 1 1 1 1 0 0 1 1 1 1 1 [408] 0 1 1 1 1 0 0 1 1 1 1 0 0 0 1 1 1 1 0 1 1 0 0 0 1 1 1 0 0 1 1 1 1 1 1 1 0 [445] 0 0 1 0 0 0 0 1 0 0 1 0 1 1 1 1 0 1 1 0 1 0 1 0 0 1 1 1 0 1 0 0 1 0 0 1 1 [482] 1 0 0 0 0 0 1 0 0 1 1 1 1 1 0 0 0 1 1 0 1 0 0 1 1 0 1 0 1 1 1 1 0 0 0 0 1 [519] 1 0 1 0 0 0 1 1 0 1 0 0 0 0 0 1 0 1 0 1 1 0 1 0 0 1 0 0 0 1 0 1 1 1 1 0 1 [556] 1 1 1 1 1 1 0 0 0 1 1 1 1 0 0 0 0 1 1 0 0 1 0 0 0 1 1 0 1 0 1 1 1 0 1 1 1 [593] 0 0 1 0 1 0 1 1 0 0 0 0 1 0 1 0 0 1 0 0 1 1 0 1 1 0 0 0 1 0 1 0 1 0 0 1 0 [630] 0 0 0 0 1 1 1 1 1 0 1 0 0 1 1 0 0 1 1 0 0 0 0 0 1 1 1 0 1 1 1 1 0 0 1 0 0 [667] 1 0 0 0 0 0 0 0 0 1 1 1 0 1 1 1 1 1 0 1 0 0 1 1 0 0 0 0 0 0 1 0 0 1 0 1 0 [704] 0 1 1 0 0 1 1 1 0 0 0 0 1 0 0 1 0 0 0 1 1 1 0 0 1 0 1 0 1 0 1 0 1 1 1 0 0 [741] 1 0 1 1 0 1 1 0 1 1 0 0 0 1 1 1 1 0 0 0 1 1 0 0 0 0 1 1 1 1 0 1 0 0 0 1 0 [778] 1 0 1 1 0 0 0 1 1 0 0 1 0 0 1 0 0 1 0 1 0 0 0 1 1 0 1 0 0 0 0 0 0 1 1 0 1 [815] 0 0 1 1 0 1 0 1 0 1 1 1 0 0 0 0 1 0 0 0 1 1 1 1 1 1 1 0 1 1 0 1 0 0 0 1 1 [852] 1 0 1 0 0 0 1 0 1 0 1 0 1 1 1 1 0 1 1 1 1 1 0 1 0 1 1 0 0 1 0 1 0 1 0 0 0 [889] 1 0 0 0 1 0 1 1 0 1 1 1 1 0 0 1 1 1 0 0 1 0 0 1 0 1 0 1 0 1 1 0 0 1 0 0 1 [926] 0 0 1 0 0 0 1 1 1 0 0 0 0 0 1 1 0 0 0 0 0 0 0 1 0 1 1 0 0 1 0 0 1 1 0 1 1 [963] 0 0 0 1 0 0 0 0 1 1 0 1 0 0 1 1 0 1 1 0 1 1 1 1 1 0 1 1 1 0 1 0 1 1 0 1 0 [1000] 1 Levels: 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileaccess.testfileaccess1# #argv <- list(character(0), 0); .Internal(file.access(argv[[1]], argv[[2]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileaccess.testfileaccess2# #argv <- list('/home/lzhao/R/x86_64-unknown-linux-gnu-library/3.0/FALSE', 5); .Internal(file.access(argv[[1]], argv[[2]])) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecopy.testfilecopy# #baseD<-paste0(tempdir(), '/file.copy.test'); nameF<-'/srcFile.txt'; srcD<-paste0(baseD, '/src'); srcF<-paste0(srcD, nameF); dstD<-paste0(baseD, '/dst'); dstF<-paste0(dstD, '/src', nameF); tryCatch({dir.create(paste0(dstD, '/src'), rec=TRUE); dir.create(srcD, rec=TRUE); cat('New\n', file=srcF); cat('Old\n', file=dstF); print(file.copy(from=srcD, to=dstD, recursive=TRUE, overwrite=FALSE)); print(readLines(dstF)); }, finally=unlink(baseD, recursive=TRUE)) [1] FALSE [1] "Old" ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecopy.testfilecopy# #baseD<-paste0(tempdir(), '/file.copy.test'); nameF<-'/srcFile.txt'; srcD<-paste0(baseD, '/src'); srcF<-paste0(srcD, nameF); dstD<-paste0(baseD, '/dst'); dstF<-paste0(dstD, '/src', nameF); tryCatch({dir.create(paste0(dstD, '/src'), rec=TRUE); dir.create(srcD, rec=TRUE); cat('New\n', file=srcF); cat('Old\n', file=dstF); print(file.copy(from=srcD, to=dstD, recursive=TRUE, overwrite=TRUE)); print(readLines(dstF)) }, finally=unlink(baseD, recursive=TRUE)) [1] TRUE [1] "New" ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecopy.testfilecopy# #baseD<-paste0(tempdir(), '/file.copy.test'); nameF<-'/srcFile.txt'; srcD<-paste0(baseD, '/src'); srcF<-paste0(srcD, nameF); dstD<-paste0(baseD, '/dst'); dstF<-paste0(dstD, nameF); tryCatch({dir.create(dstD, rec=TRUE); dir.create(srcD, rec=TRUE); cat('Hello\n', file=srcF); print(file.copy(from=srcD, to=dstD)); print(file.exists(dstF)) }, finally=unlink(baseD, recursive=TRUE)) [1] FALSE [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecopy.testfilecopy# #baseD<-paste0(tempdir(), '/file.copy.test'); nameF<-'/srcFile.txt'; srcD<-paste0(baseD, '/src'); srcF<-paste0(srcD, nameF); dstD<-paste0(baseD, '/dst'); dstSrcD<-paste0(dstD, '/src'); dstSrcF<-paste0(dstSrcD, nameF); tryCatch({dir.create(dstD, rec=TRUE); dir.create(srcD, rec=TRUE); cat('Hello\n', file=srcF); print(file.copy(from=srcD, to=dstD, rec=TRUE)); print(file.exists(dstSrcD)); print(readLines(dstSrcF)); }, finally=unlink(baseD, recursive=TRUE)) [1] TRUE [1] TRUE [1] "Hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecopy.testfilecopy# #baseD<-paste0(tempdir(), '/file.copy.test'); nameF<-'/srcFile.txt'; srcD<-paste0(baseD, '/src'); srcF<-paste0(srcD, nameF); srcF2<-paste0(srcD, nameF, '2'); dstD<-paste0(baseD, '/dst'); dstF<-paste0(dstD, '/src', nameF); dstF2<-paste0(dstD, '/src', nameF, '2');tryCatch({dir.create(paste0(dstD, '/src'), rec=TRUE); dir.create(srcD, rec=TRUE); cat('New\n', file=srcF); cat('New2\n', file=srcF2); cat('Old\n', file=dstF); print(file.copy(from=srcD, to=dstD, recursive=TRUE, overwrite=FALSE)); print(readLines(dstF)); print(readLines(dstF2)) }, finally=unlink(baseD, recursive=TRUE)) [1] FALSE [1] "Old" [1] "New2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecopy.testfilecopy# #baseD<-paste0(tempdir(), '/file.copy.test'); nameF<-'/srcFile.txt'; srcF<-paste0(baseD, nameF); dstD<-paste0(baseD, '/dst'); dstF<-paste0(dstD, nameF); tryCatch({dir.create(dstD, rec=TRUE); cat('Hello\n', file=srcF); print(file.copy(from=srcF, to=dstD)); print(readLines(dstF)) }, finally=unlink(baseD, recursive=TRUE)) [1] TRUE [1] "Hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecopy.testfilecopy# #baseD<-paste0(tempdir(), '/file.copy.test'); nameF<-'/srcFile.txt'; srcF<-paste0(baseD, nameF); dstD<-paste0(baseD, '/dst'); dstF<-paste0(dstD, nameF); tryCatch({dir.create(dstD, rec=TRUE); cat('New\n', file=srcF); cat('Old\n', file=dstF); print(file.copy(from=srcF, to=dstD)); print(readLines(dstF)) }, finally=unlink(baseD, recursive=TRUE)) [1] FALSE [1] "Old" ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecopy.testfilecopy# #baseD<-paste0(tempdir(), '/file.copy.test'); nameF<-'/srcFile.txt'; srcF<-paste0(baseD, nameF); dstD<-paste0(baseD, '/dst'); dstF<-paste0(dstD, nameF); tryCatch({dir.create(dstD, rec=TRUE); cat('New\n', file=srcF); cat('Old\n', file=dstF); print(file.copy(from=srcF, to=dstD, overwrite=TRUE)); print(readLines(dstF)) }, finally=unlink(baseD, recursive=TRUE)) [1] TRUE [1] "New" ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecreate.testfilecreate1# #argv <- list('codetools-manual.log', TRUE); .Internal(file.create(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecreate.testfilecreate2# #argv <- list(character(0), TRUE); .Internal(file.create(argv[[1]], argv[[2]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_filecreate.testfilecreate4# #argv <- structure(list('foo1'), .Names = '');do.call('file.create', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileexists.testFileDoesNotExist# # file.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileexists.testFileDoesNotExist#Ignored.ImplementationError# # file.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/..') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileexists.testFileDoesNotExist# # file.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileexists.testFileDoesNotExist#Ignored.ImplementationError# # file.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa/..') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileexists.testFileDoesNotExist#Ignored.ImplementationError# # file.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../dummy.txt') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileexists.testFileDoesNotExist# #if (!any(R.version$engine == "FastR")) { TRUE } else { file.exists('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1') } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileexists.testfileexists1# #argv <- list('/home/lzhao/hg/r-instrumented/library/methods/data/Rdata.rdb'); .Internal(file.exists(argv[[1]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileexists.testfileexists2# #argv <- list(c('src/Makevars', 'src/Makevars.in')); .Internal(file.exists(argv[[1]])) [1] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileexists.testfileexists3# #argv <- list(character(0)); .Internal(file.exists(argv[[1]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileinfo.testfileinfo1# #argv <- list('/home/lzhao/hg/r-instrumented/library/codetools/data'); .Internal(file.info(argv[[1]])) Error: 1 argument passed to .Internal(file.info) which requires 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileinfo.testfileinfo2# #argv <- list(character(0)); .Internal(file.info(argv[[1]])) Error: 1 argument passed to .Internal(file.info) which requires 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_filepath.testfilepath# #file.path('xyzqwrtyerta', NULL) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_filepath.testfilepath1# #argv <- list(list('/home/lzhao/hg/r-instrumented/tests/Packages/rpart/R', 'summary.rpart.R'), '/'); .Internal(file.path(argv[[1]], argv[[2]])) [1] "/home/lzhao/hg/r-instrumented/tests/Packages/rpart/R/summary.rpart.R" ##com.oracle.truffle.r.test.builtins.TestBuiltin_filepath.testfilepath2# #argv <- list(list('/home/lzhao/hg/r-instrumented/src/library/parallel/R/unix', c('forkCluster.R', 'mcfork.R', 'mclapply.R', 'mcmapply.R', 'mcparallel.R', 'pvec.R')), '/'); .Internal(file.path(argv[[1]], argv[[2]])) [1] "/home/lzhao/hg/r-instrumented/src/library/parallel/R/unix/forkCluster.R" [2] "/home/lzhao/hg/r-instrumented/src/library/parallel/R/unix/mcfork.R" [3] "/home/lzhao/hg/r-instrumented/src/library/parallel/R/unix/mclapply.R" [4] "/home/lzhao/hg/r-instrumented/src/library/parallel/R/unix/mcmapply.R" [5] "/home/lzhao/hg/r-instrumented/src/library/parallel/R/unix/mcparallel.R" [6] "/home/lzhao/hg/r-instrumented/src/library/parallel/R/unix/pvec.R" ##com.oracle.truffle.r.test.builtins.TestBuiltin_filepath.testfilepath3# #argv <- list(list('/home/lzhao/hg/r-instrumented/tests/tcltk.Rcheck', structure('tcltk', .Names = 'Package'), 'help'), '/'); .Internal(file.path(argv[[1]], argv[[2]])) [1] "/home/lzhao/hg/r-instrumented/tests/tcltk.Rcheck/tcltk/help" ##com.oracle.truffle.r.test.builtins.TestBuiltin_filepath.testfilepath4# #argv <- list(list(character(0), 'DESCRIPTION'), '/'); .Internal(file.path(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_filepath.testfilepath5# #argv <- list(list(structure(character(0), .Dim = c(0L, 0L))), '/'); .Internal(file.path(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_filepath.testfilepath7# #argv <- structure(list('.', 'Pkgs'), .Names = c('', ''));do.call('file.path', argv) [1] "./Pkgs" ##com.oracle.truffle.r.test.builtins.TestBuiltin_fileremove.testfileremove1# #argv <- list(character(0)); .Internal(file.remove(argv[[1]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_filerename.testfilerename1# #argv <- list(character(0), character(0)); .Internal(file.rename(argv[[1]], argv[[2]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_findInterval.testfindInterval1# #argv <- list(c(1, 2, 3, 4, 5, 6, 7, 8, 9), c(3, 3.25, 3.5, 3.75, 4, 4.25, 4.5, 4.75, 5, 5.25, 5.5, 5.75, 6), FALSE, FALSE); .Internal(findInterval(argv[[1]], argv[[2]], argv[[3]], argv[[4]], F)) [1] 3 3 3 3 4 4 4 4 5 5 5 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_findInterval.testfindInterval1# #argv <- list(c(1, 2, 3, 4, 5, 6, 7, 8, 9), c(3, 3.25, 3.5, 3.75, 4, 4.25, 4.5, 4.75, 5, 5.25, 5.5, 5.75, 6), FALSE, FALSE); .Internal(findInterval(argv[[1]], argv[[2]], argv[[3]], argv[[4]], T)) [1] 2 3 3 3 3 4 4 4 4 5 5 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_findInterval.testfindInterval2# #argv <- list(NA_real_, NA_real_, FALSE, FALSE); .Internal(findInterval(argv[[1]], argv[[2]], argv[[3]], argv[[4]], F)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_findInterval.testfindInterval2# #argv <- list(NA_real_, NA_real_, FALSE, FALSE); .Internal(findInterval(argv[[1]], argv[[2]], argv[[3]], argv[[4]], T)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_findInterval.testfindInterval3# #argv <- list(numeric(0), numeric(0), FALSE, FALSE); .Internal(findInterval(argv[[1]], argv[[2]], argv[[3]], argv[[4]], F)) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_findInterval.testfindInterval3# #argv <- list(numeric(0), numeric(0), FALSE, FALSE); .Internal(findInterval(argv[[1]], argv[[2]], argv[[3]], argv[[4]], T)) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_findInterval.testfindInterval4# #argv <- list(c(5, 10, 15), c(2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18), FALSE, FALSE); .Internal(findInterval(argv[[1]], argv[[2]], argv[[3]], argv[[4]], F)) [1] 0 0 0 1 1 1 1 1 2 2 2 2 2 3 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_findInterval.testfindInterval4# #argv <- list(c(5, 10, 15), c(2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18), FALSE, FALSE); .Internal(findInterval(argv[[1]], argv[[2]], argv[[3]], argv[[4]], T)) [1] 0 0 0 0 1 1 1 1 1 2 2 2 2 2 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testFloor# #if (!any(R.version$engine == "FastR")) { 1+1i } else { { floor(1.1+1.9i); } } [1] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testFloor# #{ floor("aaa"); } Error in floor("aaa") : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testFloor# #{ floor(c(0.2,-3.4,NA,0/0,1/0)) } [1] 0 -4 NA NaN Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testFloor# #{ typeof(floor(42L)); } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testFloor# #{ typeof(floor(TRUE)); } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testfloor1# #argv <- list(c(2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8, 9.9, 11));floor(argv[[1]]); [1] 2 3 4 5 6 7 8 9 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testfloor2# #argv <- list(structure(c(12784, 13149, 13514, 13879, 14245, 14610), tzone = 'UTC'));floor(argv[[1]]); [1] 12784 13149 13514 13879 14245 14610 attr(,"tzone") [1] "UTC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testfloor3# #argv <- list(c(-0.783587745879035, -0.739712343519063, -0.314304892261569));floor(argv[[1]]); [1] -1 -1 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testfloor4# #argv <- list(structure(c(1920.5, 1920.5833, 1920.6667, 1920.75, 1920.8333, 1920.9167, 1921, 1921.0833, 1921.1667, 1921.25), .Tsp = c(1920.5, 1921.25, 12), class = 'ts'));floor(argv[[1]]); Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec 1920 1920 1920 1920 1920 1920 1920 1921 1921 1921 1921 1921 ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testfloor5# #argv <- list(c(-1.94786705265839, 0.813844117537122));floor(argv[[1]]); [1] -2 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testfloor6# #argv <- list(structure(c(0.555857947411444, 2.74659181662125, NA, 6.01634386021798, 3.26975214359673, 2.19073396920981, 2.74659181662125, NA, 0.555857947411444, 3.82560999100817, 0.555857947411444, 2.19073396920981, 2.74659181662125, 2.74659181662125, 1.07901827438692, 4.38146783841962, 1.11171579482289, 1e-07, 7.09536203460491, 11.9999901, 4.93732568583106, 5.46048601280654), .Dim = c(22L, 1L)));floor(argv[[1]]); [,1] [1,] 0 [2,] 2 [3,] NA [4,] 6 [5,] 3 [6,] 2 [7,] 2 [8,] NA [9,] 0 [10,] 3 [11,] 0 [12,] 2 [13,] 2 [14,] 2 [15,] 1 [16,] 4 [17,] 1 [18,] 0 [19,] 7 [20,] 11 [21,] 4 [22,] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testfloor7# #argv <- list(structure(c(3.08577921002324, 0.531033162063639, 1.47434325842442, 5.64214292692797, 6.21994378924106, 2.27200744902353, 11.9999901, 0.424434048635841, 0.549397569660826, 0.973929660925175, 1e-07, 3.54172739357752, 11.9999901, 2.27200744902353, 4.47284349010678, 6.43648940805496, 7.50963843787849, 7.11757579203344, 11.9999901, 3.54172739357752, 6.21994378924106, 5.1224060214714, 6.89175397596987, 6.52603528890926, 11.9999901, 7.11757579203344, 1e-07, 5.64214292692797, 6.00414304408873, 9.63018799510384, 11.9999901, 6.52603528890926, 7.50963843787849, 0.973929660925175, 1.47434325842442, 4.2100341139702, 11.9999901, 9.63018799510384, 6.89175397596987, 6.43648940805496, 0.549397569660826, 0.531033162063639, 11.9999901, 4.2100341139702, 6.00414304408873, 5.1224060214714, 4.47284349010678, 0.424434048635841, 3.08577921002324), .Dim = c(7L, 7L), .Dimnames = list(c('privileges', 'rating', 'complaints', 'learning', 'raises', 'critical', 'advance'), c('advance', 'critical', 'raises', 'learning', 'complaints', 'rating', 'privileges'))));floor(argv[[1]]); advance critical raises learning complaints rating privileges privileges 3 0 4 5 6 4 11 rating 0 0 6 6 9 11 4 complaints 1 0 7 6 11 9 6 learning 5 0 7 11 6 6 5 raises 6 3 11 7 7 6 4 critical 2 11 3 0 0 0 0 advance 11 2 6 5 1 0 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testfloor8# #argv <- list(structure(c(1976, 1976.0833, 1976.1667, 1976.25, 1976.3333, 1976.4167, 1976.5, 1976.5833, 1976.6667, 1976.75, 1976.8333, 1976.9167, 1977, 1977.0833, 1977.1667, 1977.25, 1977.3333, 1977.4167, 1977.5, 1977.5833, 1977.6667, 1977.75, 1977.8333, 1977.9167, 1978), .Tsp = c(1976, 1978, 12), class = 'ts'));floor(argv[[1]]); Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec 1976 1976 1976 1976 1976 1976 1976 1976 1976 1976 1976 1976 1976 1977 1977 1977 1977 1977 1977 1977 1977 1977 1977 1977 1977 1977 1978 1978 ##com.oracle.truffle.r.test.builtins.TestBuiltin_floor.testfloor9# #argv <- list(logical(0));floor(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_flush.testflush1# #argv <- list(structure(1L, class = c('terminal', 'connection'))); .Internal(flush(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_flush.testflush2# #argv <- list(structure(2L, class = c('terminal', 'connection'))); .Internal(flush(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_formals.testFormals# #{ f <- function(a) {}; formals(f) } $a ##com.oracle.truffle.r.test.builtins.TestBuiltin_formals.testFormals# #{ f <- function(a, b = c(1, 2)) {}; formals(f) } $a $b c(1, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_formals.testFormals# #{ f <- function(a, b) {}; formals(f) } $a $b ##com.oracle.truffle.r.test.builtins.TestBuiltin_formals.testFormalsAssignment# #{ f <- function(x,y) x; g <- function(y=2) y; formals(f)['y'] <- formals(g); f(42) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formals.testFormalsAssignment# #{ f <- function(x,y) x; g <- function(y=2) y; formals(f)[names(formals(g))] <- formals(g); f(42) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formals.testFormalsAssignment# #{ f <- function(x=42L) x; g <- function(x) x; formals(g) <- formals(f); g() } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formals.testformals1# #argv <- list(.Primitive('length<-')); .Internal(formals(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_formals.testformals2#Output.IgnoreWarningContext# #argv <- list(logical(0)); .Internal(formals(argv[[1]])) NULL Warning message: In formals(argv[[1]]) : argument is not a function ##com.oracle.truffle.r.test.builtins.TestBuiltin_formals.testformals3#Output.IgnoreWarningContext# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L))); .Internal(formals(argv[[1]])) NULL Warning message: In formals(argv[[1]]) : argument is not a function ##com.oracle.truffle.r.test.builtins.TestBuiltin_formals.testformals4#Output.IgnoreWarningContext# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame')); .Internal(formals(argv[[1]])) NULL Warning message: In formals(argv[[1]]) : argument is not a function ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #.Internal(format(.GlobalEnv,FALSE,NA,0,0,3,TRUE,NA,'.')) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(1.1, scientific=-10) [1] "1.1e+00" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(1.1, scientific=FALSE) [1] "1.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(1.1, scientific=TRUE) [1] "1.1e+00" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(1.1, scientific=c(-10, 1)) Error in prettyNum(.Internal(format(x, trim, digits, nsmall, width, 3L, : invalid 'scientific' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(1.1, scientific=c(TRUE, FALSE)) Error in prettyNum(.Internal(format(x, trim, digits, nsmall, width, 3L, : invalid 'scientific' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(1.6000085, digits=7) [1] "1.600008" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(1.6001095, digits=7) [1] "1.60011" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(1.60085, digits=5) [1] "1.6009" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat#Ignored.OutputFormatting# #format(1.6011095, digits=7) [1] "1.601109" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(2147483647 / 1.7976931348623157E308, digits =15) [1] "1.19457743112785e-299" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(4.125e-04, digits=3) [1] "0.000412" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(4.135e-04, digits=3) [1] "0.000414" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(7) [1] "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(7.42) [1] "7.42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(9.999999995, digits=10) [1] "9.999999995" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(9.999999999995, digits=13); format(9.999999999995, digits=11) [1] "9.999999999995" [1] "10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(c(7,42)) [1] " 7" "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(c(7.42,42.7)) [1] " 7.42" "42.70" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(c(7.42,42.7,NA)) [1] " 7.42" "42.70" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #format(c(9.99951, 13.1), digits=4) [1] "10.0" "13.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testFormat# #substr(format(2147483647 / 1.7976931348623157E308, digits =22), 1,16+1) [1] "1.194577431127851" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat1#Output.IgnoreErrorMessage# #argv <- list(structure(c(0, 72.7, 56.4, 72.7, 0, 63.3, 56.4, 63.3, 0), .Dim = c(3L, 3L), .Dimnames = list(c('Girth', 'Height', 'Volume'), c('Girth', 'Height', 'Volume'))), FALSE, 7L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]], , argv[[9]])) Error in .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], : argument 10 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat10# #argv <- list(c(FALSE, NA, TRUE), FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "FALSE" " NA" " TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat11# #argv <- list(structure(c(1L, 2L, 1L), .Dim = 3L, .Dimnames = structure(list(c('1', '2', NA)), .Names = '')), FALSE, 7L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) 1 2 "1" "2" "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat12# #argv <- list(c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.'), FALSE, NULL, 0L, NULL, 0L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "Min. " "1st Qu." "Median " "Mean " "3rd Qu." "Max. " ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat13# #argv <- list(c(1L, 2L, 3L, 4L, 5L, -1L, -2L), FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] " 1" " 2" " 3" " 4" " 5" "-1" "-2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat14# #argv <- list(structure(c(NA, 1, 1, 1), .Names = c('', '- x4', '- x2', '- x1')), FALSE, 5L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) - x4 - x2 - x1 "NA" " 1" " 1" " 1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat15# #argv <- list(2.22044604925031e-16, FALSE, 1, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "2e-16" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat16# #argv <- list(structure(c(1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1961, 1961, 1961, 1961, 1961, 1961, 1961, 1961, 1961), .Tsp = c(1960.08333333333, 1961.66666666667, 12), class = 'ts'), FALSE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "1960" "1960" "1960" "1960" "1960" "1960" "1960" "1960" "1960" "1960" [11] "1960" "1961" "1961" "1961" "1961" "1961" "1961" "1961" "1961" "1961" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat17# #argv <- list(c(2.3e-05, 4.5e-06), FALSE, 5L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "2.3e-05" "4.5e-06" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat18# #argv <- list(c(2L, 4L), FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "2" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat19# #argv <- list(c(1L, NA, 1L), FALSE, NULL, 0L, NULL, 3L, FALSE, NA); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) Error in argv[[9]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat2# #argv <- list('\\ab\\c', FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "\\ab\\c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat20# #argv <- list(c('abc', NA, 'def'), FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "abc" NA "def" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat23# #argv <- list(c(NA, 2L, 4L, 7L), FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "NA" " 2" " 4" " 7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat24# #argv <- list(c(1.1+0i, NA, 3+0i), FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "1.1+0i" " NA" "3.0+0i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat25# #argv <- list(c(' 9 ', ' 13 ', ' 13+', ' 18 ', ' 23 ', ' 28+', ' 31 ', ' 34 ', ' 45+', ' 48 '), TRUE, NULL, 0L, NULL, 0L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] " 9 " " 13 " " 13+" " 18 " " 23 " " 28+" " 31 " " 34 " " 45+" " 48 " ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat26# #argv <- list(c(172, 88, 88, 55, 92, 92, 72, 72, 63, 63), TRUE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "172" "88" "88" "55" "92" "92" "72" "72" "63" "63" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat27# #argv <- list(structure(c(142L, 104L, 71L, 250L), .Dim = 4L, .Dimnames = structure(list(c('(1) Approve STRONGLY', '(2) Approve SOMEWHAT', '(3) Disapprove SOMEWHAT', '(4) Disapprove STRONGLY')), .Names = '')), FALSE, 7L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) (1) Approve STRONGLY (2) Approve SOMEWHAT (3) Disapprove SOMEWHAT "142" "104" " 71" (4) Disapprove STRONGLY "250" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat28# #argv <- list(structure(c('***', '*', ' ', ' ', ' '), legend = '0 ‘***’ 0.001 ‘**’ 0.01 ‘*’ 0.05 ‘.’ 0.1 ‘ ’ 1', class = 'noquote'), FALSE, NULL, 0L, NULL, 0L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "***" "* " " " " " " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat29# #argv <- list(structure(c(0, 5, 118, 57, 0, 1, 4, 140, 0, 11, 154, 14, 0, 13, 13, 80, 35, 13, 387, 75, 17, 14, 89, 76, 0, 0, 670, 192, 0, 0, 3, 20), .Dim = c(1L, 32L), row.vars = structure(list(), .Names = character(0)), col.vars = structure(list(Class = c('1st', '2nd', '3rd', 'Crew'), Sex = c('Male', 'Female'), Age = c('Child', 'Adult'), Survived = c('No', 'Yes')), .Names = c('Class', 'Sex', 'Age', 'Survived'))), FALSE, 7L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [1,] " 0" " 5" "118" " 57" " 0" " 1" " 4" "140" " 0" " 11" "154" " 14" [,13] [,14] [,15] [,16] [,17] [,18] [,19] [,20] [,21] [,22] [,23] [,24] [1,] " 0" " 13" " 13" " 80" " 35" " 13" "387" " 75" " 17" " 14" " 89" " 76" [,25] [,26] [,27] [,28] [,29] [,30] [,31] [,32] [1,] " 0" " 0" "670" "192" " 0" " 0" " 3" " 20" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat3# #argv <- list(c('Inf', '-Inf', 'NaN', 'NA'), FALSE, NULL, 0L, 4, 1L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] " Inf" "-Inf" " NaN" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat30# #argv <- list(c('', '', '\'Adult\'', '\'No\'', '', '387'), FALSE, NULL, 0L, NULL, 1L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] " " " " "'Adult'" " 'No'" " " " 387" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat31# #argv <- list(2.2250738585072e-308, TRUE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "2.225074e-308" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat32# #argv <- list(c(-0.318309886183791+0i, 0-0.564189583547756i, 1+0i, 0+1.77245385090552i, -3.14159265358979+0i), TRUE, 2, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "-0.32+0.00i" "0.00-0.56i" "1.00+0.00i" "0.00+1.77i" "-3.14+0.00i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat33# #argv <- list(0+1i, TRUE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "0+1i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat34# #argv <- list(structure(c(-Inf, -Inf, -2.248e+263, -Inf, -3.777e+116, -1), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.')), FALSE, 7L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) Min. 1st Qu. Median Mean 3rd Qu. " -Inf" " -Inf" "-2.248e+263" " -Inf" "-3.777e+116" Max. " -1.000e+00" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat35# #argv <- list(c(-41L, -36L, -12L, -18L, NA, -28L, -23L, -19L, -8L, NA, -7L, -16L, -11L, -14L, -18L, -14L, -34L, -6L, -30L, -11L, -1L, -11L, -4L, -32L, NA, NA, NA, -23L, -45L, -115L, -37L, NA, NA, NA, NA, NA, NA, -29L, NA, -71L, -39L, NA, NA, -23L, NA, NA, -21L, -37L, -20L, -12L, -13L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, -135L, -49L, -32L, NA, -64L, -40L, -77L, -97L, -97L, -85L, NA, -10L, -27L, NA, -7L, -48L, -35L, -61L, -79L, -63L, -16L, NA, NA, -80L, -108L, -20L, -52L, -82L, -50L, -64L, -59L, -39L, -9L, -16L, -78L, -35L, -66L, -122L, -89L, -110L, NA, NA, -44L, -28L, -65L, NA, -22L, -59L, -23L, -31L, -44L, -21L, -9L, NA, -45L, -168L, -73L, NA, -76L, -118L, -84L, -85L, -96L, -78L, -73L, -91L, -47L, -32L, -20L, -23L, -21L, -24L, -44L, -21L, -28L, -9L, -13L, -46L, -18L, -13L, -24L, -16L, -13L, -23L, -36L, -7L, -14L, -30L, NA, -14L, -18L, -20L), FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] " -41" " -36" " -12" " -18" " NA" " -28" " -23" " -19" " -8" " NA" [11] " -7" " -16" " -11" " -14" " -18" " -14" " -34" " -6" " -30" " -11" [21] " -1" " -11" " -4" " -32" " NA" " NA" " NA" " -23" " -45" "-115" [31] " -37" " NA" " NA" " NA" " NA" " NA" " NA" " -29" " NA" " -71" [41] " -39" " NA" " NA" " -23" " NA" " NA" " -21" " -37" " -20" " -12" [51] " -13" " NA" " NA" " NA" " NA" " NA" " NA" " NA" " NA" " NA" [61] " NA" "-135" " -49" " -32" " NA" " -64" " -40" " -77" " -97" " -97" [71] " -85" " NA" " -10" " -27" " NA" " -7" " -48" " -35" " -61" " -79" [81] " -63" " -16" " NA" " NA" " -80" "-108" " -20" " -52" " -82" " -50" [91] " -64" " -59" " -39" " -9" " -16" " -78" " -35" " -66" "-122" " -89" [101] "-110" " NA" " NA" " -44" " -28" " -65" " NA" " -22" " -59" " -23" [111] " -31" " -44" " -21" " -9" " NA" " -45" "-168" " -73" " NA" " -76" [121] "-118" " -84" " -85" " -96" " -78" " -73" " -91" " -47" " -32" " -20" [131] " -23" " -21" " -24" " -44" " -21" " -28" " -9" " -13" " -46" " -18" [141] " -13" " -24" " -16" " -13" " -23" " -36" " -7" " -14" " -30" " NA" [151] " -14" " -18" " -20" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat36# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'), TRUE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat37# #argv <- list(structure(c(213198964, 652424.52183908), .Names = c('null.deviance', 'deviance')), FALSE, 5L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) null.deviance deviance "213198964" " 652425" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat38# #argv <- list(structure(integer(0), .Dim = c(1L, 0L), row.vars = structure(list(), .Names = character(0)), col.vars = structure(list(df0 = NULL), .Names = 'df0')), FALSE, 7L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat39# #argv <- list(FALSE, FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat4# #argv <- list(structure(c('axx', 'b', 'c', 'd', 'e', 'f', 'g', 'h'), .Dim = c(2L, 4L)), FALSE, NULL, 0L, NULL, 1L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [,1] [,2] [,3] [,4] [1,] "axx" " c" " e" " g" [2,] " b" " d" " f" " h" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat40# #argv <- list(1e-07, TRUE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "1e-07" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat41# #argv <- list(structure(c(3035, 2552, 2704, 2554, 2014, 1655, 1721, 1524, 1596, 2074, 2199, 2512, 2933, 2889, 2938, 2497, 1870, 1726, 1607, 1545, 1396, 1787, 2076, 2837, 2787, 3891, 3179, 2011, 1636, 1580, 1489, 1300, 1356, 1653, 2013, 2823, 3102, 2294, 2385, 2444, 1748, 1554, 1498, 1361, 1346, 1564, 1640, 2293, 2815, 3137, 2679, 1969, 1870, 1633, 1529, 1366, 1357, 1570, 1535, 2491, 3084, 2605, 2573, 2143, 1693, 1504, 1461, 1354, 1333, 1492, 1781, 1915), .Tsp = c(1973, 1978.91666666667, 12), class = 'ts'), FALSE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "3035" "2552" "2704" "2554" "2014" "1655" "1721" "1524" "1596" "2074" [11] "2199" "2512" "2933" "2889" "2938" "2497" "1870" "1726" "1607" "1545" [21] "1396" "1787" "2076" "2837" "2787" "3891" "3179" "2011" "1636" "1580" [31] "1489" "1300" "1356" "1653" "2013" "2823" "3102" "2294" "2385" "2444" [41] "1748" "1554" "1498" "1361" "1346" "1564" "1640" "2293" "2815" "3137" [51] "2679" "1969" "1870" "1633" "1529" "1366" "1357" "1570" "1535" "2491" [61] "3084" "2605" "2573" "2143" "1693" "1504" "1461" "1354" "1333" "1492" [71] "1781" "1915" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat42# #argv <- list(c(2.5, 97.5), TRUE, 3, 0L, NULL, 3L, TRUE, FALSE, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "2.5" "97.5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat43# #argv <- list(structure(c(9.4, 10.2, 9.2, 4.4, 3.5, 2.7), .Dim = c(3L, 2L), .Dimnames = list(NULL, c('Estimate', 'Std.Err'))), FALSE, 2, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) Estimate Std.Err [1,] " 9.4" " 4.4" [2,] "10.2" " 3.5" [3,] " 9.2" " 2.7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat44# #argv <- list(95, 2, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "95" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat46# #argv <- list(1.2e+07, FALSE, NULL, 9L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "1.2e+07" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat47# #argv <- list(-0.01234+3.14159265358979i, FALSE, NULL, 14L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "-0.01234000000000+3.14159265358979i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat48# #argv <- list(c(TRUE, FALSE, TRUE, FALSE, FALSE, FALSE), FALSE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] " TRUE" "FALSE" " TRUE" "FALSE" "FALSE" "FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat49# #argv <- list(3.141, FALSE, NULL, 13L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "3.1410000000000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat50# #argv <- list(c(Inf, -Inf), FALSE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] " Inf" "-Inf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat51# #argv <- list(structure(c(2, NA), .Names = c('N:P:K', 'Residuals')), FALSE, 5L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) N:P:K Residuals " 2" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat52# #argv <- list(structure('def\'gh', class = 'AsIs'), FALSE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "def'gh" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat53# #argv <- list(structure(4:9, .Dim = c(3L, 2L), .Dimnames = list(NULL, c('a', 'b'))), FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) a b [1,] "4" "7" [2,] "5" "8" [3,] "6" "9" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat54# #argv <- list(c(NA, NA, NA, NA, NA, 'Ripley', 'Venables & Smith'), FALSE, NULL, 0L, NULL, 3L, FALSE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] NA NA NA NA [5] NA "Ripley" "Venables & Smith" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat55# #argv <- list(1e-11, FALSE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "1e-11" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat56# #argv <- structure(list(x = 0.04, digits = 3, nsmall = 3), .Names = c('x', 'digits', 'nsmall'));do.call('format', argv) [1] "0.040" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat57# #x <- c(1.0,2.0);names(x) <- c("x","y");argv <- list(x, FALSE, NULL, 0L, NULL, 0L, FALSE, FALSE, ".");names(.Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]]))) [1] "x" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat6# #argv <- list(structure(c(47.97, 57.9, 74.76, 868.88), .Names = c('', '- x4', '- x2', '- x1')), FALSE, 5L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) - x4 - x2 - x1 " 47.97" " 57.90" " 74.76" "868.88" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat7# #argv <- list(c('a', 'NA', NA, 'b'), FALSE, NULL, 0L, NULL, 0L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "a " "NA" "NA" "b " ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat8# #argv <- list(NA_real_, FALSE, 4L, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) [1] "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_format.testformat9# #argv <- list(integer(0), TRUE, NULL, 0L, NULL, 3L, TRUE, NA, "."); .Internal(format(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]], argv[[9]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatAsIs.testformatAsIs1# #argv <- structure(list(x = structure(integer(0), class = 'AsIs')), .Names = 'x');do.call('format.AsIs', argv) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC1# #argv <- list(c(3.14159265358979, 3.1415926535898, 1), 'double', 10, 4L, 'g', '', c(12L, 12L, 12L)); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] " 3.142" " 3.142" " 1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC10# #argv <- list(c(20, 30, 40, 50, 60, 70, 80, 90, 100), 'double', 1, 7L, 'fg', '', c(15L, 15L, 15L, 15L, 15L, 15L, 15L, 15L, 15L)); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "20" "30" "40" "50" "60" "70" "80" "90" "100" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC11# #argv <- list(c(0, 25, 50, 75, 100), 'double', 1, 6L, 'fg', '', c(14L, 13L, 13L, 13L, 13L)); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "0" "25" "50" "75" "100" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC12# #argv <- list(5L, 'integer', 2, 2L, 'd', '', 10L); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] " 5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC13# #argv <- list(c(3.14159265358979e-05, 0.000314159265358979, 0.00314159265358979, 0.0314159265358979, 0.314159265358979, 3.14159265358979, 31.4159265358979, 314.159265358979, 3141.59265358979, 31415.9265358979), 'double', 5, 4, 'fg', '', c(15, 14, 13, 12, 11, 10, 9, 9, 9, 9)); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "0.00003142" "0.0003142" "0.003142" "0.03142" "0.3142" [6] "3.142" "31.42" "314.2" " 3142" "31416" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC14#Ignored.ReferenceError# #argv <- list(structure(c(1962.25, 1962.5, 1962.75, 1963, 1963.25, 1963.5, 1963.75, 1964, 1964.25, 1964.5, 1964.75, 1965, 1965.25, 1965.5, 1965.75, 1966, 1966.25, 1966.5, 1966.75, 1967, 1967.25, 1967.5, 1967.75, 1968, 1968.25, 1968.5, 1968.75, 1969, 1969.25, 1969.5, 1969.75, 1970, 1970.25, 1970.5, 1970.75, 1971, 1971.25, 1971.5, 1971.75), .Tsp = c(1962.25, 1971.75, 4), class = 'ts'), 'double', 1, 4L, 'g', '', c(12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L)); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "1962" "1962" "1963" "1963" "1963" "1964" "1964" "1964" "1964" "1964" [11] "1965" "1965" "1965" "1966" "1966" "1966" "1966" "1966" "1967" "1967" [21] "1967" "1968" "1968" "1968" "1968" "1968" "1969" "1969" "1969" "1970" [31] "1970" "1970" "1970" "1970" "1971" "1971" "1971" "1972" "1972" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC15# #.Internal(formatC(1e-15, "double", 1L, 6L, "g", "", 12)) [1] "1e-15" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC15# #y <- structure(c(2, 14.1776856316985), .Dim = c(2L, 1L), .Dimnames = list(c("m.ship.expon.", "objective"), " ")); formatC(y, digits = 6) m.ship.expon. " 2" objective "14.1777" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC2#Ignored.ImplementationError# #argv <- list(1, 'double', 8, 5, 'g', '-', 13); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "1 " ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC3# #argv <- list(structure(c(1.5, 13.3414265412268, 1e-15, 8, 1, 500, 28), .Dim = c(7L, 1L), .Dimnames = list(c('m.ship.expon.', 'objective', 'tolerance', 'iterations', 'converged', 'maxit', 'n'), ' ')), 'double', 8L, 7L, 'g', '', c(15L, 15L, 15L, 15L, 15L, 15L, 15L)); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] " 1.5" "13.34143" " 1e-15" " 8" " 1" " 500" " 28" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC4# #argv <- list(c(1000, 1e+07, 1), 'double', 5, 4L, 'g', '', c(12L, 12L, 12L)); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] " 1000" "1e+07" " 1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC5# #argv <- list(c(-3, -2, -1, 0, 1, 2, 3), 'double', 1L, 4L, 'g', '', c(12L, 12L, 12L, 12L, 12L, 12L, 12L)); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "-3" "-2" "-1" "0" "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC6# #argv <- list(3L, 'integer', 3, 2L, 'd', '0', 10L); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "003" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC7# #argv <- list(c(0, 25, 50, 75, 100), 'double', 1, 7L, 'fg', '', c(16L, 15L, 15L, 15L, 15L)); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "0" "25" "50" "75" "100" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC8# #argv <- list(structure(48.4333681840033, .Names = 'value'), 'double', 5L, 4L, 'g', '', 12L); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "48.43" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatC.testformatC9#Ignored.ImplementationError# #argv <- list(c(0.0599, 0.00599, 0.000599, 5.99e-05, 5.99e-06, 5.99e-07), 'double', 3, -2, 'fg', '#', c(10, 11, 12, 13, 14, 15)); .Internal(formatC(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "0.060" "0.0060" "0.00060" "0.000060" "0.0000060" [6] "0.00000060" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testFormatPOSIXlt# #nchar(strftime(as.POSIXct(1547211595, origin='1970-01-01', tz='GMT'), '%X')) > 2 [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testFormatPOSIXlt# #nchar(strftime(as.POSIXct(1547211595, origin='1970-01-01', tz='GMT'), '%x')) > 2 [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testFormatPOSIXlt# #strftime(as.POSIXct(1547211595, origin='1970-01-01', tz='GMT'), '%Y-%m-%d %H:%M:%S %Z') [1] "2019-01-11 12:59:55 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testFormatPOSIXlt# #strftime(as.POSIXct(1547211595, origin='1970-01-01', tz='GMT'), '%Y-%m-%d %H:%M:%S %z') [1] "2019-01-11 12:59:55 +0000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testformatPOSIXlt1# #argv <- list(structure(list(sec = c(0, 0, 0, 0, 0), min = c(0L, 0L, 0L, 0L, 0L), hour = c(0L, 0L, 0L, 0L, 0L), mday = c(1L, 1L, 1L, 1L, 1L), mon = c(0L, 0L, 0L, 0L, 0L), year = 105:109, wday = c(6L, 0L, 1L, 2L, 4L), yday = c(0L, 0L, 0L, 0L, 0L), isdst = c(0L, 0L, 0L, 0L, 0L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'UTC'), '%Y-%m-%d', FALSE); .Internal(format.POSIXlt(argv[[1]], argv[[2]], argv[[3]])) [1] "2005-01-01" "2006-01-01" "2007-01-01" "2008-01-01" "2009-01-01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testformatPOSIXlt2# #argv <- list(structure(list(sec = 10.7712235450745, min = 48L, hour = 14L, mday = 17L, mon = 2L, year = 114L, wday = 1L, yday = 75L, isdst = 1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')), '%Y-%m-%d', FALSE); .Internal(format.POSIXlt(argv[[1]], argv[[2]], argv[[3]])) [1] "2014-03-17" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testformatPOSIXlt3# #argv <- list(structure(list(sec = 59.7693939208984, min = 47L, hour = 18L, mday = 17L, mon = 2L, year = 114L, wday = 1L, yday = 75L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'), '%Y-%m-%d %H:%M:%S', TRUE); .Internal(format.POSIXlt(argv[[1]], argv[[2]], argv[[3]])) [1] "2014-03-17 18:47:59 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testformatPOSIXlt4#IgnoredJdk.LaterThanJdk8# #argv <- list(structure(list(sec = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), min = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), hour = c(20L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 20L, 20L, 20L, 20L, 19L, 19L, 19L, 20L, 20L, 20L, 19L, 20L, 19L, 19L, 19L, 20L), mday = c(30L, 31L, 31L, 31L, 31L, 31L, 31L, 31L, 31L, 30L, 30L, 30L, 30L, 31L, 31L, 31L, 30L, 30L, 30L, 31L, 30L, 31L, 31L, 31L, 30L), mon = c(5L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 5L, 5L, 5L, 5L, 11L, 11L, 11L, 5L, 5L, 5L, 11L, 5L, 11L, 11L, 11L, 5L), year = c(72L, 72L, 73L, 74L, 75L, 76L, 77L, 78L, 79L, 81L, 82L, 83L, 85L, 87L, 89L, 90L, 92L, 93L, 94L, 95L, 97L, 98L, 105L, 108L, 112L), wday = c(5L, 0L, 1L, 2L, 3L, 5L, 6L, 0L, 1L, 2L, 3L, 4L, 0L, 4L, 0L, 1L, 2L, 3L, 4L, 0L, 1L, 4L, 6L, 3L, 6L), yday = c(181L, 365L, 364L, 364L, 364L, 365L, 364L, 364L, 364L, 180L, 180L, 180L, 180L, 364L, 364L, 364L, 181L, 180L, 180L, 364L, 180L, 364L, 364L, 365L, 181L), isdst = c(1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 1L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')), '%Y-%m-%d %H:%M:%S', TRUE); .Internal(format.POSIXlt(argv[[1]], argv[[2]], argv[[3]])) [1] "1972-06-30 20:00:00 EDT" "1972-12-31 19:00:00 EST" [3] "1973-12-31 19:00:00 EST" "1974-12-31 19:00:00 EST" [5] "1975-12-31 19:00:00 EST" "1976-12-31 19:00:00 EST" [7] "1977-12-31 19:00:00 EST" "1978-12-31 19:00:00 EST" [9] "1979-12-31 19:00:00 EST" "1981-06-30 20:00:00 EDT" [11] "1982-06-30 20:00:00 EDT" "1983-06-30 20:00:00 EDT" [13] "1985-06-30 20:00:00 EDT" "1987-12-31 19:00:00 EST" [15] "1989-12-31 19:00:00 EST" "1990-12-31 19:00:00 EST" [17] "1992-06-30 20:00:00 EDT" "1993-06-30 20:00:00 EDT" [19] "1994-06-30 20:00:00 EDT" "1995-12-31 19:00:00 EST" [21] "1997-06-30 20:00:00 EDT" "1998-12-31 19:00:00 EST" [23] "2005-12-31 19:00:00 EST" "2008-12-31 19:00:00 EST" [25] "2012-06-30 20:00:00 EDT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testformatPOSIXlt5#IgnoredJdk.LaterThanJdk8# #argv <- list(structure(list(sec = 0, min = 0L, hour = 19L, mday = 31L, mon = 11L, year = 69L, wday = 3L, yday = 364L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')), '%Y-%m-%d %H:%M:%S', TRUE); .Internal(format.POSIXlt(argv[[1]], argv[[2]], argv[[3]])) [1] "1969-12-31 19:00:00 EST" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testformatPOSIXlt6# #argv <- list(structure(list(sec = c(0, 0, 0, 0, 0, 0), min = c(0L, 0L, 0L, 0L, 0L, 0L), hour = c(0L, 0L, 0L, 0L, 0L, 0L), mday = 6:11, mon = 0:5, year = -10:-5, wday = c(1L, 6L, 2L, 0L, 4L, 2L), yday = c(5L, 37L, 67L, 98L, 129L, 161L), isdst = c(0L, 0L, 0L, 0L, 0L, 0L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'UTC'), '%Y', FALSE); .Internal(format.POSIXlt(argv[[1]], argv[[2]], argv[[3]])) [1] "1890" "1891" "1892" "1893" "1894" "1895" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testformatPOSIXlt7# #argv <- list(structure(list(sec = c(0, NA, NA, 0), min = c(0L, NA, NA, 0L), hour = c(0L, NA, NA, 0L), mday = c(1L, NA, NA, 26L), mon = c(0L, NA, NA, 9L), year = c(101L, NA, NA, 104L), wday = c(1L, NA, NA, 2L), yday = c(0L, NA, NA, 299L), isdst = c(0L, -1L, -1L, 0L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'UTC'), '%Y-%m-%d', FALSE); .Internal(format.POSIXlt(argv[[1]], argv[[2]], argv[[3]])) [1] "2001-01-01" NA NA "2004-10-26" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testformatPOSIXlt8# #argv <- list(structure(list(sec = 11.3034093379974, min = 37L, hour = 7L, mday = 7L, mon = 11L, year = 113L, wday = 6L, yday = 340L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')), '%H:%M:%OS3', FALSE); .Internal(format.POSIXlt(argv[[1]], argv[[2]], argv[[3]])) [1] "07:37:11.303" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatPOSIXlt.testformatPOSIXlt9# #argv <- list(structure(list(sec = numeric(0), min = integer(0), hour = integer(0), mday = integer(0), mon = integer(0), year = integer(0), wday = integer(0), yday = integer(0), isdst = integer(0)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'UTC'), '%Y-%m-%d', TRUE); .Internal(format.POSIXlt(argv[[1]], argv[[2]], argv[[3]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatdifftime.testformatdifftime1# #argv <- structure(list(x = structure(c(0, 30, 60), units = 'mins', class = 'difftime')), .Names = 'x');do.call('format.difftime', argv) [1] " 0 mins" "30 mins" "60 mins" ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo1# #argv <- list(c(0.099999994, 0.2), 7L, 0L); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 10 8 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo10# #argv <- list(structure(c(2, 0, 0, 0, 0, 1, 0, 0, 0, 0, 3, 0, 6, 0, 2, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Names = c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm', 'n', 'o', 'p', 'q', 'r', 's', 't', 'u', 'v', 'w', 'x', 'y')), NULL, 0L); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 1 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo11# #argv <- list(structure(c(-3.14159265358979e-05, 3.14159265358979e-05, -0.000314159265358979, 0.000314159265358979, -0.00314159265358979, 0.00314159265358979, -0.0314159265358979, 0.0314159265358979, -0.314159265358979, 0.314159265358979, -3.14159265358979, 3.14159265358979, -31.4159265358979, 31.4159265358979, -314.159265358979, 314.159265358979, -3141.59265358979, 3141.59265358979, -31415.9265358979, 31415.9265358979, -314159.265358979, 314159.265358979, -1e-05, 1e-05, -1e-04, 1e-04, -0.001, 0.001, -0.01, 0.01, -0.1, 0.1), .Dim = c(2L, 16L)), NULL, 0L); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 13 6 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo12# #argv <- list(c(NaN, NA), NULL, 0L); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 3 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo14# #argv <- structure(list(x = complex(real = Inf, imaginary = Inf)), .Names = 'x');do.call('format.info', argv) [1] 3 0 0 3 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo15# #argv <- structure(list(x = c(complex(real = NaN, imaginary = NaN), NA)), .Names = 'x');do.call('format.info', argv) [1] 3 0 0 3 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(1+2i, NULL, 1)) [1] 3 1 0 3 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(1, 2, NA)) Error: invalid 'nsmall' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(1, 2, NULL)) Error: invalid 'nsmall' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(1, NA, 1)) Error: invalid 'digits' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(1, NULL, 1)) [1] 3 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(NA, 1, 1)) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(NULL, 1, 1)) Error: atomic vector arguments only ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(c('a',NA) , NULL, 1)) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(c(1,NA,3) , NULL, NULL)) Error: invalid 'nsmall' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(c(1L,NA,3L) , NULL, 1)); .Internal(format.info(c(1L, 3L) , NULL, 1)) [1] 2 [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(environment(), NULL, 1)) Error: atomic vector arguments only ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo16# #.Internal(format.info(paste, NULL, 1)) Error: atomic vector arguments only ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo2# #argv <- list(c(0.099999994, 0.2), 6L, 0L); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 3 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo3# #argv <- list(c(Inf, -Inf), NULL, 0L); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 4 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo4# #argv <- list(FALSE, NULL, 0L); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo5# #argv <- list(3.14159265358979e-10, NULL, 8); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 12 6 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo6# #argv <- list(1e+08, NULL, 0L); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 5 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo7# #argv <- list(1e+222, NULL, 0L); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 6 0 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo8# #argv <- list(31.4159265358979, NULL, 8); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 11 8 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatinfo.testformatinfo9# #argv <- list(712L, NULL, 0L); .Internal(format.info(argv[[1]], argv[[2]], argv[[3]])) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_formatpval.testformatpval1# #argv <- structure(list(pv = 0.200965994008331, digits = 3), .Names = c('pv', 'digits'));do.call('format.pval', argv) [1] "0.201" ##com.oracle.truffle.r.test.builtins.TestBuiltin_function.testFunctionFunction# #do.call('function', list(as.pairlist(list(x=4)), expression(x + 1)[[1]])) function (x = 4) x + 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_function.testFunctionFunction#Output.MayIgnoreErrorContext# #eval(call('function', 1, expression(x + 1)[[1]])) Error in eval(call("function", 1, expression(x + 1)[[1]])) : invalid formal argument list for "function" ##com.oracle.truffle.r.test.builtins.TestBuiltin_function.testFunctionFunction# #eval(call('function', as.pairlist(list(x=4)), expression(x + 1)[[1]])) function (x = 4) x + 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_g.testg1#Output.IgnoreErrorContext# #argv <- list(1);g(argv[[1]]); Error in g(argv[[1]]) : could not find function "g" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gamma.testgamma1# #argv <- list(c(0, 0.1, 0.2, 0.3, 0.4, 0.5, 0.6, 0.7, 0.8, 0.9, 1));gamma(argv[[1]]); [1] NaN 9.513508 4.590844 2.991569 2.218160 1.772454 1.489192 1.298055 [9] 1.164230 1.068629 1.000000 Warning message: In gamma(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_gamma.testgamma2# #argv <- list(FALSE);gamma(argv[[1]]); [1] NaN Warning message: In gamma(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_gamma.testgamma3# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));gamma(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_gamma.testgamma5# #argv <- list(101);gamma(argv[[1]]); [1] 9.332622e+157 ##com.oracle.truffle.r.test.builtins.TestBuiltin_gamma.testgamma6# #argv <- list(c(-3.000001, -3, -3, -2.999999, -2.965, -2.93, -2.895, -2.86, -2.825, -2.79, -2.755, -2.72, -2.685, -2.65, -2.615, -2.58, -2.545, -2.51, -2.475, -2.44, -2.405, -2.37, -2.335, -2.3, -2.265, -2.23, -2.195, -2.16, -2.125, -2.09, -2.055, -2.02, -2.000001, -2, -1.999999, -1.985, -1.95, -1.915, -1.88, -1.845, -1.81, -1.775, -1.74, -1.705, -1.67, -1.635, -1.6, -1.565, -1.53, -1.495, -1.46, -1.425, -1.39, -1.355, -1.32, -1.285, -1.25, -1.215, -1.18, -1.145, -1.11, -1.075, -1.04, -1.005, -1.000001, -1, -0.999999, -0.97, -0.935, -0.9, -0.865, -0.83, -0.795, -0.76, -0.725, -0.69, -0.655, -0.62, -0.585, -0.55, -0.515, -0.48, -0.445, -0.41, -0.375, -0.34, -0.305, -0.27, -0.235, -0.2, -0.165, -0.13, -0.0949999999999998, -0.0599999999999996, -0.0249999999999999, -1e-06, 0, 1e-06, 0.0100000000000002, 0.0450000000000004, 0.0800000000000001, 0.115, 0.15, 0.185, 0.22, 0.255, 0.29, 0.325, 0.36, 0.395, 0.43, 0.465, 0.5, 0.535, 0.57, 0.605, 0.640000000000001, 0.675, 0.71, 0.745000000000001, 0.78, 0.815, 0.850000000000001, 0.885, 0.92, 0.955000000000001, 0.99, 1.025, 1.06, 1.095, 1.13, 1.165, 1.2, 1.235, 1.27, 1.305, 1.34, 1.375, 1.41, 1.445, 1.48, 1.515, 1.55, 1.585, 1.62, 1.655, 1.69, 1.725, 1.76, 1.795, 1.83, 1.865, 1.9, 1.935, 1.97, 2.005, 2.04, 2.075, 2.11, 2.145, 2.18, 2.215, 2.25, 2.285, 2.32, 2.355, 2.39, 2.425, 2.46, 2.495, 2.53, 2.565, 2.6, 2.635, 2.67, 2.705, 2.74, 2.775, 2.81, 2.845, 2.88, 2.915, 2.95, 2.985, 3.02, 3.055, 3.09, 3.125, 3.16, 3.195, 3.23, 3.265, 3.3, 3.335, 3.37, 3.405, 3.44, 3.475, 3.51, 3.545, 3.58, 3.615, 3.65, 3.685, 3.72, 3.755, 3.79, 3.825, 3.86, 3.895, 3.93, 3.965, 4));gamma(argv[[1]]); [1] 1.666665e+05 NaN NaN -1.666669e+05 -4.985099e+00 [6] -2.619025e+00 -1.841442e+00 -1.462054e+00 -1.242971e+00 -1.105073e+00 [11] -1.014635e+00 -9.549952e-01 -9.171237e-01 -8.958603e-01 -8.882249e-01 [16] -8.925941e-01 -9.082894e-01 -9.353839e-01 -9.746461e-01 -1.027592e+00 [21] -1.096654e+00 -1.185494e+00 -1.299570e+00 -1.447107e+00 -1.640886e+00 [26] -1.901657e+00 -2.265263e+00 -2.799124e+00 -3.646418e+00 -5.173381e+00 [31] -8.679028e+00 -2.455706e+01 -4.999995e+05 NaN 5.000005e+05 [36] 3.380894e+01 1.051017e+01 6.429288e+00 4.752933e+00 3.854374e+00 [41] 3.305889e+00 2.946267e+00 2.701499e+00 2.533135e+00 2.419525e+00 [46] 2.347888e+00 2.310583e+00 2.303230e+00 2.323746e+00 2.371873e+00 [51] 2.449037e+00 2.558463e+00 2.705570e+00 2.898751e+00 3.150767e+00 [56] 3.481243e+00 3.921333e+00 4.522972e+00 5.378974e+00 6.672281e+00 [61] 8.819252e+00 1.301421e+01 2.463298e+01 1.995843e+02 9.999996e+05 [66] NaN -1.000000e+06 -3.379897e+01 -1.590172e+01 -1.057056e+01 [71] -8.033877e+00 -6.567680e+00 -5.625754e+00 -4.980927e+00 -4.522118e+00 [76] -4.188893e+00 -3.945884e+00 -3.771380e+00 -3.651731e+00 -3.578430e+00 [81] -3.546534e+00 -3.553841e+00 -3.600542e+00 -3.689244e+00 -3.825384e+00 [86] -4.018130e+00 -4.282112e+00 -4.640616e+00 -5.131745e+00 -5.821149e+00 [91] -6.831006e+00 -8.415917e+00 -1.120661e+01 -1.730672e+01 -4.060252e+01 [96] -1.000001e+06 NaN 9.999994e+05 9.943259e+01 2.168776e+01 [101] 1.199657e+01 8.221516e+00 6.220273e+00 4.985354e+00 4.150482e+00 [106] 3.550532e+00 3.100143e+00 2.750759e+00 2.472735e+00 2.246956e+00 [111] 2.060549e+00 1.904533e+00 1.772454e+00 1.659556e+00 1.562263e+00 [116] 1.477832e+00 1.404128e+00 1.339466e+00 1.282495e+00 1.232127e+00 [121] 1.187471e+00 1.147793e+00 1.112484e+00 1.081034e+00 1.053016e+00 [126] 1.028064e+00 1.005872e+00 9.861740e-01 9.687436e-01 9.533857e-01 [131] 9.399314e-01 9.282347e-01 9.181687e-01 9.096234e-01 9.025031e-01 [136] 8.967245e-01 8.922155e-01 8.889136e-01 8.867647e-01 8.857223e-01 [141] 8.857470e-01 8.868050e-01 8.888683e-01 8.919141e-01 8.959237e-01 [146] 9.008830e-01 9.067818e-01 9.136135e-01 9.213749e-01 9.300661e-01 [151] 9.396904e-01 9.502539e-01 9.617658e-01 9.742380e-01 9.876850e-01 [156] 1.002124e+00 1.017576e+00 1.034062e+00 1.051609e+00 1.070244e+00 [161] 1.089999e+00 1.110906e+00 1.133003e+00 1.156329e+00 1.180925e+00 [166] 1.206839e+00 1.234117e+00 1.262813e+00 1.292982e+00 1.324683e+00 [171] 1.357978e+00 1.392935e+00 1.429625e+00 1.468121e+00 1.508505e+00 [176] 1.550861e+00 1.595277e+00 1.641850e+00 1.690678e+00 1.741868e+00 [181] 1.795533e+00 1.851791e+00 1.910767e+00 1.972595e+00 2.037415e+00 [186] 2.105375e+00 2.176632e+00 2.251354e+00 2.329715e+00 2.411901e+00 [191] 2.498109e+00 2.588548e+00 2.683437e+00 2.783010e+00 2.887512e+00 [196] 2.997205e+00 3.112365e+00 3.233284e+00 3.360271e+00 3.493655e+00 [201] 3.633783e+00 3.781021e+00 3.935761e+00 4.098414e+00 4.269417e+00 [206] 4.449235e+00 4.638358e+00 4.837307e+00 5.046636e+00 5.266928e+00 [211] 5.498807e+00 5.742931e+00 6.000000e+00 Warning message: In gamma(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_gcinfo.testgcinfo1#Ignored.Unimplemented# #argv <- list(list()); .Internal(gcinfo(argv[[1]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gcinfo.testgcinfo2#Ignored.Unimplemented# #argv <- list(FALSE); .Internal(gcinfo(argv[[1]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #setClass('foo', representation(x='numeric')); f <- new('foo'); e <- new.env(); e$x <- 1; attr(f, '.Data') <- e; get('x', envir=f) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #setClass('foo', representation(x='numeric')); f <- new('foo'); e <- new.env(); e$x <- 1; attr(f, '.xData') <- e; get('x', envir=f) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = -1); f1()}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = -2); f1()}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = -3); f1()}; f() } Error in get("xx", envir = -3) : object 'xx' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 0); f1()}; f() } Error in get("xx", envir = 0) : object 'xx' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 1); f1()}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 2); f1()}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 3); f1()}; f() } Error in get("xx", envir = 3) : object 'xx' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get0('xx', envir = -1, ifnotfound = 'DNF'); f1()}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get0('xx', envir = -2, ifnotfound = 'DNF'); f1()}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get0('xx', envir = -3, ifnotfound = 'DNF'); f1()}; f() } [1] "DNF" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get0('xx', envir = 0, ifnotfound = 'DNF'); f1()}; f() } [1] "DNF" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get0('xx', envir = 1, ifnotfound = 'DNF'); f1()}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get0('xx', envir = 2, ifnotfound = 'DNF'); f1()}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ f <- function() { xx <- 'xv'; f1 <- function() get0('xx', envir = 3, ifnotfound = 'DNF'); f1()}; f() } [1] "DNF" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ get(".Platform")$endian } [1] "little" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ get(".Platform", globalenv())$endian } [1] "little" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ get("dummy") } Error in get("dummy") : object 'dummy' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ x <- 'xv'; get('x', envir = -1) } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ x <- 'xv'; get('x', envir = -2) } Error in get("x", envir = -2) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ x <- 'xv'; get('x', envir = 0) } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ x <- 'xv'; get('x', envir = 1) } [1] "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ x <- 'xv'; get('x', envir = 2) } Error in get("x", envir = 2) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ x <- 33 ; f <- function() { get("x", inherits = FALSE) } ; f() } Error in get("x", inherits = FALSE) : object 'x' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ x <- 33 ; f <- function() { if (FALSE) { x <- 22 } ; get("x", inherits = FALSE) } ; f() } Error in get("x", inherits = FALSE) : object 'x' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get('xx', envir = -1)}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get('xx', envir = -2)}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get('xx', envir = -3)}; f() } Error in get("xx", envir = -3) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get('xx', envir = 0)}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get('xx', envir = 1)}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get('xx', envir = 2)}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get('xx', envir = 3)}; f() } Error in get("xx", envir = 3) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get0('xx', envir = -1, ifnotfound = 'DNF')}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get0('xx', envir = -2, ifnotfound = 'DNF')}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get0('xx', envir = -3, ifnotfound = 'DNF')}; f() } Error in get0("xx", envir = -3, ifnotfound = "DNF") : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get0('xx', envir = 0, ifnotfound = 'DNF')}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get0('xx', envir = 1, ifnotfound = 'DNF')}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get0('xx', envir = 2, ifnotfound = 'DNF')}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; f <- function() { get0('xx', envir = 3, ifnotfound = 'DNF')}; f() } Error in get0("xx", envir = 3, ifnotfound = "DNF") : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; get('xx', envir =-1) } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; get('xx', envir =-2) } Error in get("xx", envir = -2) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; get('xx', envir =0) } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; get('xx', envir =1) } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; get('xx', envir =2) } Error in get("xx", envir = 2) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; get0('xx', envir = -1, ifnotfound = 'DNF') } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; get0('xx', envir = -2, ifnotfound = 'DNF') } Error in get0("xx", envir = -2, ifnotfound = "DNF") : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; get0('xx', envir = 0, ifnotfound = 'DNF') } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; get0('xx', envir = 1, ifnotfound = 'DNF') } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{ xx <- 'xv'; get0('xx', envir = 2, ifnotfound = 'DNF') } Error in get0("xx", envir = 2, ifnotfound = "DNF") : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{x <- 1L; get('x', mode='double'); } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{x <- 1L; get('x', mode='numeric'); } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{y<-function(){y<-2;get("y",mode="closure")};y();} function(){y<-2;get("y",mode="closure")} ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{y<-function(){y<-2;get("y",mode="closure",inherits=FALSE);};y();} Error in get("y", mode = "closure", inherits = FALSE) : object 'y' of mode 'closure' was not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{y<-function(){y<-2;get("y",mode="double")};y();} [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{y<-function(){y<-2;get("y",mode="double",inherits=FALSE)};y();} [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{y<-function(){y<-2;get("y",mode="integer")};y();} [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_get.testGet# #{y<-function(){y<-2;get("y",mode="integer",inherits=FALSE);get("y",mode="integer",inherits=FALSE)};y();} [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_getConnection.testgetConnection1# #argv <- list(FALSE); .Internal(getConnection(argv[[1]])) A connection with description "stdin" class "terminal" mode "r" text "text" opened "opened" can read "yes" can write "no" ##com.oracle.truffle.r.test.builtins.TestBuiltin_getNamespaceVersion.testgetNamespaceVersion1# #argv <- structure(list(ns = 'stats'), .Names = 'ns');do.call('getNamespaceVersion', argv) version "4.0.3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_getRestart.testgetRestart1# #argv <- list(2L); .Internal(.getRestart(argv[[1]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_getRestart.testgetRestart2# #argv <- list(1L); .Internal(.getRestart(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_getSymbolInfo.testgetSymbolInfo1# #argv <- list('FALSE', '', FALSE); .Internal(getSymbolInfo(argv[[1]], argv[[2]], argv[[3]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_getconst.testgetconst1# #argv <- list(list(list(), NULL), 1); .Internal(getconst(argv[[1]], argv[[2]])) [[1]] list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_getconst.testgetconst2# #argv <- list(list(FALSE), 1); .Internal(getconst(argv[[1]], argv[[2]])) [[1]] [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gettext.testgettext# #gettext('Loading required package: %s') [1] "Loading required package: %s" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gettext.testgettext# #gettext(domain='foo', 'bar') [1] "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gettext.testgettext1# #argv <- list(NULL, 'Loading required package: %s'); .Internal(gettext(argv[[1]], argv[[2]])) [1] "Loading required package: %s" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gettext.testgettext2# #argv <- list(NULL, ''); .Internal(gettext(argv[[1]], argv[[2]])) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gettext.testgettext3# #argv <- list(NULL, 'The following object is masked from ‘package:base’:\n\n det\n'); .Internal(gettext(argv[[1]], argv[[2]])) [1] "The following object is masked from ‘package:base’:\n\n det\n" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gettext.testgettext4# #argv <- list(NULL, c('/', ' not meaningful for factors')); .Internal(gettext(argv[[1]], argv[[2]])) [1] "/" " not meaningful for factors" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gettext.testgettext5# #argv <- list(NULL, character(0)); .Internal(gettext(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_gettext.testgettext6# #argv <- list(NULL, NULL); .Internal(gettext(argv[[1]], argv[[2]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testGregExprPCRE# #{ argv <- structure(list(pattern = '', text = c('abc', 'defg'), perl = TRUE), .Names = c('pattern', 'text', 'perl'));do.call('gregexpr', argv) } [[1]] [1] 1 2 3 attr(,"match.length") [1] 0 0 0 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE [[2]] [1] 1 2 3 4 attr(,"match.length") [1] 0 0 0 0 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testGregExprPCRE# #{ gregexpr('(a)|(b)', 'aa', perl=TRUE) } [[1]] [1] 1 2 attr(,"match.length") [1] 1 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") [1,] 1 0 [2,] 2 0 attr(,"capture.length") [1,] 1 0 [2,] 1 0 attr(,"capture.names") [1] "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testGregExprPCRE# #{ gregexpr('(a)|(b)', 'bb', perl=TRUE) } [[1]] [1] 1 2 attr(,"match.length") [1] 1 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") [1,] 0 1 [2,] 0 2 attr(,"capture.length") [1,] 0 1 [2,] 0 1 attr(,"capture.names") [1] "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testGregExprPCRE# #{ x<-c("Aaa Bbb Aaa bbb", "Aaa Bbb Aaa Bbb", "Aaa bbb Aaa bbb"); p<-"(?[[:upper:]][[:lower:]]+) (?[[:upper:]][[:lower:]]+)"; gregexpr(p, x, perl=TRUE) } [[1]] [1] 1 attr(,"match.length") [1] 7 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 1 5 attr(,"capture.length") first last [1,] 3 3 attr(,"capture.names") [1] "first" "last" [[2]] [1] 1 9 attr(,"match.length") [1] 7 7 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 1 5 [2,] 9 13 attr(,"capture.length") first last [1,] 3 3 [2,] 3 3 attr(,"capture.names") [1] "first" "last" [[3]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] -1 -1 attr(,"capture.length") first last [1,] -1 -1 attr(,"capture.names") [1] "first" "last" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testGregExprPCRE# #{ x<-c("Aaa bbb Aaa Bbb", "Aaa bbb Aaa bbb", "Aaa bbb Aaa Bbb"); p<-"(?[[:upper:]][[:lower:]]+) (?[[:upper:]][[:lower:]]+)"; gregexpr(p, x, perl=TRUE) } [[1]] [1] 9 attr(,"match.length") [1] 7 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 9 13 attr(,"capture.length") first last [1,] 3 3 attr(,"capture.names") [1] "first" "last" [[2]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] -1 -1 attr(,"capture.length") first last [1,] -1 -1 attr(,"capture.names") [1] "first" "last" [[3]] [1] 9 attr(,"match.length") [1] 7 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 9 13 attr(,"capture.length") first last [1,] 3 3 attr(,"capture.names") [1] "first" "last" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testGregExprPCRE# #{ x<-c("Aaa bbb Aaa bbb", "Aaa Bbb Aaa Bbb", "Aaa Bbb Aaa bbb"); p<-"(?[[:upper:]][[:lower:]]+) (?[[:upper:]][[:lower:]]+)"; gregexpr(p, x, perl=TRUE) } [[1]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] -1 -1 attr(,"capture.length") first last [1,] -1 -1 attr(,"capture.names") [1] "first" "last" [[2]] [1] 1 9 attr(,"match.length") [1] 7 7 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 1 5 [2,] 9 13 attr(,"capture.length") first last [1,] 3 3 [2,] 3 3 attr(,"capture.names") [1] "first" "last" [[3]] [1] 1 attr(,"match.length") [1] 7 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 1 5 attr(,"capture.length") first last [1,] 3 3 attr(,"capture.names") [1] "first" "last" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testGregExprPCRE# #{ x<-c("Aaa bbb Aaa bbb", "Aaa Bbb Aaa Bbb", "Aaa bbb Aaa bbb"); p<-"(?[[:upper:]][[:lower:]]+) (?[[:upper:]][[:lower:]]+)"; gregexpr(p, x, perl=TRUE) } [[1]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] -1 -1 attr(,"capture.length") first last [1,] -1 -1 attr(,"capture.names") [1] "first" "last" [[2]] [1] 1 9 attr(,"match.length") [1] 7 7 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 1 5 [2,] 9 13 attr(,"capture.length") first last [1,] 3 3 [2,] 3 3 attr(,"capture.names") [1] "first" "last" [[3]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] -1 -1 attr(,"capture.length") first last [1,] -1 -1 attr(,"capture.names") [1] "first" "last" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr#Ignored.ImplementationError# #gregexpr("(a)[^a]\\1", c("andrea apart", "amadeus", NA)) [[1]] [1] 6 attr(,"match.length") [1] 3 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE [[2]] [1] 1 attr(,"match.length") [1] 3 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE [[3]] [1] NA attr(,"match.length") [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #gregexpr("e",c("arm","foot","lefroo", "bafoobar")) [[1]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE [[2]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE [[3]] [1] 2 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE [[4]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr#Output.IgnoreErrorMessage# #gregexpr('(', 'abc()', fixed = FALSE) Error in gregexpr("(", "abc()", fixed = FALSE) : invalid regular expression '(', reason 'Missing ')'' ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #gregexpr('(', 'abc()', fixed = TRUE) [[1]] [1] 4 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #gregexpr(')', 'abc()', fixed = FALSE) [[1]] [1] 5 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #gregexpr(')', 'abc()', fixed = TRUE) [[1]] [1] 5 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #gregexpr('\\(', 'abc()', fixed = FALSE) [[1]] [1] 4 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #gregexpr('\\)', 'abc()', fixed = FALSE) [[1]] [1] 5 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #{ .Internal(gregexpr("7", 42, F, F, F, F)) } Error: invalid 'text' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #{ .Internal(gregexpr(7, "42", F, F, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #{ .Internal(gregexpr(character(), "42", F, F, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #{ x<-gregexpr("foo", c("bar foo foo", "foo"), fixed=F); as.integer(c(x[[1]], x[[2]])) } [1] 5 9 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #{ x<-gregexpr("foo", c("bar foo foo", "foo"), fixed=F); list(attr(x[[1]], "match.length"), attr(x[[2]], "match.length")) } [[1]] [1] 3 3 [[2]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #{ x<-gregexpr("foo", c("bar foo foo", "foo"), fixed=T); as.integer(c(x[[1]], x[[2]])) } [1] 5 9 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testRegExpr# #{ x<-gregexpr("foo", c("bar foo foo", "foo"), fixed=T); list(attr(x[[1]], "match.length"), attr(x[[2]], "match.length")) } [[1]] [1] 3 3 [[2]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr1# #argv <- list('', 'abc', FALSE, FALSE, FALSE, FALSE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] 1 2 3 attr(,"match.length") [1] 0 0 0 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr10# #argv <- list('(?[[:upper:]][[:lower:]]+) (?[[:upper:]][[:lower:]]+)', c(' Ben Franklin and Jefferson Davis', '\tMillard Fillmore'), FALSE, TRUE, FALSE, FALSE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] 3 20 attr(,"match.length") [1] 12 15 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 3 7 [2,] 20 30 attr(,"capture.length") first last [1,] 3 8 [2,] 9 5 attr(,"capture.names") [1] "first" "last" [[2]] [1] 2 attr(,"match.length") [1] 16 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 2 10 attr(,"capture.length") first last [1,] 7 8 attr(,"capture.names") [1] "first" "last" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr11# #argv <- list('?', 'utils::data', FALSE, FALSE, TRUE, FALSE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr12# #argv <- list('[[', 'utils:::.show_help_on_topic_', FALSE, FALSE, TRUE, FALSE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr14# #argv <- structure(list(pattern = '', text = 'abc', fixed = TRUE), .Names = c('pattern', 'text', 'fixed'));do.call('gregexpr', argv) [[1]] [1] 1 2 3 attr(,"match.length") [1] 0 0 0 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr15# #argv <- structure(list(pattern = '', text = 'abc'), .Names = c('pattern', 'text'));do.call('gregexpr', argv) [[1]] [1] 1 2 3 attr(,"match.length") [1] 0 0 0 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr16# #argv <- structure(list(pattern = '', text = 'abc', perl = TRUE), .Names = c('pattern', 'text', 'perl'));do.call('gregexpr', argv) [[1]] [1] 1 2 3 attr(,"match.length") [1] 0 0 0 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr2# #argv <- list('[^\\.\\w:?$@[\\]]+', 'version$m', FALSE, TRUE, FALSE, FALSE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr3# #argv <- list('$', 'version$m', FALSE, FALSE, TRUE, FALSE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] 8 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr4#Ignored.ImplementationError# #argv <- list('éè', '«Latin-1 accented chars»: éè øØ å<Å æ<Æ é éè', FALSE, FALSE, TRUE, TRUE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] 29 54 attr(,"match.length") [1] 4 4 attr(,"index.type") [1] "bytes" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr5# #argv <- list('', 'abc', FALSE, TRUE, FALSE, FALSE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] 1 2 3 attr(,"match.length") [1] 0 0 0 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr6# #argv <- list('', 'abc', FALSE, FALSE, TRUE, FALSE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] 1 2 3 attr(,"match.length") [1] 0 0 0 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr7#Ignored.ImplementationError# #argv <- list('éè', '«Latin-1 accented chars»: éè øØ å<Å æ<Æ é éè', TRUE, FALSE, FALSE, TRUE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] 29 54 attr(,"match.length") [1] 4 4 attr(,"index.type") [1] "bytes" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr8# #argv <- list('[[:space:]]?(,|,?[[:space:]]and)[[:space:]]+', character(0), FALSE, FALSE, FALSE, FALSE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_gregexpr.testgregexpr9# #argv <- list('\\[[^]]*\\]', 'FALSE', FALSE, FALSE, FALSE, FALSE); .Internal(gregexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [[1]] [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep#Output.IgnoreErrorMessage# #grep('(()', ')') Error in grep("(()", ")") : invalid regular expression '(()', reason 'Missing ')'' ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('(())', ')') [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep#Output.IgnoreErrorMessage# #grep('([(]', ')') Error in grep("([(]", ")") : invalid regular expression '([(]', reason 'Missing ')'' ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep#Output.IgnoreErrorMessage# #grep('([)]', ')') Error in grep("([)]", ")") : invalid regular expression '([)]', reason 'Missing ')'' ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('))', ')') integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('))', '))') [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('*', c('prefix.lsmc', 'arm'), value = TRUE) [1] "prefix.lsmc" "arm" ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('*.lsmc', c('prefix.lsmc', 'arm'), value = TRUE) [1] "prefix.lsmc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('[(]', ')') integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('[)]', ')') [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('[[]', '[') [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('[][]', '[]') [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('[][a]', 'a') [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('[]]', ']') [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('[^][]', 'a') [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #grep('[^][a]', 'b') [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #{ .Internal(grep("7", 7, F, F, F, F, F, F)) } Error: invalid 'text' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #{ .Internal(grep(7, "7", F, F, F, F, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #{ .Internal(grep(character(), "7", F, F, F, F, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep#Ignored.ImplementationError# #{ grep('^ *$', ' \n') } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #{ txt<-c("1+1i", "7", "42.1", "7+42i"); grep("[0-9].*[-+][0-9].*i$", txt) } [1] 1 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #{ txt<-c("arm","foot","lefroo", "bafoobar"); grep("foo", txt) } [1] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #{ txt<-c("is", "intended", "to", "guarantee", "your", "freedom"); grep("[gu]", txt) } [1] 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testGrep# #{ txt<-c("rai", "ira", "iri"); grep("i$", txt) } [1] 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testLsRegExp# #{ .abc <- 1; ls(all.names=TRUE, pattern="\\.a.*")} [1] ".abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testLsRegExp# #{ .abc <- 1; ls(pattern="\\.a.*")} character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testLsRegExp# #{ abc <- 1; ls(pattern="[[:alpha:]]*")} [1] "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testLsRegExp# #{ abc <- 1; ls(pattern="a.*")} [1] "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testLsRegExp# #{ f <- function(abc) { ls(pattern="[a-z]*") }; f(1) } [1] "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep1# #argv <- list('|', 'wool', FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep10# #argv <- list('-package$', structure(c('bkde', 'bkde2D', 'bkfe', 'dpih', 'dpik', 'dpill', 'locpoly'), .Names = c('/home/lzhao/tmp/RtmphvE7Uy/ltxf49c4960bf/bkde.tex', '/home/lzhao/tmp/RtmphvE7Uy/ltxf49c4960bf/bkde2D.tex', '/home/lzhao/tmp/RtmphvE7Uy/ltxf49c4960bf/bkfe.tex', '/home/lzhao/tmp/RtmphvE7Uy/ltxf49c4960bf/dpih.tex', '/home/lzhao/tmp/RtmphvE7Uy/ltxf49c4960bf/dpik.tex', '/home/lzhao/tmp/RtmphvE7Uy/ltxf49c4960bf/dpill.tex', '/home/lzhao/tmp/RtmphvE7Uy/ltxf49c4960bf/locpoly.tex')), FALSE, FALSE, TRUE, FALSE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep11# #argv <- list('.__T__unname:', c('.__T__!:base', '.__T__%%:base', '.__T__%*%:base', '.__T__%/%:base', '.__T__&:base', '.__T__*:base', '.__T__+:base', '.__T__-:base', '.__T__/:base', '.__T__Arith:base', '.__T__BunchKaufman:Matrix', '.__T__Cholesky:Matrix', '.__T__Compare:methods', '.__T__Logic:base', '.__T__Math2:methods', '.__T__Math:base', '.__T__Ops:base', '.__T__Schur:Matrix', '.__T__Summary:base', '.__T__[:base', '.__T__[<-:base', '.__T__^:base', '.__T__all.equal:base', '.__T__all:base', '.__T__any:base', '.__T__as.array:base', '.__T__as.integer:base', '.__T__as.logical:base', '.__T__as.matrix:base', '.__T__as.numeric:base', '.__T__as.vector:base', '.__T__band:Matrix', '.__T__cbind2:methods', '.__T__chol2inv:base', '.__T__chol:base', '.__T__coerce:methods', '.__T__coerce<-:methods', '.__T__colMeans:base', '.__T__colSums:base', '.__T__cov2cor:stats', '.__T__crossprod:base', '.__T__determinant:base', '.__T__diag:base', '.__T__diag<-:base', '.__T__diff:base', '.__T__dim:base', '.__T__dim<-:base', '.__T__dimnames:base', '.__T__dimnames<-:base', '.__T__drop:base', '.__T__expand:Matrix', '.__T__expm:Matrix', '.__T__facmul:Matrix', '.__T__forceSymmetric:Matrix', '.__T__format:base', '.__T__head:utils', '.__T__image:graphics', '.__T__initialize:methods', '.__T__is.finite:base', '.__T__is.infinite:base', '.__T__is.na:base', '.__T__isDiagonal:Matrix', '.__T__isSymmetric:base', '.__T__isTriangular:Matrix', '.__T__kronecker:base', '.__T__length:base', '.__T__lu:Matrix', '.__T__mean:base', '.__T__nnzero:Matrix', '.__T__norm:base', '.__T__pack:Matrix', '.__T__print:base', '.__T__prod:base', '.__T__qr.Q:base', '.__T__qr.R:base', '.__T__qr.coef:base', '.__T__qr.fitted:base', '.__T__qr.qty:base', '.__T__qr.qy:base', '.__T__qr.resid:base', '.__T__qr:base', '.__T__rbind2:methods', '.__T__rcond:base', '.__T__rep:base', '.__T__rowMeans:base', '.__T__rowSums:base', '.__T__show:methods', '.__T__skewpart:Matrix', '.__T__solve:base', '.__T__sum:base', '.__T__summary:base', '.__T__symmpart:Matrix', '.__T__t:base', '.__T__tail:utils', '.__T__tcrossprod:base', '.__T__toeplitz:stats', '.__T__tril:Matrix', '.__T__triu:Matrix', '.__T__unname:base', '.__T__unpack:Matrix', '.__T__update:stats', '.__T__updown:Matrix', '.__T__which:base', '.__T__writeMM:Matrix', '.__T__zapsmall:base'), FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 99 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep12# #argv <- list('^[[:blank:]]*$', 'mtext(\'«Latin-1 accented chars»: éè øØ å<Å æ<Æ\', side = 3)', FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep13# #argv <- list('.__T__[[<-:', '.__T__[[<-:base', FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep2# #argv <- list('éè', '«Latin-1 accented chars»: éè øØ å<Å æ<Æ é éè', TRUE, FALSE, TRUE, FALSE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep3# #argv <- list('[', '^\\.__[MT]', FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep4# #argv <- list('éè', '«Latin-1 accented chars»: éè øØ å<Å æ<Æ é éè', FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep5# #argv <- list('[', '^[[:alpha:]]+', FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep6# #argv <- list('.__T__[:', c('.__T__plot:graphics', '.__T__$:base', '.__T__$<-:base', '.__T__Arith:base', '.__T__Compare:methods', '.__T__Complex:base', '.__T__Logic:base', '.__T__Math2:methods', '.__T__Math:base', '.__T__Ops:base', '.__T__Summary:base', '.__T__[:base', '.__T__addNextMethod:methods', '.__T__body<-:base', '.__T__cbind2:methods', '.__T__coerce:methods', '.__T__coerce<-:methods', '.__T__initialize:methods', '.__T__kronecker:base', '.__T__loadMethod:methods', '.__T__rbind2:methods', '.__T__show:methods', '.__T__slotsFromS3:methods'), FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep7#Ignored.ParserErrorFormatting#Output.IgnoreErrorContext# #argv <- list(''', structure('exNSS4_1.0.tar.gz', .Names = ''), FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: unexpected string constant in "argv <- list(''', structure('" ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep7# #argv <- list('', structure('exNSS4_1.0.tar.gz', .Names = ''), FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep7# #argv <- list('\'', structure('exNSS4_1.0.tar.gz', .Names = ''), FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grep.testgrep9# #argv <- list('^[ABCDEFGHIJKLMNOPQRSTUVWXYZabcdefghijklmnopqrstuvwxyz0123456789]', 'all.R', FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(grep(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedEmpty# #grepRaw('adf', '', fixed=TRUE) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedIgnoreInvert# #grepRaw('no match', 'XXXXXXXX', fixed=T, invert=T, value=F) integer(0) Warning message: In grepRaw("no match", "XXXXXXXX", fixed = T, invert = T, value = F) : argument 'invert = TRUE' will be ignored ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedInvertAll# #grepRaw('two-matches', 'two-matches fff two-matches', fixed=T, invert=T, value=T, all=T) [[1]] raw(0) [[2]] [1] 20 66 66 66 20 [[3]] raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedInvertAllOffset# #grepRaw('two-matches', 'two-matches fff two-matches', fixed=T, invert=T, value=T, all=T, offset=11) [[1]] [1] 74 77 6f 2d 6d 61 74 63 68 65 73 20 66 66 66 20 [[2]] raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedInvertNoAll# #grepRaw('no match', 'XXXXXXXX', fixed=T, invert=T, value=T) [1] 58 58 58 58 58 58 58 58 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedInvertNoAll# #grepRaw('two-matches', 'two-matches fff two-matches', fixed=T, invert=T, value=T) [1] 20 66 66 66 20 74 77 6f 2d 6d 61 74 63 68 65 73 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedNoValueNoAll# #grepRaw('adf', 'adadfadfdfadadf', fixed=T) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedNoValueNoAll# #grepRaw('no match', 'textText', fixed=T) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedNoValueNoAllOffset# #grepRaw('X', 'aaXaa', fixed=T, offset=3) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedNoValueNoAllOffset# #grepRaw('adf', 'adadfadfdfadadf', fixed=T, offset=7) [1] 13 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedNoValueNoAllOffset# #grepRaw('no match', 'textText', fixed=T, offset=5) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedValueAll# #grepRaw('X', 'XXXXXXXX', fixed=T, value=T, all=T) [[1]] [1] 58 [[2]] [1] 58 [[3]] [1] 58 [[4]] [1] 58 [[5]] [1] 58 [[6]] [1] 58 [[7]] [1] 58 [[8]] [1] 58 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedValueAll# #grepRaw('X', 'aXaaa', fixed=T, value=T, all=T) [[1]] [1] 58 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedValueAll# #grepRaw('X', 'aXaaaX', fixed=T, value=T, all=T) [[1]] [1] 58 [[2]] [1] 58 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedValueAll# #grepRaw('no match', 'XXXXXXXX', fixed=T, value=T, all=T) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedValueAll# #grepRaw('two-matches', 'two-matches fff two-matches', fixed=T, value=T, all=T) [[1]] [1] 74 77 6f 2d 6d 61 74 63 68 65 73 [[2]] [1] 74 77 6f 2d 6d 61 74 63 68 65 73 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedValueNoAll# #grepRaw('X', 'aXaaaX', fixed=T, value=T) [1] 58 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedValueNoAll# #grepRaw('XX', 'aXXaaaX', fixed=T, value=T) [1] 58 58 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedValueNoAll# #grepRaw('no match', 'textText', fixed=T, value=T) raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepRaw.testFixedValueNoAll# #grepRaw('text', 'textText', fixed=T, value=T) [1] 74 65 78 74 ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testGrepl# #{ .Internal(grepl("7", 7, F, F, F, F, F, F)) } Error: invalid 'text' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testGrepl# #{ .Internal(grepl('.+X', 'a<<>>Xb', F, F, F, F, F, F)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testGrepl# #{ .Internal(grepl('.+X', 'a<<>>Xb', F, F, T, F, F, F)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testGrepl# #{ .Internal(grepl(7, "7", F, F, F, F, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testGrepl# #{ .Internal(grepl(character(), "7", F, F, F, F, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testGrepl# #{ txt<-c("arm","foot","lefroo", "bafoobar"); grepl("foo", txt) } [1] FALSE TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testSpacesInQuantifiers# #{ grepl('x{2, }', 'xxx', perl=FALSE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testSpacesInQuantifiers# #{ grepl('x{2, }', 'xxx', perl=TRUE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testSpacesInQuantifiers#Output.IgnoreErrorMessage# #{ grepl('x{2, 3}', 'xxx', perl=FALSE) } Error in grepl("x{2, 3}", "xxx", perl = FALSE) : invalid regular expression 'x{2, 3}', reason 'Invalid contents of {}' ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testSpacesInQuantifiers# #{ grepl('x{2, 3}', 'xxx', perl=TRUE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testSpacesInQuantifiers# #{ grepl('x{2, }', 'xxx', perl=FALSE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testSpacesInQuantifiers# #{ grepl('x{2, }', 'xxx', perl=TRUE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testSpacesInQuantifiers# #{ grepl('x{2,}', 'xxx', perl=FALSE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testSpacesInQuantifiers# #{ grepl('x{2,}', 'xxx', perl=TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl1# #argv <- list('([[:digit:]]+[.-]){1,}[[:digit:]]+', c('1.0', '1.0'), FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(grepl(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl10# #argv <- list('{refObject}', c('\\section{Extends}{', 'Class \\code{\'\\linkS4class{refClassA}\'}, directly.', 'Class \\code{\'\\linkS4class{envRefClass}\'}, by class \'refClassA\', distance 2.', 'Class \\code{\'\\linkS4class{.environment}\'}, by class \'refClassA\', distance 3.', 'Class \\code{\'\\linkS4class{refClass}\'}, by class \'refClassA\', distance 3.', 'Class \\code{\'\\linkS4class{environment}\'}, by class \'refClassA\', distance 4, with explicit coerce.', 'Class \\code{\'\\linkS4class{refObject}\'}, by class \'refClassA\', distance 4.', '}'), FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grepl(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl11# #argv <- list('^prepare_Rd', structure(character(0), class = 'checkRd'), FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(grepl(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl12# #argv <- structure(list(pattern = 'length', x = 'Lengths: 0, 1', ignore.case = TRUE), .Names = c('pattern', 'x', 'ignore.case'));do.call('grepl', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl3# #argv <- list('\n', structure('c(person(\'José\', \'Pinheiro\', role = \'aut\',\n comment = \'S version\'),\n person(\'Douglas\', \'Bates\', role = \'aut\',\n comment = \'up to 2007\'),\n person(\'Saikat\', \'DebRoy\', role = \'ctb\',\n comment = \'up to 2002\'),\n person(\'Deepayan\', \'Sarkar\', role = \'ctb\',\n comment = \'up to 2005\'),\n\t person(\'R-core\', email = \'R-core@R-project.org\',\n role = c(\'aut\', \'cre\')),\n person(\'EISPACK authors\', role = \'ctb\'))', .Names = 'Authors@R'), FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grepl(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl4# #argv <- list('([[:digit:]]+[.-]){1,}[[:digit:]]+', structure('7.3-26', .Names = 'Version'), FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(grepl(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl5# #argv <- list('\n', c('### Encoding: UTF-8', '', '### Name: text', '### Title: Add Text to a Plot', '### Aliases: text text.default', '### Keywords: aplot', '', '### ** Examples', '', 'plot(-1:1, -1:1, type = \'n\', xlab = \'Re\', ylab = \'Im\')', 'K <- 16; text(exp(1i * 2 * pi * (1:K) / K), col = 2)', '', '## The following two examples use latin1 characters: these may not', '## appear correctly (or be omitted entirely).', 'plot(1:10, 1:10, main = \'text(...) examples\\n~~~~~~~~~~~~~~\',', ' sub = \'R is GNU ©, but not ® ...\')', 'mtext(\'«Latin-1 accented chars»: éè øØ å<Å æ<Æ\', side = 3)', 'points(c(6,2), c(2,1), pch = 3, cex = 4, col = \'red\')', 'text(6, 2, \'the text is CENTERED around (x,y) = (6,2) by default\',', ' cex = .8)', 'text(2, 1, \'or Left/Bottom - JUSTIFIED at (2,1) by \'adj = c(0,0)\'\',', ' adj = c(0,0))', 'text(4, 9, expression(hat(beta) == (X^t * X)^{-1} * X^t * y))', 'text(4, 8.4, \'expression(hat(beta) == (X^t * X)^{-1} * X^t * y)\',', ' cex = .75)', 'text(4, 7, expression(bar(x) == sum(frac(x[i], n), i==1, n)))', '', '## Two more latin1 examples', 'text(5, 10.2,', ' \'Le français, c\'est façile: Règles, Liberté, Egalité, Fraternité...\')', 'text(5, 9.8,', ' \'Jetz no chli züritüütsch: (noch ein bißchen Zürcher deutsch)\')', '', '', ''), FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grepl(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl6# #argv <- list('x', 'x', FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grepl(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl7# #argv <- list('^[[:space:]]*## No test:', 'Diagonal(3)', FALSE, FALSE, TRUE, FALSE, TRUE, FALSE); .Internal(grepl(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl8# #argv <- list('\\\\keyword\\{\\s*internal\\s*\\}', c('\\inputencoding{utf8}', '\\HeaderA{condest}{Compute Approximate CONDition number and 1-Norm of (Large) Matrices}{condest}', '\\aliasA{onenormest}{condest}{onenormest}', '%', '\\begin{Description}\\relax', '``Estimate\'\', i.e. compute approximately the CONDition number of', 'a (potentially large, often sparse) matrix \\code{A}.', 'It works by apply a fast approximation of the 1-norm,', '\\code{norm(A,\'1\')}, through \\code{onenormest(.)}.', '\\end{Description}', '%', '\\begin{Usage}', '\\begin{verbatim}', 'condest(A, t = min(n, 5), normA = norm(A, \'1\'),', ' silent = FALSE, quiet = TRUE)', '', 'onenormest(A, t = min(n, 5), A.x, At.x, n,', ' silent = FALSE, quiet = silent,', ' iter.max = 10, eps = 4 * .Machine$double.eps)', '\\end{verbatim}', '\\end{Usage}', '%', '\\begin{Arguments}', '\\begin{ldescription}', '\\item[\\code{A}] a square matrix, optional for \\code{onenormest()}, where', 'instead of \\code{A}, \\code{A.x} and \\code{At.x} can be specified,', 'see there.', '\\item[\\code{t}] number of columns to use in the iterations.', '\\item[\\code{normA}] number; (an estimate of) the 1-norm of \\code{A}, by', 'default \\code{\\LinkA{norm}{norm}(A, \'1\')}; may be replaced by an estimate.', '\\item[\\code{silent}] logical indicating if warning and (by default)', 'convergence messages should be displayed.', '\\item[\\code{quiet}] logical indicating if convergence messages should be', 'displayed.', '\\item[\\code{A.x, At.x}] when \\code{A} is missing, these two must be given as', 'functions which compute \\code{A \\%\\% x}, or \\code{t(A) \\%\\% x},', 'respectively.', '\\item[\\code{n}] \\code{ == nrow(A)}, only needed when \\code{A} is not specified.', '\\item[\\code{iter.max}] maximal number of iterations for the 1-norm estimator.', '\\item[\\code{eps}] the relaive change that is deemed irrelevant.', '\\end{ldescription}', '\\end{Arguments}', '%', '\\begin{Value}', 'Both functions return a \\code{\\LinkA{list}{list}};', '\\code{onenormest()} with components,', '\\begin{ldescription}', '\\item[\\code{est}] a number \\eqn{> 0}{}, the estimated \\code{norm(A, \'1\')}.', '\\item[\\code{v}] the maximal \\eqn{A X}{} column.', '', '\\end{ldescription}', 'The function \\code{condest()} returns a list with components,', '\\begin{ldescription}', '\\item[\\code{est}] a number \\eqn{> 0}{}, the estimated condition number', '\\eqn{\\hat\\kappa}{}; when \\eqn{r :=}{}\\code{rcond(A)},', '\\eqn{1/\\hat\\kappa \\approx r}{}.', '\\item[\\code{v}] integer vector length \\code{n}, with an \\code{1} at the index', '\\code{j} with maximal column \\code{A[,j]} in \\eqn{A}{}.', '\\item[\\code{w}] numeric vector, the largest \\eqn{A x}{} found.', '\\item[\\code{iter}] the number of iterations used.', '\\end{ldescription}', '\\end{Value}', '%', '\\begin{Author}\\relax', 'This is based on octave\'s \\code{condest()} and', '\\code{onenormest()} implementations with original author', 'Jason Riedy, U Berkeley; translation to \\R{} and', 'adaption by Martin Maechler.', '\\end{Author}', '%', '\\begin{References}\\relax', '', 'Nicholas J. Higham and Fran\\303\\247oise Tisseur (2000).', 'A Block Algorithm for Matrix 1-Norm Estimation, with an Application to 1-Norm', 'Pseudospectra.', '\\emph{SIAM J. Matrix Anal. Appl.} \\bold{21}, 4, 1185--1201.', '\\\\url{http://dx.doi.org/10.1137/S0895479899356080}', '', '', 'William W. Hager (1984).', 'Condition Estimates.', '\\emph{SIAM J. Sci. Stat. Comput.} \\bold{5}, 311--316.', '\\end{References}', '%', '\\begin{SeeAlso}\\relax', '\\code{\\LinkA{norm}{norm}}, \\code{\\LinkA{rcond}{rcond}}.', '\\end{SeeAlso}', '%', '\\begin{Examples}', '\\begin{ExampleCode}', 'data(KNex)', 'mtm <- with(KNex, crossprod(mm))', 'system.time(ce <- condest(mtm))', '## reciprocal', '1 / ce$est', 'system.time(rc <- rcond(mtm)) # takes ca 3 x longer', 'rc', 'all.equal(rc, 1/ce$est) # TRUE -- the approxmation was good', '\\end{ExampleCode}', '\\end{Examples}'), FALSE, FALSE, TRUE, FALSE, FALSE, FALSE); .Internal(grepl(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [37] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [49] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [61] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_grepl.testgrepl9# #argv <- list('\n', '\nqr(x, ...)\nqrR(qr, complete=FALSE, backPermute=TRUE)\n', FALSE, FALSE, FALSE, TRUE, FALSE, FALSE); .Internal(grepl(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_growconst.testgrowconst1# #argv <- list(list(list())); .Internal(growconst(argv[[1]])) [[1]] list() [[2]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #gsub('(_[bB])','\\1_m','b_b') [1] "b_b_m" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #gsub('@CXX11@', '$(CXX11)', ' CPLUS="@CXX11@" \'', fixed=FALSE) [1] " CPLUS=\"$(CXX11)\" '" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #gsub('_[bB]','\\0_m','b_b') [1] "b0_m" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #gsub('_[bB]','\\1_m','b_b') [1] "b_m" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #gsub('b','\\1m','Abb') [1] "Amm" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ .Internal(gsub("7", "42", 7, F, F, F, F)) } Error: invalid 'text' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ .Internal(gsub("7", 42, "7", F, F, F, F)) } Error: invalid 'replacement' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ .Internal(gsub("7", character(), "7", F, F, F, F)) } Error: invalid 'replacement' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ .Internal(gsub(7, "42", "7", F, F, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ .Internal(gsub(character(), "42", "7", F, F, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub("([a-e])","\\1\\1", "prague alley") } [1] "praaguee aalleey" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub("a","aa", "prAgue alley") } [1] "prAgue aalley" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub("a","aa", "prAgue alley", fixed=TRUE) } [1] "prAgue aalley" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub("a","aa", "prAgue alley", fixed=TRUE, ignore.case=TRUE) } [1] "prAgue aalley" Warning message: In gsub("a", "aa", "prAgue alley", fixed = TRUE, ignore.case = TRUE) : argument 'ignore.case = TRUE' will be ignored ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub#Ignored.Unimplemented# #{ gsub("a","aa", "prAgue alley", ignore.case=TRUE) } [1] "praague aalley" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub("a","aa", "prague alley") } [1] "praague aalley" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub("a","aa", "prague alley", fixed=TRUE) } [1] "praague aalley" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub("h","", c("hello", "hi", "bye")) } [1] "ello" "i" "bye" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub("h","", c("hello", "hi", "bye"), fixed=TRUE) } [1] "ello" "i" "bye" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub('([^\n])$', '\\1\n', c('[1] 2', NA, 'aaaa\n')) } [1] "[1] 2\n" NA "aaaa\n" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub('.*X', '', 'a<<>>Xb', perl = FALSE) } [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub('x', '$', 'x') } [1] "$" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsub# #{ gsub('~', '\\\\X', '~') } [1] "\\X" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #list(gsub('>.*\n|\n', '', 'R> Line 1\n Line 2\n', perl=T), gsub('>.*\n|\n', '', 'R> Line 1\n Line 2\n', perl=F)) [[1]] [1] "R Line 2" [[2]] [1] "R" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #list(gsub('>.*\t|\n', '', 'R> Line 1\t Line 2\n', perl=T),gsub('>.*\t|\n', '', 'R> Line 1\t Line 2\n', perl=F)) [[1]] [1] "R Line 2" [[2]] [1] "R Line 2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub('([⚽])', '\\1', '─', perl=TRUE)} [1] "─" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub('(a|b)', '\\1', 'XabX', perl=TRUE) } [1] "XabX" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub('(a|b)', '\\1', 'aa', perl=TRUE) } [1] "aa" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub('(a|b)', '\\1', 'aabb', perl=TRUE) } [1] "aabb" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub('(a|b)', '\\1', 'ab', perl=TRUE) } [1] "ab" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub('(a|b)', '\\1', 'abab', perl=TRUE) } [1] "abab" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub('(a|b)', '\\1', 'bb', perl=TRUE) } [1] "bb" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub('.*X', '', 'a<<>>Xb', perl = TRUE) } [1] "a\nb" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub(pattern = 'a*', replacement = 'x', x = 'ÄaaaaÄ', perl = TRUE) } [1] "xÄxÄx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub(pattern = 'a*', replacement = 'x', x = 'ÄaÄ', perl = TRUE) } [1] "xÄxÄx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testGsubPCRE# #{ gsub(pattern = 'Ä*', replacement = 'x', x = 'aÄÄÄÄÄb', perl = TRUE) } [1] "xaxbx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub1# #argv <- list('([[:alnum:]])--([[:alnum:]])', '\\1-\\2', 'Date-Time Classes', FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "Date-Time Classes" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub10#Ignored.ImplementationError# #argv <- list('a*', 'x', 'baaac', FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "xbxcx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub11# #argv <- list('é', 'gh', '«Latin-1 accented chars»: éè øØ å<Å æ<Æ é éè', FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "«Latin-1 accented chars»: ghè øØ å<Å æ<Æ gh ghè" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub12# #argv <- list('([[:digit:]]+[.-]){1,}[[:digit:]]+', '', 'pkgB_1.0.tar.gz', FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "pkgB_.tar.gz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub13#Ignored.ImplementationError# #argv <- list('\\b', '|', 'The quick brown èé', FALSE, TRUE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "|The| |quick| |brown| èé" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub14# #argv <- list('/home/lzhao/hg/r-instrumented/src/library/utils', '', '/home/lzhao/hg/r-instrumented/src/library/utils/vignettes', FALSE, FALSE, TRUE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "/vignettes" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub15# #argv <- list('(‘|’)', '\'', c('', '', '> library(survival)', 'Loading required package: splines', '> options(na.action=na.exclude) # preserve missings', '> options(contrasts=c(\'contr.treatment\', \'contr.poly\')) #ensure constrast type', '> ', '> #', '> # Simple tests of concordance. These numbers were derived in multiple', '> # codes.', '> #', '> aeq <- function(x,y, ...) all.equal(as.vector(x), as.vector(y), ...)', '> ', '> grank <- function(x, time, grp, wt) ', '+ unlist(tapply(x, grp, rank))', '> grank2 <- function(x, time, grp, wt) { #for case weights', '+ if (length(wt)==0) wt <- rep(1, length(x))', '+ z <- double(length(x))', '+ for (i in unique(grp)) {', '+ indx <- which(grp==i)', '+ temp <- tapply(wt[indx], x[indx], sum)', '+ temp <- temp/2 + c(0, cumsum(temp)[-length(temp)])', '+ z[indx] <- temp[match(x[indx], names(temp))]', '+ }', '+ z', '+ }', '> ', '> ', '> tdata <- aml[aml$x==\'Maintained\',]', '> tdata$y <- c(1,6,2,7,3,7,3,8,4,4,5)', '> tdata$wt <- c(1,2,3,2,1,2,3,4,3,2,1)', '> fit <- survConcordance(Surv(time, status) ~y, tdata)', '> aeq(fit$stats[1:4], c(14,24,2,0))', '[1] TRUE', '> cfit <- coxph(Surv(time, status) ~ tt(y), tdata, tt=grank, method=\'breslow\',', '+ iter=0, x=T)', '> cdt <- coxph.detail(cfit)', '> aeq(4*sum(cdt$imat),fit$stats[5]^2) ', '[1] TRUE', '> aeq(2*sum(cdt$score), diff(fit$stats[2:1]))', '[1] TRUE', '> ', '> ', '> # Lots of ties', '> tempx <- Surv(c(1,2,2,2,3,4,4,4,5,2), c(1,0,1,0,1,0,1,1,0,1))', '> tempy <- c(5,5,4,4,3,3,7,6,5,4)', '> fit2 <- survConcordance(tempx ~ tempy)', '> aeq(fit2$stats[1:4], c(13,13,5,2))', '[1] TRUE', '> cfit2 <- coxph(tempx ~ tt(tempy), tt=grank, method=\'breslow\', iter=0)', '> aeq(4/cfit2$var, fit2$stats[5]^2)', '[1] TRUE', '> ', '> # Bigger data', '> fit3 <- survConcordance(Surv(time, status) ~ age, lung)', '> aeq(fit3$stats[1:4], c(10717, 8706, 591, 28))', '[1] TRUE', '> cfit3 <- coxph(Surv(time, status) ~ tt(age), lung, ', '+ iter=0, method=\'breslow\', tt=grank, x=T)', '> cdt <- coxph.detail(cfit3)', '> aeq(4*sum(cdt$imat),fit3$stats[5]^2) ', '[1] TRUE', '> aeq(2*sum(cdt$score), diff(fit3$stats[2:1]))', '[1] TRUE', '> ', '> ', '> # More ties', '> fit4 <- survConcordance(Surv(time, status) ~ ph.ecog, lung)', '> aeq(fit4$stats[1:4], c(8392, 4258, 7137, 28))', '[1] TRUE', '> cfit4 <- coxph(Surv(time, status) ~ tt(ph.ecog), lung, ', '+ iter=0, method=\'breslow\', tt=grank)', '> aeq(4/cfit4$var, fit4$stats[5]^2)', '[1] TRUE', '> ', '> # Case weights', '> fit5 <- survConcordance(Surv(time, status) ~ y, tdata, weight=wt)', '> fit6 <- survConcordance(Surv(time, status) ~y, tdata[rep(1:11,tdata$wt),])', '> aeq(fit5$stats[1:4], c(70, 91, 7, 0)) # checked by hand', '[1] TRUE', '> aeq(fit5$stats[1:3], fit6$stats[1:3]) #spurious \'tied on time\' value, ignore', '[1] TRUE', '> aeq(fit5$std, fit6$std)', '[1] TRUE', '> cfit5 <- coxph(Surv(time, status) ~ tt(y), tdata, weight=wt, ', '+ iter=0, method=\'breslow\', tt=grank2)', '> cfit6 <- coxph(Surv(time, status) ~ tt(y), tdata[rep(1:11,tdata$wt),], ', '+ iter=0, method=\'breslow\', tt=grank)', '> aeq(4/cfit6$var, fit6$stats[5]^2)', '[1] TRUE', '> aeq(cfit5$var, cfit6$var)', '[1] TRUE', '> ', '> # Start, stop simplest cases', '> fit7 <- survConcordance(Surv(rep(0,11), time, status) ~ y, tdata)', '> aeq(fit7$stats, fit$stats)', '[1] TRUE', '> aeq(fit7$std.err, fit$std.err)', '[1] TRUE', '> fit7 <- survConcordance(Surv(rep(0,11), time, status) ~ y, tdata, weight=wt)', '> aeq(fit5$stats, fit7$stats)', '[1] TRUE', '> ', '> # Multiple intervals for some, but same risk sets as tdata', '> tdata2 <- data.frame(time1=c(0,3, 5, 6,7, 0, 4,17, 7, 0,16, 2, 0, ', '+ 0,9, 5),', '+ time2=c(3,9, 13, 7,13, 18, 17,23, 28, 16,31, 34, 45, ', '+ 9,48, 60),', '+ status=c(0,1, 1, 0,0, 1, 0,1, 0, 0,1, 1, 0, 0,1, 0),', '+ y = c(1,1, 6, 2,2, 7, 3,3, 7, 3,3, 8, 4, 4,4, 5),', '+ wt= c(1,1, 2, 3,3, 2, 1,1, 2, 3,3, 4, 3, 2,2, 1))', '> fit8 <- survConcordance(Surv(time1, time2, status) ~y, tdata2, weight=wt)', '> aeq(fit5$stats, fit8$stats)', '[1] TRUE', '> aeq(fit5$std.err, fit8$std.err)', '[1] TRUE', '> cfit8 <- coxph(Surv(time1, time2, status) ~ tt(y), tdata2, weight=wt, ', '+ iter=0, method=\'breslow\', tt=grank2)', '> aeq(4/cfit8$var, fit8$stats[5]^2)', '[1] TRUE', '> aeq(fit8$stats[5]/(2*sum(fit8$stats[1:3])), fit8$std.err)', '[1] TRUE', '> ', '> # Stratified', '> tdata3 <- data.frame(time1=c(tdata2$time1, rep(0, nrow(lung))),', '+ time2=c(tdata2$time2, lung$time),', '+ status = c(tdata2$status, lung$status -1),', '+ x = c(tdata2$y, lung$ph.ecog),', '+ wt= c(tdata2$wt, rep(1, nrow(lung))),', '+ grp=rep(1:2, c(nrow(tdata2), nrow(lung))))', '> fit9 <- survConcordance(Surv(time1, time2, status) ~x + strata(grp),', '+ data=tdata3, weight=wt)', '> aeq(fit9$stats[1,], fit5$stats)', '[1] TRUE', '> aeq(fit9$stats[2,], fit4$stats)', '[1] TRUE', '> '), FALSE, TRUE, FALSE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "" [2] "" [3] "> library(survival)" [4] "Loading required package: splines" [5] "> options(na.action=na.exclude) # preserve missings" [6] "> options(contrasts=c('contr.treatment', 'contr.poly')) #ensure constrast type" [7] "> " [8] "> #" [9] "> # Simple tests of concordance. These numbers were derived in multiple" [10] "> # codes." [11] "> #" [12] "> aeq <- function(x,y, ...) all.equal(as.vector(x), as.vector(y), ...)" [13] "> " [14] "> grank <- function(x, time, grp, wt) " [15] "+ unlist(tapply(x, grp, rank))" [16] "> grank2 <- function(x, time, grp, wt) { #for case weights" [17] "+ if (length(wt)==0) wt <- rep(1, length(x))" [18] "+ z <- double(length(x))" [19] "+ for (i in unique(grp)) {" [20] "+ indx <- which(grp==i)" [21] "+ temp <- tapply(wt[indx], x[indx], sum)" [22] "+ temp <- temp/2 + c(0, cumsum(temp)[-length(temp)])" [23] "+ z[indx] <- temp[match(x[indx], names(temp))]" [24] "+ }" [25] "+ z" [26] "+ }" [27] "> " [28] "> " [29] "> tdata <- aml[aml$x=='Maintained',]" [30] "> tdata$y <- c(1,6,2,7,3,7,3,8,4,4,5)" [31] "> tdata$wt <- c(1,2,3,2,1,2,3,4,3,2,1)" [32] "> fit <- survConcordance(Surv(time, status) ~y, tdata)" [33] "> aeq(fit$stats[1:4], c(14,24,2,0))" [34] "[1] TRUE" [35] "> cfit <- coxph(Surv(time, status) ~ tt(y), tdata, tt=grank, method='breslow'," [36] "+ iter=0, x=T)" [37] "> cdt <- coxph.detail(cfit)" [38] "> aeq(4*sum(cdt$imat),fit$stats[5]^2) " [39] "[1] TRUE" [40] "> aeq(2*sum(cdt$score), diff(fit$stats[2:1]))" [41] "[1] TRUE" [42] "> " [43] "> " [44] "> # Lots of ties" [45] "> tempx <- Surv(c(1,2,2,2,3,4,4,4,5,2), c(1,0,1,0,1,0,1,1,0,1))" [46] "> tempy <- c(5,5,4,4,3,3,7,6,5,4)" [47] "> fit2 <- survConcordance(tempx ~ tempy)" [48] "> aeq(fit2$stats[1:4], c(13,13,5,2))" [49] "[1] TRUE" [50] "> cfit2 <- coxph(tempx ~ tt(tempy), tt=grank, method='breslow', iter=0)" [51] "> aeq(4/cfit2$var, fit2$stats[5]^2)" [52] "[1] TRUE" [53] "> " [54] "> # Bigger data" [55] "> fit3 <- survConcordance(Surv(time, status) ~ age, lung)" [56] "> aeq(fit3$stats[1:4], c(10717, 8706, 591, 28))" [57] "[1] TRUE" [58] "> cfit3 <- coxph(Surv(time, status) ~ tt(age), lung, " [59] "+ iter=0, method='breslow', tt=grank, x=T)" [60] "> cdt <- coxph.detail(cfit3)" [61] "> aeq(4*sum(cdt$imat),fit3$stats[5]^2) " [62] "[1] TRUE" [63] "> aeq(2*sum(cdt$score), diff(fit3$stats[2:1]))" [64] "[1] TRUE" [65] "> " [66] "> " [67] "> # More ties" [68] "> fit4 <- survConcordance(Surv(time, status) ~ ph.ecog, lung)" [69] "> aeq(fit4$stats[1:4], c(8392, 4258, 7137, 28))" [70] "[1] TRUE" [71] "> cfit4 <- coxph(Surv(time, status) ~ tt(ph.ecog), lung, " [72] "+ iter=0, method='breslow', tt=grank)" [73] "> aeq(4/cfit4$var, fit4$stats[5]^2)" [74] "[1] TRUE" [75] "> " [76] "> # Case weights" [77] "> fit5 <- survConcordance(Surv(time, status) ~ y, tdata, weight=wt)" [78] "> fit6 <- survConcordance(Surv(time, status) ~y, tdata[rep(1:11,tdata$wt),])" [79] "> aeq(fit5$stats[1:4], c(70, 91, 7, 0)) # checked by hand" [80] "[1] TRUE" [81] "> aeq(fit5$stats[1:3], fit6$stats[1:3]) #spurious 'tied on time' value, ignore" [82] "[1] TRUE" [83] "> aeq(fit5$std, fit6$std)" [84] "[1] TRUE" [85] "> cfit5 <- coxph(Surv(time, status) ~ tt(y), tdata, weight=wt, " [86] "+ iter=0, method='breslow', tt=grank2)" [87] "> cfit6 <- coxph(Surv(time, status) ~ tt(y), tdata[rep(1:11,tdata$wt),], " [88] "+ iter=0, method='breslow', tt=grank)" [89] "> aeq(4/cfit6$var, fit6$stats[5]^2)" [90] "[1] TRUE" [91] "> aeq(cfit5$var, cfit6$var)" [92] "[1] TRUE" [93] "> " [94] "> # Start, stop simplest cases" [95] "> fit7 <- survConcordance(Surv(rep(0,11), time, status) ~ y, tdata)" [96] "> aeq(fit7$stats, fit$stats)" [97] "[1] TRUE" [98] "> aeq(fit7$std.err, fit$std.err)" [99] "[1] TRUE" [100] "> fit7 <- survConcordance(Surv(rep(0,11), time, status) ~ y, tdata, weight=wt)" [101] "> aeq(fit5$stats, fit7$stats)" [102] "[1] TRUE" [103] "> " [104] "> # Multiple intervals for some, but same risk sets as tdata" [105] "> tdata2 <- data.frame(time1=c(0,3, 5, 6,7, 0, 4,17, 7, 0,16, 2, 0, " [106] "+ 0,9, 5)," [107] "+ time2=c(3,9, 13, 7,13, 18, 17,23, 28, 16,31, 34, 45, " [108] "+ 9,48, 60)," [109] "+ status=c(0,1, 1, 0,0, 1, 0,1, 0, 0,1, 1, 0, 0,1, 0)," [110] "+ y = c(1,1, 6, 2,2, 7, 3,3, 7, 3,3, 8, 4, 4,4, 5)," [111] "+ wt= c(1,1, 2, 3,3, 2, 1,1, 2, 3,3, 4, 3, 2,2, 1))" [112] "> fit8 <- survConcordance(Surv(time1, time2, status) ~y, tdata2, weight=wt)" [113] "> aeq(fit5$stats, fit8$stats)" [114] "[1] TRUE" [115] "> aeq(fit5$std.err, fit8$std.err)" [116] "[1] TRUE" [117] "> cfit8 <- coxph(Surv(time1, time2, status) ~ tt(y), tdata2, weight=wt, " [118] "+ iter=0, method='breslow', tt=grank2)" [119] "> aeq(4/cfit8$var, fit8$stats[5]^2)" [120] "[1] TRUE" [121] "> aeq(fit8$stats[5]/(2*sum(fit8$stats[1:3])), fit8$std.err)" [122] "[1] TRUE" [123] "> " [124] "> # Stratified" [125] "> tdata3 <- data.frame(time1=c(tdata2$time1, rep(0, nrow(lung)))," [126] "+ time2=c(tdata2$time2, lung$time)," [127] "+ status = c(tdata2$status, lung$status -1)," [128] "+ x = c(tdata2$y, lung$ph.ecog)," [129] "+ wt= c(tdata2$wt, rep(1, nrow(lung)))," [130] "+ grp=rep(1:2, c(nrow(tdata2), nrow(lung))))" [131] "> fit9 <- survConcordance(Surv(time1, time2, status) ~x + strata(grp)," [132] "+ data=tdata3, weight=wt)" [133] "> aeq(fit9$stats[1,], fit5$stats)" [134] "[1] TRUE" [135] "> aeq(fit9$stats[2,], fit4$stats)" [136] "[1] TRUE" [137] "> " ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub16# #argv <- list('[[:blank:][:cntrl:]]*', '', structure(' unix\n', Rd_tag = 'TEXT'), FALSE, TRUE, FALSE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "unix" attr(,"Rd_tag") [1] "TEXT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub17# #argv <- list('(\\w)(\\w*)', '\\U\\1\\L\\2', 'a test of capitalizing', FALSE, TRUE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "A Test Of Capitalizing" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub18# #argv <- list('\\.', '\\\\.', '^*.t??$', FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "^*\\.t??$" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub19# #argv <- list('(\\w)(\\w*)(\\w)', '\\U\\1\\E\\2\\U\\3', 'useRs may fly into JFK or laGuardia', FALSE, TRUE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "UseRS MaY FlY IntO JFK OR LaGuardiA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub2# #argv <- list('\\\\(link|var)\\{([^}]+)\\}', '\\2', structure(' \'Jetz no chli züritüütsch: (noch ein bißchen Zürcher deutsch)\')\n', Rd_tag = 'RCODE'), FALSE, TRUE, FALSE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] " 'Jetz no chli züritüütsch: (noch ein bißchen Zürcher deutsch)')\n" attr(,"Rd_tag") [1] "RCODE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub20# #argv <- list('([&$%_#])', '\\\\\\1', structure('with 5% of the range added to each end.\n', Rd_tag = 'TEXT'), FALSE, TRUE, FALSE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "with 5\\% of the range added to each end.\n" attr(,"Rd_tag") [1] "TEXT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub21# #argv <- list('[[:space:]]*%+[[:space:]]*\\\\VignetteEngine\\{([^}]*)\\}', '\\1', character(0), FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub22# #argv <- list('^\\s+', '', ' utilities ', FALSE, TRUE, FALSE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "utilities " ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub23# #argv <- list('([^\\])\\[', '\\1\\\\[', '^.*[.*$', FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "^.*\\[.*$" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub24# #argv <- list('.__M__(.*):([^:]+)', '\\1', character(0), FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub25# #argv <- list('%', '\\\\%', structure('foo', .Names = 'object'), FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) object "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub26# #argv <- list('\\\\(l|)dots', '...', structure('plot(1:10, 1:10, main = \'text(...) examples\\n~~~~~~~~~~~~~~\',\n', Rd_tag = 'RCODE'), FALSE, TRUE, FALSE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "plot(1:10, 1:10, main = 'text(...) examples\\n~~~~~~~~~~~~~~',\n" attr(,"Rd_tag") [1] "RCODE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub27# #argv <- list('.__T__(.*):([^:]+(.*))', '\\2', c('.__T__!:base', '.__T__%%:base', '.__T__%*%:base', '.__T__%/%:base', '.__T__&:base', '.__T__*:base', '.__T__+:base', '.__T__-:base', '.__T__/:base', '.__T__Arith:base', '.__T__BunchKaufman:Matrix', '.__T__Cholesky:Matrix', '.__T__Compare:methods', '.__T__Logic:base', '.__T__Math2:methods', '.__T__Math:base', '.__T__Ops:base', '.__T__Schur:Matrix', '.__T__Summary:base', '.__T__[:base', '.__T__[<-:base', '.__T__^:base', '.__T__all.equal:base', '.__T__all:base', '.__T__any:base', '.__T__as.array:base', '.__T__as.integer:base', '.__T__as.logical:base', '.__T__as.matrix:base', '.__T__as.numeric:base', '.__T__as.vector:base', '.__T__band:Matrix', '.__T__cbind2:methods', '.__T__chol2inv:base', '.__T__chol:base', '.__T__coerce:methods', '.__T__coerce<-:methods', '.__T__colMeans:base', '.__T__colSums:base', '.__T__cov2cor:stats', '.__T__crossprod:base', '.__T__determinant:base', '.__T__diag:base', '.__T__diag<-:base', '.__T__diff:base', '.__T__dim:base', '.__T__dim<-:base', '.__T__dimnames:base', '.__T__dimnames<-:base', '.__T__drop:base', '.__T__expand:Matrix', '.__T__expm:Matrix', '.__T__facmul:Matrix', '.__T__forceSymmetric:Matrix', '.__T__format:base', '.__T__head:utils', '.__T__image:graphics', '.__T__initialize:methods', '.__T__is.finite:base', '.__T__is.infinite:base', '.__T__is.na:base', '.__T__isDiagonal:Matrix', '.__T__isSymmetric:base', '.__T__isTriangular:Matrix', '.__T__kronecker:base', '.__T__length:base', '.__T__lu:Matrix', '.__T__mean:base', '.__T__nnzero:Matrix', '.__T__norm:base', '.__T__pack:Matrix', '.__T__print:base', '.__T__prod:base', '.__T__qr.Q:base', '.__T__qr.R:base', '.__T__qr.coef:base', '.__T__qr.fitted:base', '.__T__qr.qty:base', '.__T__qr.qy:base', '.__T__qr.resid:base', '.__T__qr:base', '.__T__rbind2:methods', '.__T__rcond:base', '.__T__rep:base', '.__T__rowMeans:base', '.__T__rowSums:base', '.__T__show:methods', '.__T__skewpart:Matrix', '.__T__solve:base', '.__T__sum:base', '.__T__summary:base', '.__T__symmpart:Matrix', '.__T__t:base', '.__T__tail:utils', '.__T__tcrossprod:base', '.__T__toeplitz:stats', '.__T__tril:Matrix', '.__T__triu:Matrix', '.__T__unname:base', '.__T__unpack:Matrix', '.__T__update:stats', '.__T__updown:Matrix', '.__T__which:base', '.__T__writeMM:Matrix', '.__T__zapsmall:base'), FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "base" "base" "base" "base" "base" "base" [7] "base" "base" "base" "base" "Matrix" "Matrix" [13] "methods" "base" "methods" "base" "base" "Matrix" [19] "base" "base" "base" "base" "base" "base" [25] "base" "base" "base" "base" "base" "base" [31] "base" "Matrix" "methods" "base" "base" "methods" [37] "methods" "base" "base" "stats" "base" "base" [43] "base" "base" "base" "base" "base" "base" [49] "base" "base" "Matrix" "Matrix" "Matrix" "Matrix" [55] "base" "utils" "graphics" "methods" "base" "base" [61] "base" "Matrix" "base" "Matrix" "base" "base" [67] "Matrix" "base" "Matrix" "base" "Matrix" "base" [73] "base" "base" "base" "base" "base" "base" [79] "base" "base" "base" "methods" "base" "base" [85] "base" "base" "methods" "Matrix" "base" "base" [91] "base" "Matrix" "base" "utils" "base" "stats" [97] "Matrix" "Matrix" "base" "Matrix" "stats" "Matrix" [103] "base" "Matrix" "base" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub28# #argv <- list('([^\\])\\(', '\\1\\\\(', '^.*{n.*$', FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "^.*{n.*$" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub3# #argv <- list('\\bsl', '\\bsl{}', structure(' knots).\n', Rd_tag = 'TEXT'), FALSE, FALSE, TRUE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] " knots).\n" attr(,"Rd_tag") [1] "TEXT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub30# #argv <- structure(list(pattern = 'a*', replacement = 'x', x = 'baaaac', perl = TRUE), .Names = c('pattern', 'replacement', 'x', 'perl'));do.call('gsub', argv) [1] "xbxcx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub31#Ignored.ImplementationError# #argv <- structure(list(pattern = 'a*', replacement = 'x', x = 'baaaac'), .Names = c('pattern', 'replacement', 'x'));do.call('gsub', argv) [1] "xbxcx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub4# #argv <- list('\\bsl', '\\bsl{}', structure(' ', Rd_tag = 'TEXT'), FALSE, FALSE, TRUE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] " " attr(,"Rd_tag") [1] "TEXT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub5# #argv <- list('([{}$#_])', '\\\\\\1', structure('2013-03-19 13:18:58', .Names = 'Date/Publication'), FALSE, FALSE, FALSE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) Date/Publication "2013-03-19 13:18:58" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub6# #argv <- list('é', 'gh', '«Latin-1 accented chars»: éè øØ å<Å æ<Æ é éè', FALSE, FALSE, TRUE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "«Latin-1 accented chars»: ghè øØ å<Å æ<Æ gh ghè" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub7# #argv <- list('([&$%_#])', '\\\\\\1', structure(', then ', Rd_tag = 'TEXT'), FALSE, TRUE, FALSE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] ", then " attr(,"Rd_tag") [1] "TEXT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub8# #argv <- list('\'([^\']*)\'', '-\\1-', '\'/home/lzhao/hg/r-instrumented/tests/rpart.Rcheck\'', FALSE, FALSE, FALSE, FALSE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "-/home/lzhao/hg/r-instrumented/tests/rpart.Rcheck-" ##com.oracle.truffle.r.test.builtins.TestBuiltin_gsub.testgsub9# #argv <- list('\\', '\\bsl', structure('range specified by ', Rd_tag = 'TEXT'), FALSE, FALSE, TRUE, TRUE); .Internal(gsub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "range specified by " attr(,"Rd_tag") [1] "TEXT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv#Ignored.ImplementationError# #Sys.setlocale('LC_CTYPE', 'C'); iconv(c('²a²²','b', toRaw=F)); Sys.setlocale('LC_CTYPE', 'UTF-8'); iconv(c('²a²²','b')) [1] "C" toRaw NA "b" "FALSE" [1] "" Warning message: In Sys.setlocale("LC_CTYPE", "UTF-8") : OS reports request to set locale to "UTF-8" cannot be honored [1] NA "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv#Ignored.ImplementationError# #Sys.setlocale('LC_CTYPE', 'C'); iconv(c('²a²²','b', toRaw=T)); Sys.setlocale('LC_CTYPE', 'UTF-8'); iconv(c('²a²²','b')) [1] "C" toRaw NA "b" "TRUE" [1] "" Warning message: In Sys.setlocale("LC_CTYPE", "UTF-8") : OS reports request to set locale to "UTF-8" cannot be honored [1] NA "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #iconv('foo²²', 'UTF8', 'ASCII', sub='', toRaw=F) [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #iconv('foo²²', 'UTF8', 'ASCII', sub='', toRaw=T) [[1]] [1] 66 6f 6f ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv#Ignored.Unimplemented# #iconv('foo²²', 'UTF8', 'ASCII', sub='byte', toRaw=F) [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv#Ignored.Unimplemented# #iconv('foo²²', 'UTF8', 'ASCII', sub='byte', toRaw=T) [[1]] [1] 66 6f 6f 3c 63 32 3e 3c 62 32 3e 3c 63 32 3e 3c 62 32 3e ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #iconv('foo²²', 'UTF8', 'ASCII', sub='f', toRaw=F) [1] "fooffff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #iconv('foo²²', 'UTF8', 'ASCII', sub='f', toRaw=T) [[1]] [1] 66 6f 6f 66 66 66 66 ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv#Ignored.Unimplemented# #iconv('foo²²', 'UTF8', 'ASCII', sub='fooooo', toRaw=F) [1] "foofooooofooooofooooofooooo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv#Ignored.Unimplemented# #iconv('foo²²', 'UTF8', 'ASCII', sub='fooooo', toRaw=T) [[1]] [1] 66 6f 6f 66 6f 6f 6f 6f 6f 66 6f 6f 6f 6f 6f 66 6f 6f 6f 6f 6f 66 6f 6f 6f [26] 6f 6f ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #iconv('foo²²', 'UTF8', 'ASCII', toRaw=F) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #iconv('foo²²', 'UTF8', 'ASCII', toRaw=T) [[1]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #iconv('foo²²', 'UTF8', 'latin1', toRaw=F) [1] "foo²²" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #iconv('foo²²', 'UTF8', 'latin1', toRaw=T) [[1]] [1] 66 6f 6f b2 b2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; iconv(x, 'latin1', 'ASCII', '', toRaw=F) [1] "faile" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; iconv(x, 'latin1', 'ASCII', '', toRaw=T) [[1]] [1] 66 61 69 6c 65 ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; iconv(x, 'latin1', 'ASCII', '?', toRaw=F) [1] "fa?ile" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; iconv(x, 'latin1', 'ASCII', '?', toRaw=T) [[1]] [1] 66 61 3f 69 6c 65 ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv#Ignored.ImplementationError# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; iconv(x, 'latin1', 'ASCII', 'byte', toRaw=F) [1] "faile" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv#Ignored.ImplementationError# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; iconv(x, 'latin1', 'ASCII', 'byte', toRaw=T) [[1]] [1] 66 61 3c 65 37 3e 69 6c 65 ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; iconv(x, 'latin1', 'ASCII', toRaw=F) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; iconv(x, 'latin1', 'ASCII', toRaw=T) [[1]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; attr(x, 'testattr') <- 'testattrvalue'; iconv(x, 'latin1', 'ASCII', '', toRaw=F) [1] "faile" attr(,"testattr") [1] "testattrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; attr(x, 'testattr') <- 'testattrvalue'; iconv(x, 'latin1', 'ASCII', '', toRaw=T) [[1]] [1] 66 61 69 6c 65 attr(,"testattr") [1] "testattrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; attr(x, 'testattr') <- 'testattrvalue'; iconv(x, 'latin1', 'ASCII', '?', toRaw=F) [1] "fa?ile" attr(,"testattr") [1] "testattrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; attr(x, 'testattr') <- 'testattrvalue'; iconv(x, 'latin1', 'ASCII', '?', toRaw=T) [[1]] [1] 66 61 3f 69 6c 65 attr(,"testattr") [1] "testattrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv#Ignored.ImplementationError# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; attr(x, 'testattr') <- 'testattrvalue'; iconv(x, 'latin1', 'ASCII', 'byte', toRaw=F) [1] "faile" attr(,"testattr") [1] "testattrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv#Ignored.ImplementationError# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; attr(x, 'testattr') <- 'testattrvalue'; iconv(x, 'latin1', 'ASCII', 'byte', toRaw=T) [[1]] [1] 66 61 3c 65 37 3e 69 6c 65 attr(,"testattr") [1] "testattrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; attr(x, 'testattr') <- 'testattrvalue'; iconv(x, 'latin1', 'ASCII', toRaw=F) [1] NA attr(,"testattr") [1] "testattrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #x <- 'fa\xE7ile'; Encoding(x) <- 'latin1'; attr(x, 'testattr') <- 'testattrvalue'; iconv(x, 'latin1', 'ASCII', toRaw=T) [[1]] NULL attr(,"testattr") [1] "testattrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', 'latin1', 'ASCII', 42, T, toRaw=F)) } Error: invalid 'sub' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', 'latin1', 'ASCII', 42, T, toRaw=T)) } Error: invalid 'sub' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', 'latin1', 'ASCII', character(), T, toRaw=F)) } Error: invalid 'sub' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', 'latin1', 'ASCII', character(), T, toRaw=T)) } Error: invalid 'sub' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', 'latin1', c('ASCII', 'ASCII'), '42', T, toRaw=F)) } Error: invalid 'to' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', 'latin1', c('ASCII', 'ASCII'), '42', T, toRaw=T)) } Error: invalid 'to' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', 'latin1', character(), '42', T, toRaw=F)) } Error: invalid 'to' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', 'latin1', character(), '42', T, toRaw=T)) } Error: invalid 'to' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', c('latin1', 'latin1'), 'ASCII', '42', T, toRaw=F)) } Error: invalid 'from' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', c('latin1', 'latin1'), 'ASCII', '42', T, toRaw=T)) } Error: invalid 'from' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', character(), 'ASCII', '42', T, toRaw=F)) } Error: invalid 'from' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv('7', character(), 'ASCII', '42', T, toRaw=T)) } Error: invalid 'from' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv(7, 'latin1', 'ASCII', '42', T, toRaw=F)) } Error: 'x' must be a character vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testIconv# #{ .Internal(iconv(7, 'latin1', 'ASCII', '42', T, toRaw=T)) } Error: 'x' must be a character vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testInternalIconvUsageWithNULL# #invisible(.Internal(iconv(NULL, '', '', '', TRUE, toRaw=F))) ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testInternalIconvUsageWithNULL# #invisible(.Internal(iconv(NULL, '', '', '', TRUE, toRaw=T))) ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testiconv1# #argv <- list('Report Information on C Stack Size and Usage', 'UTF-8', '', 'byte', FALSE, FALSE); .Internal(iconv(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] "Report Information on C Stack Size and Usage" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testiconv2# #argv <- list('façile' , 'latin1', 'ASCII', NA_character_, TRUE, FALSE); .Internal(iconv(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testiconv3# #argv <- list(c('% This file is part of the foreign package for R', '% It is distributed under the GPL version 2 or later', '', '\\name{S3 read functions}', '\\alias{data.restore}', '\\alias{read.S}', '\\title{Read an S3 Binary or data.dump File}', '\\description{', ' Reads binary data files or \\code{data.dump} files that were produced', ' in S version 3.', '}', '\\usage{', ' data.restore(file, print = FALSE, verbose = FALSE, env = .GlobalEnv)', ' read.S(file)', '}', '\\arguments{', ' \\item{file}{the filename of the S-PLUS \\code{data.dump} or binary', ' file.}', ' \\item{print}{whether to print the name of each object as read from the', ' file.}', ' \\item{verbose}{whether to print the name of every subitem within each', ' object.}', ' \\item{env}{environment within which to create the restored object(s).}', '}', '\\value{', ' For \\code{read.S}, an R version of the S3 object.', '', ' For \\code{data.restore}, the name of the file.', '}', '\\details{', ' \\code{read.S} can read the binary files produced in some older', ' versions of S-PLUS on either Windows (versions 3.x, 4.x, 2000) or Unix', ' (version 3.x with 4 byte integers). It automatically detects whether', ' the file was produced on a big- or little-endian machine and adapts', ' itself accordingly.', '', ' \\code{data.restore} can read a similar range of files produced by', ' \\code{data.dump} and for newer versions of S-PLUS, those from', ' \\code{data.dump(....., oldStyle=TRUE)}.', '', ' Not all S3 objects can be handled in the current version. The most', ' frequently encountered exceptions are functions and expressions; you', ' will also have trouble with objects that contain model formulas. In', ' particular, comments will be lost from function bodies, and the', ' argument lists of functions will often be changed.', '}', '\\author{', ' Duncan Murdoch', '}', '\\examples{', '\\dontrun{read.S(file.path(\'_Data\', \'myobj\'))', 'data.restore(\'dumpdata\', print = TRUE)', '}}', '\\keyword{data}', '\\keyword{file}'), '', 'ASCII', NA_character_, TRUE, FALSE); .Internal(iconv(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] "% This file is part of the foreign package for R" [2] "% It is distributed under the GPL version 2 or later" [3] "" [4] "\\name{S3 read functions}" [5] "\\alias{data.restore}" [6] "\\alias{read.S}" [7] "\\title{Read an S3 Binary or data.dump File}" [8] "\\description{" [9] " Reads binary data files or \\code{data.dump} files that were produced" [10] " in S version 3." [11] "}" [12] "\\usage{" [13] " data.restore(file, print = FALSE, verbose = FALSE, env = .GlobalEnv)" [14] " read.S(file)" [15] "}" [16] "\\arguments{" [17] " \\item{file}{the filename of the S-PLUS \\code{data.dump} or binary" [18] " file.}" [19] " \\item{print}{whether to print the name of each object as read from the" [20] " file.}" [21] " \\item{verbose}{whether to print the name of every subitem within each" [22] " object.}" [23] " \\item{env}{environment within which to create the restored object(s).}" [24] "}" [25] "\\value{" [26] " For \\code{read.S}, an R version of the S3 object." [27] "" [28] " For \\code{data.restore}, the name of the file." [29] "}" [30] "\\details{" [31] " \\code{read.S} can read the binary files produced in some older" [32] " versions of S-PLUS on either Windows (versions 3.x, 4.x, 2000) or Unix" [33] " (version 3.x with 4 byte integers). It automatically detects whether" [34] " the file was produced on a big- or little-endian machine and adapts" [35] " itself accordingly." [36] "" [37] " \\code{data.restore} can read a similar range of files produced by" [38] " \\code{data.dump} and for newer versions of S-PLUS, those from" [39] " \\code{data.dump(....., oldStyle=TRUE)}." [40] "" [41] " Not all S3 objects can be handled in the current version. The most" [42] " frequently encountered exceptions are functions and expressions; you" [43] " will also have trouble with objects that contain model formulas. In" [44] " particular, comments will be lost from function bodies, and the" [45] " argument lists of functions will often be changed." [46] "}" [47] "\\author{" [48] " Duncan Murdoch" [49] "}" [50] "\\examples{" [51] "\\dontrun{read.S(file.path('_Data', 'myobj'))" [52] "data.restore('dumpdata', print = TRUE)" [53] "}}" [54] "\\keyword{data}" [55] "\\keyword{file}" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testiconv4# #argv <- list(c('', 'Compute a Survival Curve for Censored Data'), 'UTF-8', '', 'byte', FALSE, FALSE); .Internal(iconv(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] "" [2] "Compute a Survival Curve for Censored Data" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testiconv5# #argv <- list(character(0), 'latin1', 'ASCII', NA_character_, TRUE, FALSE); .Internal(iconv(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testiconv6#Ignored.ImplementationError# #argv <- list(list(), 'latin1', 'ASCII', NA_character_, TRUE, FALSE); .Internal(iconv(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testiconv7# #argv <- list('façile' , 'latin1', 'ASCII', '', TRUE, FALSE); .Internal(iconv(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] "faile" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testiconv8# #argv <- list(structure('Prediction matrix for soap film smooth', Rd_tag = 'TEXT'), 'UTF-8', 'ASCII', NA_character_, FALSE, FALSE); .Internal(iconv(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] "Prediction matrix for soap film smooth" attr(,"Rd_tag") [1] "TEXT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_iconv.testiconv9# #argv <- list(structure(c('Q.1 Opinion of presidents job performance', 'Q.1 Opinion of presidents job performance', 'Q.1 Opinion of presidents job performance', 'Q.1 Opinion of presidents job performance', 'Q.1 Opinion of presidents job performance', 'Q.1 Opinion of presidents job performance', 'Q.1 Opinion of presidents job performance', 'Q.1 Opinion of presidents job performance', 'Q.1 Opinion of presidents job performance', 'Q.1 Opinion of presidents job performance'), .Names = c('Q1_MISSING_NONE', 'Q1_MISSING_1', 'Q1_MISSING_2', 'Q1_MISSING_3', 'Q1_MISSING_RANGE', 'Q1_MISSING_LOW', 'Q1_MISSING_HIGH', 'Q1_MISSING_RANGE_1', 'Q1_MISSING_LOW_1', 'Q1_MISSING_HIGH_1')), 'latin1', '', NA_character_, TRUE, FALSE); .Internal(iconv(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) Q1_MISSING_NONE "Q.1 Opinion of presidents job performance" Q1_MISSING_1 "Q.1 Opinion of presidents job performance" Q1_MISSING_2 "Q.1 Opinion of presidents job performance" Q1_MISSING_3 "Q.1 Opinion of presidents job performance" Q1_MISSING_RANGE "Q.1 Opinion of presidents job performance" Q1_MISSING_LOW "Q.1 Opinion of presidents job performance" Q1_MISSING_HIGH "Q.1 Opinion of presidents job performance" Q1_MISSING_RANGE_1 "Q.1 Opinion of presidents job performance" Q1_MISSING_LOW_1 "Q.1 Opinion of presidents job performance" Q1_MISSING_HIGH_1 "Q.1 Opinion of presidents job performance" ##com.oracle.truffle.r.test.builtins.TestBuiltin_icuSetCollate.testicuSetCollate1#Ignored.Unimplemented# # .Internal(icuSetCollate()) ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testAttrOrder# #x <- 1; y <- 1; attr(x, "f") <- 2; attr(x, "g") <- 1; attr(y, "g") <- 1; attr(y, "f") <- 2; identical(x, y) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=0, imaginary=0)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=0), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=0, imaginary=1)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=1), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=0, imaginary=Inf)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=Inf), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=0, imaginary=NaN)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=0, imaginary=NaN), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=1, imaginary=0)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=0), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=1, imaginary=1)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=1), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=1, imaginary=Inf)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=Inf), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=1, imaginary=NaN)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=1, imaginary=NaN), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=Inf, imaginary=0)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=0), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=Inf, imaginary=1)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=1), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=Inf, imaginary=Inf)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=Inf), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=Inf, imaginary=NaN)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=Inf, imaginary=NaN), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=NaN, imaginary=0)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=0), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=NaN, imaginary=1)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=1), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=NaN, imaginary=Inf)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=Inf), complex(real=NaN, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=0, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=0, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=0, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=0, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=1, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=1, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=1, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=1, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=Inf, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=Inf, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=Inf, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=Inf, imaginary=NaN)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=NaN, imaginary=0)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=NaN, imaginary=1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=NaN, imaginary=Inf)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testComplex# #identical(complex(real=NaN, imaginary=NaN), complex(real=NaN, imaginary=NaN)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/-1, NaN, num.eq=F, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/-1, NaN, num.eq=F, single.NA=T) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/-1, NaN, num.eq=T, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/-1, NaN, num.eq=T, single.NA=T) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/0, NA_real_, num.eq=F, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/0, NA_real_, num.eq=F, single.NA=T) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/0, NA_real_, num.eq=T, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/0, NA_real_, num.eq=T, single.NA=T) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/0, NaN, num.eq=F, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/0, NaN, num.eq=F, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/0, NaN, num.eq=T, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(0/0, NaN, num.eq=T, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(NA_real_, NA_real_, num.eq=F, single.NA=F) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(NA_real_, NA_real_, num.eq=F, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(NA_real_, NA_real_, num.eq=T, single.NA=F) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(NA_real_, NA_real_, num.eq=T, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(NaN, NaN, num.eq=F, single.NA=F) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(NaN, NaN, num.eq=F, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(NaN, NaN, num.eq=T, single.NA=F) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(NaN, NaN, num.eq=T, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/-1, 0/-1), c(NaN, NaN), num.eq=F, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/-1, 0/-1), c(NaN, NaN), num.eq=F, single.NA=T) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/-1, 0/-1), c(NaN, NaN), num.eq=T, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/-1, 0/-1), c(NaN, NaN), num.eq=T, single.NA=T) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/0, 0/0), c(NA_real_, NA_real_), num.eq=F, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/0, 0/0), c(NA_real_, NA_real_), num.eq=F, single.NA=T) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/0, 0/0), c(NA_real_, NA_real_), num.eq=T, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/0, 0/0), c(NA_real_, NA_real_), num.eq=T, single.NA=T) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/0, 0/0), c(NaN, NaN), num.eq=F, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/0, 0/0), c(NaN, NaN), num.eq=F, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/0, 0/0), c(NaN, NaN), num.eq=T, single.NA=F) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(0/0, 0/0), c(NaN, NaN), num.eq=T, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(NA_real_, NA_real_), c(NA_real_, NA_real_), num.eq=F, single.NA=F) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(NA_real_, NA_real_), c(NA_real_, NA_real_), num.eq=F, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(NA_real_, NA_real_), c(NA_real_, NA_real_), num.eq=T, single.NA=F) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(NA_real_, NA_real_), c(NA_real_, NA_real_), num.eq=T, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(NaN, NaN), c(NaN, NaN), num.eq=F, single.NA=F) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(NaN, NaN), c(NaN, NaN), num.eq=F, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(NaN, NaN), c(NaN, NaN), num.eq=T, single.NA=F) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testDoubles# #identical(c(NaN, NaN), c(NaN, NaN), num.eq=T, single.NA=T) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #a <- quote(a(100)); b <- quote(a(100)); attr(a[[2]], 'foo') <- 'bar'; b[[2]] <- a[[2]]; identical(a,b) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #a <- quote(a(100)); b <- quote(a(100)); attr(a[[2]], 'foo') <- 'bar'; identical(a,b) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #a <- quote(a(100)); b <- quote(a(100)); attr(b[[2]], 'foo') <- 'bar'; attr(a[[2]], 'foo') <- 'bar'; identical(a,b) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #a <- quote(a(100)); b <- quote(a(100)); attr(b[[2]], 'foo') <- 'baz'; attr(a[[2]], 'foo') <- 'bar'; identical(a,b) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #a <- quote(a(100)); b <- quote(a(100)); identical(a,b) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #a <- quote(a(100)); b <- quote(a(101)); identical(a,b) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #e1 <- quote(a+1); e2 <- quote(a+2); identical(e1, e2); e2[[3]] <- c(1,2,3); identical(e1, e2); e1[[3]] <- c(1,2,3); identical(e1, e2); attr(e2[[3]], 'foo') <- 'bar'; identical(e1, e2) [1] FALSE [1] FALSE [1] TRUE [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #identical(as.expression(list(quote(a), 33)), as.expression(list(quote(a), 33))) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #identical(as.expression(list(quote(a), 33)), list(quote(a), 33)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #identical(as.expression(quote(a)), list(quote(a))) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #identical(list(quote(a), 33), list(quote(a), 33)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #identical(list(quote(a), 33), list(quote(a), 33, 42L)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #identical(list(quote(a), 33), list(quote(a), 33L)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #identical(pairlist(1, pairlist('foo')), pairlist(1, pairlist('bar'))) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ f1 <- function() {}; f2 <- function() {}; identical(f1, f2) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ f1<-function(x=1) 42; f2<-function(x=1) 7; identical(formals(f1), formals(f2)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ f1<-function(x=1) 42; f2<-function(x=2) 7; identical(formals(f1), formals(f2)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ identical(0/0,1[2]) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ identical(1,1) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ identical(1:3, c(1L,2L,3L)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ identical(1L,1) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ identical(function() 42, function() 42) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ identical(list(1, list(2)), list(1, list(2))) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ identical(list(1, list(2)), list(list(1), 1)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ identical(quote(if(x) 42), quote(if(x) 42)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ identical(quote(if(x) 42), quote(if(x) 7)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ setClass("c", representation(d="numeric")); x<-new("c", d=42); attr(x, "foo")<-"foo"; y<-new("c", d=42); attr(y, "bar")<-"bar"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ setClass("c", representation(d="numeric")); x<-new("c", d=42); attr(x, "foo")<-"foo"; y<-new("c", d=42); attr(y, "bar")<-"foo"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ setClass("c", representation(d="numeric")); x<-new("c", d=42); attr(x, "foo")<-"foo"; y<-new("c", d=42); attr(y, "foo")<-"bar"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ setClass("c", representation(d="numeric")); x<-new("c", d=42); attr(x, "foo")<-"foo"; y<-new("c", d=42); attr(y, "foo")<-"foo"; identical(x, y) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ setClass("c", representation(d="numeric")); x<-new("c", d=42); attr(x, "foo")<-"foo"; y<-new("c", d=42); identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ setClass("foo", representation(j="numeric")); x<-new("foo", j=42); y<-new("foo", j=42); identical(x,y) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ setClass("foo", representation(j="numeric")); x<-new("foo", j=42); y<-new("foo", j=7); identical(x,y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x <- 1 ; attr(x, "hello") <- 2 ; attr(x, "my") <- 10; attr(x, "hello") <- NULL ; y <- 1 ; attr(y, "my") <- 10 ; identical(x,y) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x <- 1 ; attr(x, "my") <- 10; identical(x, 1) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x <- 1 ; attr(x, "my") <- 10; y <- 1 ; attr(y, "my") <- 10 ; identical(x,y) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x <- 1 ; attr(x, "my") <- 10; y <- 1 ; attr(y, "my") <- 11 ; identical(x,y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-42; attr(x, "foo")<-"foo"; y<-42; attr(y, "bar")<-"bar"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-42; attr(x, "foo")<-"foo"; y<-42; attr(y, "bar")<-"foo"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-42; attr(x, "foo")<-"foo"; y<-42; attr(y, "foo")<-"bar"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-42; attr(x, "foo")<-"foo"; y<-42; attr(y, "foo")<-"foo"; identical(x, y) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-42; attr(x, "foo")<-"foo"; y<-42; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-expression(1 + 0:9); y<-expression(1 + 0:9); identical(x, y) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-list(42); attr(x, "foo")<-"foo"; y<-list(42); attr(y, "bar")<-"bar"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-list(42); attr(x, "foo")<-"foo"; y<-list(42); attr(y, "bar")<-"foo"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-list(42); attr(x, "foo")<-"foo"; y<-list(42); attr(y, "foo")<-"bar"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-list(42); attr(x, "foo")<-"foo"; y<-list(42); attr(y, "foo")<-"foo"; identical(x, y) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-list(42); attr(x, "foo")<-"foo"; y<-list(42); identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-list(7); y<-list(42); identical(x,y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-list(7); y<-list(7); identical(x,y) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-list(list(7)); y<-list(list(42)); identical(x,y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-list(list(7)); y<-list(list(7)); identical(x,y) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-quote(f()); attr(x, "foo")<-"foo"; y<-quote(f()); attr(y, "bar")<-"bar"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-quote(f()); attr(x, "foo")<-"foo"; y<-quote(f()); attr(y, "bar")<-"foo"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-quote(f()); attr(x, "foo")<-"foo"; y<-quote(f()); attr(y, "foo")<-"bar"; identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-quote(f()); attr(x, "foo")<-"foo"; y<-quote(f()); attr(y, "foo")<-"foo"; identical(x, y) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testIdentical# #{ x<-quote(f()); attr(x, "foo")<-"foo"; y<-quote(f()); identical(x, y) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical1# #argv <- list('oats[-1, ]', 'newdata', TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical10# #argv <- list(complex(0), complex(0), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical11# #argv <- list(NULL, '\\link', TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical12# #argv <- list(c(TRUE, TRUE, NA), c(TRUE, TRUE, NA), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical13# #argv <- list(NA_complex_, NA_complex_, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical14# #argv <- list(structure(c(1, 1, 1, 1, 2, 3), .Dim = c(3L, 2L), .Dimnames = list(NULL, c('I', 'a')), foo = 'bar', class = 'matrix'), structure(c(1, 1, 1, 1, 2, 3), .Dim = c(3L, 2L), class = 'matrix', foo = 'bar', .Dimnames = list(NULL, c('I', 'a'))), TRUE, TRUE, FALSE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical15# #argv <- list(structure(list(x = 1L), .Names = 'x', row.names = c(NA, -1L), class = 'data.frame'), structure(list(x = 1L), .Names = 'x', row.names = c(NA, -1L), class = 'data.frame'), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical16# #argv <- list(structure(c(1L, 1L, 1L), .Label = c('1', '2'), class = 'factor'), structure(list(f = structure(c(1L, 1L, 1L), .Label = c('1', '2'), class = 'factor'), u = structure(12:14, unit = 'kg', class = 'avector')), .Names = c('f', 'u'), row.names = 2:4, class = 'data.frame'), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical17# #argv <- list(raw(0), raw(0), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical18# #argv <- list(c(1, 1, 0.5, 1, 1, 1, 1, 1, 0, 0, 0.5, 1, 0, 1, 0, 1, 0.5, 1, NA, 0.75, 0.5, 0, 0.5, 0.5, 0.666666666666667, 0.666666666666667, 1, 1, 0.666666666666667, 1, 0.666666666666667, 0.666666666666667, 0.333333333333333, 0.5, 1, 0, 1, 0.5, 1, 1, 1, 0, 1, 0.5, 1, 1, 0.5, 1, 1, 1, 0.5, 1, 1, NA, 0.5), c(1, 1, 0.5, 1, 1, 1, 1, 1, 0, 0, 0.5, 1, 0, 1, 0, 1, 0.5, 1, NA, 0.75, 0.5, 0, 0.5, 0.5, 0.666666666666667, 0.666666666666667, 1, 1, 0.666666666666667, 1, 0.666666666666667, 0.666666666666667, 0.333333333333333, 0.5, 1, 0, 1, 0.5, 1, 1, 1, 0, 1, 0.5, 1, 1, 0.5, 1, 1, 1, 0.5, 1, 1, NA, 0.5), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical19# #argv <- list(c(0.0804034870161223, 10.3548347412639), structure(list(loc = c(0.0804034870161223, 10.3548347412639), cov = structure(c(3.01119301965569, 6.14320559215603, 6.14320559215603, 14.7924762275451), .Dim = c(2L, 2L)), d2 = 2, wt = c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0), sqdist = c(0.439364946869246, 0.0143172566761092, 0.783644692619938, 0.766252947443554, 0.346865912102713, 1.41583192825661, 0.168485512965902, 0.354299830956879, 0.0943280426627965, 1.05001058449122, 1.02875556201707, 0.229332323173361, 0.873263925064789, 2.00000009960498, 0.449304354954282, 0.155023307933165, 0.118273979375253, 0.361693898800799, 0.21462398586105, 0.155558909016629, 0.471723661454506, 0.719528696331092, 0.0738164380664225, 1.46001193111051, 0.140785322548143, 0.127761195166703, 0.048012401156175, 0.811750426884519, 0.425827709817574, 0.163016638545231, 0.557810866640707, 0.277350147637843, 0.0781399119055092, 1.29559183995835, 0.718376405567138, 1.37650242941478, 0.175087780508154, 0.233808973148729, 0.693473805463067, 0.189096604125073, 1.96893781800017, 0.4759756980592, 1.69665760380474, 0.277965749373647, 0.920525436884815, 0.57525234053591, 1.59389578665009, 0.175715364671313, 0.972045794851437, 1.75514684962809, 0.0597413185507202, 0.174340343040626, 0.143421553552865, 0.997322770596838, 1.94096736957465, 2.00000001159796, 0.367000821772989, 0.682474530588235, 1.20976163307984, 1.27031685239035, 1.79775635513363, 0.0857761902860323, 0.435578932929501, 0.214370604878221, 0.494714247412686, 1.78784623754399, 1.24216674083069, 1.87749485326709, 0.0533296334123023, 1.45588362584438, 2.00000000631459, 0.208857144738039, 0.119251291573058, 0.365303924649962, 0.690656674239668, 0.0396958405786268, 0.258262120876164, 1.57360254057537, 0.307548421049514, 0.628417063100241, 1.00647098749202, 0.297624360530352, 0.400289147351669, 1.98298426250944, 0.129127182829694, 0.0794695319493149, 0.991481735944321, 0.444068154119836, 0.206790162395106, 0.574310829851377, 0.181887577583334, 0.433872021297517, 0.802994892604009, 0.293053770941001, 1.7002969001965, 0.77984639982848, 1.36127407487932, 0.761935213110323, 0.597915313430067, 0.237134831067472), prob = NULL, tol = 1e-07, eps = 9.96049758228423e-08, it = 898L, maxit = 5000, ierr = 0L, conv = TRUE), .Names = c('loc', 'cov', 'd2', 'wt', 'sqdist', 'prob', 'tol', 'eps', 'it', 'maxit', 'ierr', 'conv'), class = 'ellipsoid'), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical2# #argv <- list(structure(c(NA, 2, NA, 1, NA, 0), .Dim = 2:3), structure(c(NA, 2, NA, 1, NA, 0), .Dim = 2:3), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical20# #argv <- list(NaN, NaN, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical21# #argv <- list(c('«', '»', '¿', '?'), 'TeX', TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical22# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')), 42, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical23# #argv <- list(c(3L, 3L, NA, 3L), c(3L, 3L, NA, 3L), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical24# #argv <- list(list(c('r1', 'r3', 'r4', 'r5', 'r6', 'r7', 'r8', 'r9', 'r10', 'r11', 'r12', 'r13', 'r14', 'r15', 'r16', 'r17', 'r18', 'r19', 'r20', 'r21', 'r22', 'r23', 'r24', 'r25', 'r26', 'r27', 'r28', 'r29', 'r30', 'r31', 'r32', 'r33', 'r34', 'r35', 'r36', 'r37', 'r38', 'r39', 'r40'), c('c1', 'c2', 'c3', 'c4', 'c5', 'c6', 'c7', 'c8', 'c9', 'c10', 'c11', 'c12', 'c13', 'c14', 'c15', 'c16', 'c17', 'c18', 'c19', 'c20')), list(character(0), character(0)), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical25# #argv <- list(c('object', NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), c('object', NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical26# #argv <- list(3.04888344611714e+29, 3.04888344611714e+29, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical27# #argv <- list(structure('BunchKaufman', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), structure('Matrix', .Names = 'x', package = 'Matrix', class = structure('signature', package = 'methods')), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical28#Ignored.Unstable# #argv <- list(structure(list(x = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1), y = c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10), fac = structure(c(1L, 3L, 2L, 3L, 3L, 1L, 2L, 3L, 2L, 2L), .Label = c('A', 'B', 'C'), class = 'factor')), .Names = c('x', 'y', 'fac'), row.names = c(NA, -10L), class = 'data.frame'), structure(list(x = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1), y = c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10), fac = structure(c(1L, 3L, 2L, 3L, 3L, 1L, 2L, 3L, 2L, 2L), .Label = c('A', 'B', 'C'), class = 'factor')), .Names = c('x', 'y', 'fac'), row.names = c(NA, 10L), class = 'data.frame'), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical29# #argv <- list(c('1', '2', NA), c('1', '2', NA), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical3# #argv <- list(structure(c('dgTMatrix', 'matrix.coo'), .Names = c('from', 'to'), package = c('Matrix', ''), class = structure('signature', package = 'methods')), structure(c('dgTMatrix', 'matrix.coo'), .Names = c('from', 'to'), package = c('Matrix', ''), class = structure('signature', package = 'methods')), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical30# #argv <- list(c(-9.42477796076938, -6.28318530717959, -3.14159265358979, 0, 3.14159265358979, 6.28318530717959, 9.42477796076938, 12.5663706143592, 15.707963267949, 18.8495559215388), c(-9.42477796076938, -6.28318530717959, -3.14159265358979, 0, 3.14159265358979, 6.28318530717959, 9.42477796076938, 12.5663706143592, 15.707963267949, 18.8495559215388), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical31# #argv <- list(structure('classGeneratorFunction', package = 'methods'), structure('classGeneratorFunction', package = 'methods'), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical32# #argv <- list(structure(function (x) standardGeneric('cosh', .Primitive('cosh')), generic = structure('cosh', package = 'base'), package = 'base', group = list('Math'), valueClass = character(0), signature = 'x', default = .Primitive('cosh'), skeleton = quote(.Primitive('cosh')(x)), class = structure('standardGeneric', package = 'methods')), FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical33# #argv <- list(structure(1L, match.length = 8L, useBytes = TRUE), structure(1L, match.length = 8L, useBytes = TRUE), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical35# #argv <- structure(list(x = expression(exp(-0.5 * u^2)), y = expression(exp(-0.5 * u^2))), .Names = c('x', 'y'));do.call('identical', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical36# #argv <- structure(list(x = structure(list(X1.4 = 1:4), .Names = 'X1.4', row.names = c(NA, -4L), class = 'data.frame'), y = structure(list(X1.4 = 1:4), .Names = 'X1.4', row.names = c('1', '2', '3', '4'), class = 'data.frame')), .Names = c('x', 'y'));do.call('identical', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical37# #argv <- structure(list(x = structure(list(a = NA, b = NA_integer_, c = NA_real_, d = NA_complex_, e = 1, f = 1L, g = 1:3, h = c(NA, 1L, 2L, 3L), i = NA_character_, j = c('foo', NA, 'bar')), .Names = c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j')), y = structure(list(a = NA, b = NA_integer_, c = NA_real_, d = NA_complex_, e = 1, f = 1L, g = 1:3, h = c(NA, 1L, 2L, 3L), i = NA_character_, j = c('foo', NA, 'bar')), .Names = c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j'))), .Names = c('x', 'y'));do.call('identical', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical4# #argv <- list(structure(3.14159265358979, comment = 'Start with pi', class = structure('num1', package = '.GlobalEnv')), structure(3.14159265358979, comment = 'Start with pi', class = structure('num1', package = '.GlobalEnv')), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical5# #argv <- list(structure(list(a = 1), .Dim = 1L, .Dimnames = list('a')), structure(list(a = 1), .Dim = 1L, .Dimnames = list('a')), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical6# #argv <- list(structure(list(), .Names = character(0), row.names = integer(0), class = 'data.frame'), structure(list(), .Names = character(0), row.names = integer(0), class = 'data.frame'), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical7# #argv <- list(c(-1.38507061859438+0.31833672642477i, 0.0383231810219-1.42379885362755i, -0.763030162361974-0.405090858049187i, 0.212306135525839+0.995386565684023i, 1.42553796686779+0.95881778764026i, 0.744479822333976+0.918087896319951i, 0.70022940298623-0.15096960188161i, -0.22935461345173-1.2230687888662i, 0.197093861895352-0.868824288637794i, 1.20715377387226-1.04248536490429i), c(-1.38507061859438+0.31833672642477i, 0.0383231810219-1.42379885362755i, -0.763030162361974-0.405090858049187i, 0.212306135525839+0.995386565684023i, 1.42553796686779+0.95881778764026i, 0.744479822333976+0.918087896319951i, 0.70022940298623-0.15096960188161i, -0.22935461345173-1.2230687888662i, 0.197093861895352-0.868824288637794i, 1.20715377387226-1.04248536490429i), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical8# #argv <- list(structure(list(a = 1), .Names = 'a', .Tsp = c(1, 1, 1), class = 'ts'), structure(list(a = 1), .Names = 'a', .Tsp = c(1, 1, 1), class = 'ts'), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_identical.testidentical9# #argv <- list(c(TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE), c(TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE), TRUE, TRUE, TRUE, TRUE, FALSE, TRUE); .Internal(identical(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ifelse.testIfelse# #{ ifelse(FALSE,1,0) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ifelse.testIfelse# #{ ifelse(NA,1,0) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_ifelse.testIfelse# #{ ifelse(TRUE,1,0) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ifelse.testifelse1# #argv <- structure(list(test = c(TRUE, TRUE, FALSE, TRUE, FALSE), yes = 'True', no = 'False'), .Names = c('test', 'yes', 'no'));do.call('ifelse', argv) [1] "True" "True" "False" "True" "False" ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #inherits(1L, 'double') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #inherits(1L, 'numeric') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #inherits(NULL, 'NULL') [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ e <- new.env(); class(e)<-"abc"; inherits(e, "abc") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ e <- new.env(); inherits(e, "abc") } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ e <- new.env(); inherits(e, "environment") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ f <- function() { }; class(f)<-"abc"; inherits(f, "abc") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ f <- function() { }; inherits(f, "abc") } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ f <- function() { }; inherits(f, "function") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ inherits(NULL, "try-error") } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ inherits(getClass("ClassUnionRepresentation"), "classRepresentation") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ inherits(new.env(), "try-error") } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ inherits(textConnection("abc"), "connection") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ x<-data.frame(c(1,2)); inherits(x, "data.frame") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{ x<-factor("a", "b", "a"); inherits(x, "factor") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{x <- 10; inherits(x, "a") ;} [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{x <- 10;class(x) <- c("a");inherits(x, c("a", "b", "a"), TRUE) ;} [1] 1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{x <- 10;class(x) <- c("a", "b"); inherits(x,"a") ;} [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{x <- 10;class(x) <- c("a", "b");inherits(x, "a", 1) ;} Error in inherits(x, "a", 1) : 'which' must be a length 1 logical vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{x <- 10;class(x) <- c("a", "b");inherits(x, "a", TRUE) ;} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{x <- 10;class(x) <- c("a", "b");inherits(x, "a", c(TRUE)) ;} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{x <- 10;class(x) <- c("a", "b");inherits(x, 2, c(TRUE)) ;} Error in inherits(x, 2, c(TRUE)) : 'what' must be a character vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{x <- 10;class(x) <- c("a", "b");inherits(x, c("a", "b", "c"), TRUE) ;} [1] 1 2 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{x <- 10;class(x) <- c("a", "b");inherits(x, c("c", "q", "b")) ;} [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testInherits# #{x <- 10;class(x) <- c("a", "b");inherits(x, c("c", "q", "b"), TRUE) ;} [1] 0 0 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits1# #argv <- list(structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), .Names = c('dtrMatrix', 'MatrixFactorization', 'ddenseMatrix', 'triangularMatrix', 'dMatrix', 'denseMatrix', 'Matrix', 'mMatrix')), 'factor', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits10# #argv <- list(structure(c(3+2i, 3+2i, NA, 3+2i, 3+2i, 3+2i, 3+2i, 3+2i, 4-5i, 3-5i, NA, NA, 2-5i, 3-5i, 4-5i, 5-5i), .Dim = c(8L, 2L), .Dimnames = list(NULL, c('x1', 'x2'))), 'data.frame', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits11# #argv <- list(structure(list(srcfile = '/home/lzhao/hg/r-instrumented/library/stats/R/stats', frow = 853L, lrow = 853L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L), class = 'data.frame'), 'data.frame', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits12# #argv <- list(quote(y ~ a + b:c + d + e + e:d), 'formula', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits13# #argv <- list(structure(10, class = c('a', 'b')), c('a', 'b', 'c'), TRUE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits14# #argv <- list(complex(0), 'try-error', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits15# #argv <- list(structure(FALSE, .Tsp = c(0, 0, 1), class = 'ts'), 'ts', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits16# #argv <- list(structure(list(a = 1), .Dim = 1L, .Dimnames = list('a')), 'try-error', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits17# #argv <- list(raw(0), 'try-error', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits18# #argv <- list(structure(c(-1.5116089581734, 0.200010507218348, 0.266001075015567, 0.339550302820724, 0.425045882083188, 0.496549005782181, 0.576998440511346, -0.909988579721932, -1.06576984591386, 0.174059431391812, -0.0372498129362256, -0.282881300668478, -0.488312023557303, -0.719445779363312), gradient = structure(c(0.160743714207466, 0.251172444221428, 0.307513919261763, 0.350467096622222, 0.367731527586793, 0.346345778958899, 0.262925702855199, -0.160743714207466, -0.251172444221428, -0.307513919261763, -0.350467096622222, -0.367731526984617, -0.346345778958899, -0.262925703156287), .Dim = c(7L, 2L, 1L)), .Dim = c(7L, 2L)), 'data.frame', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits19# #argv <- list(structure(3.14159265358979, comment = 'Start with pi'), 'try-error', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits2# #argv <- list(structure(list(x = numeric(0), y = numeric(0), fac = structure(integer(0), .Label = c('A', 'B', 'C'), class = 'factor')), .Names = c('x', 'y', 'fac'), row.names = integer(0), class = 'data.frame'), 'data.frame', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits20# #argv <- list(c(TRUE, NA, FALSE, TRUE), 'Date', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits21# #argv <- list(c(-1, 1, -1, 2, 1, NA, -1, 1, 4, 1, NA, 4, 1, 3, NA, 4, 2, 2, NA, 4, 4, 2, 4, 4, 2, 1, 4, 4, 3, 1, 1, 4, 1, 4, NA, 1, 4, 4, 2, 2, 4, 4, 3, 4, 2, 2, 3, 3, 4, 1, 1, 1, 4, 1, 4, 4, 4, 4, NA, 4, 4, 4, NA, 1, 2, 3, 4, 3, 4, 2, 4, 4, 1, 4, 1, 4, NA, 4, 2, 1, 4, 1, 1, 1, 4, 4, 2, 4, 1, 1, 1, 4, 1, 1, 1, 4, 3, 1, 4, 3, 2, 4, 3, 1, 4, 2, 4, NA, 4, 4, 4, 2, 1, 4, 4, NA, 2, 4, 4, 1, 1, 1, 1, 4, 1, 2, 3, 2, 1, 4, 4, 4, 1, NA, 4, 2, 2, 2, 4, 4, 3, 3, 4, 2, 4, 3, 1, 1, 4, 2, 4, 3, 1, 4, 3, 4, 4, 1, 1, 4, 4, 3, 1, 1, 2, 1, 3, 4, 2, 2, 2, 4, 4, 3, 2, 1, 1, 4, 1, 1, 2, NA, 2, 3, 3, 2, 1, 1, 1, 1, 4, 4, 4, 4, 4, 4, 2, 2, 1, 4, 1, 4, 3, 4, 2, 3, 1, 3, 1, 4, 1, 4, 1, 4, 3, 3, 4, 4, 1, NA, 3, 4, 4, 4, 4, 4, 4, 3, 4, 3, 4, 2, 4, 4, 1, 2, NA, 4, 4, 4, 4, 1, 2, 1, 1, 2, 1, 4, 2, 3, 1, 4, 4, 4, 1, 2, 1, 4, 2, 1, 3, 1, 2, 2, 1, 2, 1, NA, 3, 2, 2, 4, 1, 4, 4, 2, 4, 4, 4, 2, 1, 4, 2, 4, 4, 4, 4, 4, 1, 3, 4, 3, 4, 1, NA, 4, NA, 1, 1, 1, 4, 4, 4, 4, 2, 4, 3, 2, NA, 1, 4, 4, 3, 4, 4, 4, 2, 4, 2, 1, 4, 4, NA, 4, 4, 3, 3, 4, 2, 2, 4, 1, 4, 4, 4, 3, 4, 4, 4, 3, 2, 1, 3, 1, 4, 1, 4, 2, NA, 1, 4, 4, 3, 1, 4, 1, 4, 1, 4, 4, 1, 2, 2, 1, 4, 1, 1, 4, NA, 4, NA, 4, 4, 4, 1, 4, 2, 1, 2, 2, 2, 2, 1, 1, 2, 1, 4, 2, 3, 3, 1, 3, 1, 4, 1, 3, 2, 2, 4, 1, NA, 3, 4, 2, 4, 4, 4, 4, 4, 4, 3, 4, 4, 3, 2, 1, 4, 4, 2, 4, 2, 1, 2, 1, 1, 1, 1, 4, 4, 1, 1, 4, 1, 4, 4, 4, 1, 1, NA, 3, 2, 4, 4, 4, 4, 2, 3, 3, 2, NA, 4, 2, 4, 4, 1, 1, 4, 4, 1, 1, 4, 1, 2, 2, 2, 2, 1, 4, 4, 1, 2, 2, 2, 3, 4, 4, 3, 4, 1, 1, 4, 4, NA, 4, 1, 4, 4, 4, 1, 4, 4, 1, 2, 4, 4, 4, 4, 1, 2, 4, 4, 2, 1, 4, 2, 4, 2, 2, 4, 1, 3, 3, 2, 4, 1, 4, 4, 4, 1, NA, 4, 4, 2, 4, 4, 4, 4, 4, 2, NA, 4, 2, 4, 3, 1, 4, 4, 3, 4, 2, 4, 4, 1, 2, 1, 4, 1, 3, 3, 1, 4, 4, 2, 4, 4, 4, 4, 3, 2, 3, 3, 2, NA, 3, 4, 4, 3, 3, 4, 4, 4, 1, 4, 4, 4, 4, 4, 4, 4, 2, 4, 2, 3, 4, 1, 3, 1, NA, 4, 1, 2, 2, 1, 4, 3, 3, 4, 1, 1, 3), 'Date', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits22# #argv <- list(.Primitive('['), 'try-error', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits23# #argv <- list(structure(c(0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96, 97, 98, 99, 100, 0, 10, 20, 30, 40, 50, 60, 70, 80, 90, 100, 110, 120, 130, 140, 150, 160, 170, 180, 190, 200, 210, 220, 230, 240, 250, 260, 270, 280, 290, 300, 310, 320, 330, 340, 350, 360, 370, 380, 390, 400, 410, 420, 430, 440, 450, 460, 470, 480, 490, 500, 510, 520, 530, 540, 550, 560, 570, 580, 590, 600, 610, 620, 630, 640, 650, 660, 670, 680, 690, 700, 710, 720, 730, 740, 750, 760, 770, 780, 790, 800, 810, 820, 830, 840, 850, 860, 870, 880, 890, 900, 910, 920, 930, 940, 950, 960, 970, 980, 990, 1000, -4, -3, -2, -1, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96), .Dim = c(101L, 3L), .Dimnames = list(NULL, c('t1', '10 * t1', 't1 - 4')), .Tsp = c(1, 101, 1), class = c('mts', 'ts', 'matrix')), 'ts', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits24# #argv <- list(c(10000, 20000, 30000, 40000, 50000, 60000, 70000, 80000, 90000, 1e+05, 110000, 120000, 130000, 140000, 150000, 160000, 170000, 180000, 190000, 2e+05, 210000, 220000, 230000, 240000, 250000, 260000, 270000, 280000, 290000, 3e+05, 310000, 320000, 330000, 340000, 350000, 360000, 370000, 380000, 390000, 4e+05, 410000, 420000, 430000, 440000, 450000, 460000, 470000, 480000, 490000, 5e+05, 510000, 520000, 530000, 540000, 550000, 560000, 570000, 580000, 590000, 6e+05, 610000, 620000, 630000, 640000, 650000, 660000, 670000, 680000, 690000, 7e+05, 710000, 720000, 730000, 740000, 750000, 760000, 770000, 780000, 790000, 8e+05, 810000, 820000, 830000, 840000, 850000, 860000, 870000, 880000, 890000, 9e+05, 910000, 920000, 930000, 940000, 950000, 960000, 970000, 980000, 990000, 1e+06), 'POSIXlt', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits25# #argv <- list(structure(list(srcfile = c('/home/lzhao/hg/r-instrumented/library/grid/R/grid', '/home/lzhao/hg/r-instrumented/library/grid/R/grid'), frow = 3581:3582, lrow = c(3581L, 3590L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2, class = 'data.frame'), 'data.frame', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits26# #argv <- list(' Running ‘scales.R’', 'condition', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits27# #argv <- list(c(0.923879532511287+0.38268343236509i, 0.707106781186548+0.707106781186547i, 0.38268343236509+0.923879532511287i, 0+1i, -0.38268343236509+0.923879532511287i, -0.707106781186547+0.707106781186548i, -0.923879532511287+0.38268343236509i, -1+0i, -0.923879532511287-0.38268343236509i, -0.707106781186548-0.707106781186547i, -0.38268343236509-0.923879532511287i, 0-1i, 0.38268343236509-0.923879532511287i, 0.707106781186547-0.707106781186548i, 0.923879532511287-0.38268343236509i, 1-0i), 'ts', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits28# #argv <- list(structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), 'try-error', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits29# #argv <- list(structure(c(11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30), .Tsp = c(1960.08333333333, 1961.66666666667, 12), class = 'ts'), 'ts', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits3# #argv <- list(structure(c(2, 3, 4, 5, 6, 7, 8, 9, 10, 11), .Tsp = c(2, 11, 1)), 'data.frame', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits30# #argv <- list(structure(list(coefficients = numeric(0), residuals = structure(c(-0.667819876370237, 0.170711734013213, 0.552921941721332, -0.253162069270378, -0.00786394222146348, 0.0246733498130512, 0.0730305465518564, -1.36919169254062, 0.0881443844426084, -0.0834190388782434), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), fitted.values = structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), weights = NULL, rank = 0L, df.residual = 10L, call = quote(lm(formula = y ~ 0)), terms = quote(y ~ 0), model = structure(list(y = c(-0.667819876370237, 0.170711734013213, 0.552921941721332, -0.253162069270378, -0.00786394222146348, 0.0246733498130512, 0.0730305465518564, -1.36919169254062, 0.0881443844426084, -0.0834190388782434)), .Names = 'y', terms = quote(y ~ 0), row.names = c(NA, 10L), class = 'data.frame')), .Names = c('coefficients', 'residuals', 'fitted.values', 'weights', 'rank', 'df.residual', 'call', 'terms', 'model'), class = 'lm'), 'lm', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits31# #argv <- list(structure(c(-0.562441486309934, -0.588967592535822, 0.0277608937997097, 0.568074124752969, 3.89980510825846, -0.428174866497729, -0.343990813420242, -0.260996370058754, -2.31774610938305, 0.314764947225063, -0.455124436264437, -0.0444006414474544, -0.27748974692001, -0.303134023269405, -0.670168347915028, 2.92643313367, -0.749546667806845, -0.410394401887929, -0.203261263063707, 0.1847365997012, 0.128559671155683, 0.313558179929332, -0.0668425264405297, -0.106427678524531, -0.523747793519006, -0.402585404761851, 0.0642079595716389, -0.779859286629166, 0.356484381211739, -0.625053119472271, 1.31547628490512, -0.21959878152752, -0.102402088986461), .Names = c('Craig Dunain', 'Ben Rha', 'Ben Lomond', 'Goatfell', 'Bens of Jura', 'Cairnpapple', 'Scolty', 'Traprain', 'Lairig Ghru', 'Dollar', 'Lomonds', 'Cairn Table', 'Eildon Two', 'Cairngorm', 'Seven Hills', 'Knock Hill', 'Black Hill', 'Creag Beag', 'Kildcon Hill', 'Meall Ant-Suidhe', 'Half Ben Nevis', 'Cow Hill', 'N Berwick Law', 'Creag Dubh', 'Burnswark', 'Largo Law', 'Criffel', 'Acmony', 'Ben Nevis', 'Knockfarrel', 'Two Breweries', 'Cockleroi', 'Moffat Chase')), 'factor', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits32# #argv <- list(quote(breaks ~ (wool + tension) - tension), 'formula', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits34# #argv <- structure(list(x = structure(c(1412799280.04908, 1412799280.04908), class = c('POSIXct', 'POSIXt')), what = 'POSIXt'), .Names = c('x', 'what'));do.call('inherits', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits4# #argv <- list(structure(list(Sepal.Length = c(4.7, 4.8, 5.4, 5.2, 5.5, 4.9, 5, 5.5, 4.9, 4.4, 5.1, 5, 4.5, 4.4, 5, 5.1, 4.8, 5.1, 4.6, 5.3, 5, 7, 6.4, 6.9, 5.5, 6.5, 5.7, 6.3, 4.9, 6.6, 5.2, 5, 5.9, 6, 6.1, 5.6, 6.7, 5.6, 5.8, 6.2, 5.6, 5.9, 6.1, 6.3, 6.1, 6.4, 6.6, 6.8, 6.7, 6, 5.7, 5.5, 5.5, 5.8, 6, 5.4, 6, 6.7, 6.3, 5.6, 5.5, 5.5, 6.1, 5.8, 5, 5.6, 5.7, 5.7, 6.2, 5.1, 5.7, 6.3, 5.8, 7.1, 6.3, 6.5, 7.6, 4.9, 7.3, 6.7, 7.2, 6.5, 6.4, 6.8, 5.7, 5.8, 6.4, 6.5, 7.7, 7.7, 6, 6.9, 5.6, 7.7, 6.3, 6.7, 7.2, 6.2, 6.1, 6.4, 7.2), Sepal.Width = c(3.2, 3.1, 3.4, 4.1, 4.2, 3.1, 3.2, 3.5, 3.6, 3, 3.4, 3.5, 2.3, 3.2, 3.5, 3.8, 3, 3.8, 3.2, 3.7, 3.3, 3.2, 3.2, 3.1, 2.3, 2.8, 2.8, 3.3, 2.4, 2.9, 2.7, 2, 3, 2.2, 2.9, 2.9, 3.1, 3, 2.7, 2.2, 2.5, 3.2, 2.8, 2.5, 2.8, 2.9, 3, 2.8, 3, 2.9, 2.6, 2.4, 2.4, 2.7, 2.7, 3, 3.4, 3.1, 2.3, 3, 2.5, 2.6, 3, 2.6, 2.3, 2.7, 3, 2.9, 2.9, 2.5, 2.8, 3.3, 2.7, 3, 2.9, 3, 3, 2.5, 2.9, 2.5, 3.6, 3.2, 2.7, 3, 2.5, 2.8, 3.2, 3, 3.8, 2.6, 2.2, 3.2, 2.8, 2.8, 2.7, 3.3, 3.2, 2.8, 3, 2.8, 3), Petal.Length = c(1.6, 1.6, 1.5, 1.5, 1.4, 1.5, 1.2, 1.3, 1.4, 1.3, 1.5, 1.3, 1.3, 1.3, 1.6, 1.9, 1.4, 1.6, 1.4, 1.5, 1.4, 4.7, 4.5, 4.9, 4, 4.6, 4.5, 4.7, 3.3, 4.6, 3.9, 3.5, 4.2, 4, 4.7, 3.6, 4.4, 4.5, 4.1, 4.5, 3.9, 4.8, 4, 4.9, 4.7, 4.3, 4.4, 4.8, 5, 4.5, 3.5, 3.8, 3.7, 3.9, 5.1, 4.5, 4.5, 4.7, 4.4, 4.1, 4, 4.4, 4.6, 4, 3.3, 4.2, 4.2, 4.2, 4.3, 3, 4.1, 6, 5.1, 5.9, 5.6, 5.8, 6.6, 4.5, 6.3, 5.8, 6.1, 5.1, 5.3, 5.5, 5, 5.1, 5.3, 5.5, 6.7, 6.9, 5, 5.7, 4.9, 6.7, 4.9, 5.7, 6, 4.8, 4.9, 5.6, 5.8 ), Petal.Width = c(0.2, 0.2, 0.4, 0.1, 0.2, 0.2, 0.2, 0.2, 0.1, 0.2, 0.2, 0.3, 0.3, 0.2, 0.6, 0.4, 0.3, 0.2, 0.2, 0.2, 0.2, 1.4, 1.5, 1.5, 1.3, 1.5, 1.3, 1.6, 1, 1.3, 1.4, 1, 1.5, 1, 1.4, 1.3, 1.4, 1.5, 1, 1.5, 1.1, 1.8, 1.3, 1.5, 1.2, 1.3, 1.4, 1.4, 1.7, 1.5, 1, 1.1, 1, 1.2, 1.6, 1.5, 1.6, 1.5, 1.3, 1.3, 1.3, 1.2, 1.4, 1.2, 1, 1.3, 1.2, 1.3, 1.3, 1.1, 1.3, 2.5, 1.9, 2.1, 1.8, 2.2, 2.1, 1.7, 1.8, 1.8, 2.5, 2, 1.9, 2.1, 2, 2.4, 2.3, 1.8, 2.2, 2.3, 1.5, 2.3, 2, 2, 1.8, 2.1, 1.8, 1.8, 1.8, 2.1, 1.6)), .Names = c('Sepal.Length', 'Sepal.Width', 'Petal.Length', 'Petal.Width'), row.names = 30:130, class = 'data.frame'), 'data.frame', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits5# #argv <- list(structure(1L, .Dim = 1L), 'try-error', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits6# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0), 'Surv', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits7# #argv <- list(structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('Ctl', 'A', 'B'), class = 'factor', contrasts = 'contr.treatment'), 'factor', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits8# #argv <- list(c(NA, NA, '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/groupedData.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/groupedData.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/groupedData.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/groupedData.R'), 'ordered', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inherits.testinherits9# #argv <- list(list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit'))), 'try-error', FALSE); .Internal(inherits(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect('abc'))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(1))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(1+2i))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(1:5))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(1L))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(TRUE))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(as.logical(c(TRUE,NA,FALSE))))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(as.raw(c(1,NA,255,129,16))))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(c('abc', 'def')))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(c(1+3i,42-55i)))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(c(1,3,42)))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(c(1,NA,5)))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(environment()))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_inspect.testInspect# #if (!any(R.version$engine == "FastR")) { TRUE } else { out <- capture.output(.Internal(inspect(list(a='b', b='c')))); TRUE } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits('123') [1] 01 01 00 01 01 01 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits('23rrff') [1] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 01 Warning message: In intToBits("23rrff") : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits() Error in intToBits() : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(-0.3) [1] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(-1) [1] 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 [26] 01 01 01 01 01 01 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(-1.56) [1] 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 [26] 01 01 01 01 01 01 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(-99L) [1] 01 00 01 01 01 00 00 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 01 [26] 01 01 01 01 01 01 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(1.22) [1] 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(2147483648) [1] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 01 Warning message: In intToBits(2147483648) : NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(2345234.77) [1] 00 01 00 00 01 00 00 00 01 00 00 01 00 00 01 01 01 01 00 00 00 01 00 00 00 [26] 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(5+7i) [1] 01 00 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 Warning message: In intToBits(5 + (0+7i)) : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(6543L) [1] 01 01 01 01 00 00 00 01 01 00 00 01 01 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(6:9) [1] 00 01 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 01 01 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [51] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 01 00 00 00 00 00 00 00 [76] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 01 00 00 01 [101] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [126] 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(NULL) raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(c(1,2,3)) [1] 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 00 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [51] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 01 01 00 00 00 00 00 00 00 00 00 [76] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(c(2147483648, 2147483648)) [1] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [51] 00 00 00 00 00 00 00 00 00 00 00 00 00 01 Warning message: In intToBits(c(2147483648, 2147483648)) : NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(c(5L,99L)) [1] 01 00 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 01 01 00 00 00 01 01 00 00 00 00 00 00 00 00 00 00 00 [51] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(double(0)) raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(environment) Error in intToBits(environment) : cannot coerce type 'closure' to vector of type 'integer' ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(integer(0)) raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(list(5,5,7,8)) [1] 01 00 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 01 00 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [51] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 01 01 01 00 00 00 00 00 00 00 00 [76] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 01 [101] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [126] 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(list(c(5,5,7,8),88,6L)) Error in intToBits(list(c(5, 5, 7, 8), 88, 6L)) : 'list' object cannot be coerced to type 'integer' ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits#Output.IgnoreErrorMessage# #intToBits(new.env()) Error in intToBits(new.env()) : environments cannot be coerced to other types ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits# #intToBits(stdout()) [1] 01 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits1# #argv <- list(list()); .Internal(intToBits(argv[[1]])) raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToBits.testintToBits2# #argv <- list(NULL); .Internal(intToBits(argv[[1]])) raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8#Output.IgnoreErrorMessage# #intToUtf8(-100) [1] "\xff\xbf\xbf\xbe\x9c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(0) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(1) [1] "\001" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(1:100) [1] "\001\002\003\004\005\006\a\b\t\n\v\f\r\016\017\020\021\022\023\024\025\026\027\030\031\032\033\034\035\036\037 !\"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\\]^_`abcd" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(1:100, FALSE) [1] "\001\002\003\004\005\006\a\b\t\n\v\f\r\016\017\020\021\022\023\024\025\026\027\030\031\032\033\034\035\036\037 !\"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\\]^_`abcd" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(1:100, TRUE) [1] "\001" "\002" "\003" "\004" "\005" "\006" "\a" "\b" "\t" "\n" [11] "\v" "\f" "\r" "\016" "\017" "\020" "\021" "\022" "\023" "\024" [21] "\025" "\026" "\027" "\030" "\031" "\032" "\033" "\034" "\035" "\036" [31] "\037" " " "!" "\"" "#" "$" "%" "&" "'" "(" [41] ")" "*" "+" "," "-" "." "/" "0" "1" "2" [51] "3" "4" "5" "6" "7" "8" "9" ":" ";" "<" [61] "=" ">" "?" "@" "A" "B" "C" "D" "E" "F" [71] "G" "H" "I" "J" "K" "L" "M" "N" "O" "P" [81] "Q" "R" "S" "T" "U" "V" "W" "X" "Y" "Z" [91] "[" "\\" "]" "^" "_" "`" "a" "b" "c" "d" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8#Ignored.ReferenceError# #intToUtf8(2000) [1] "ߐ" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8#Ignored.ImplementationError# #intToUtf8(200000) [1] "𰵀" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(200L) [1] "È" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(32) [1] " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(55) [1] "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(55.5) [1] "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(65535) [1] "\uffff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8#Ignored.ImplementationError# #intToUtf8(65536) [1] "𐀀" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(c(100,101,0,102)) [1] "def" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #intToUtf8(c(100,101,0,102), TRUE) [1] "d" "e" "" "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #nchar(intToUtf8(c(100,101,0,102))) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf8# #nchar(intToUtf8(c(100,101,0,102), TRUE)) [1] 1 1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf81# #argv <- list(NULL, FALSE); .Internal(intToUtf8(argv[[1]], argv[[2]])) Error: 2 arguments passed to .Internal(intToUtf8) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf82# #argv <- list(list(), FALSE); .Internal(intToUtf8(argv[[1]], argv[[2]])) Error: 2 arguments passed to .Internal(intToUtf8) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf83# #argv <- list(FALSE, FALSE); .Internal(intToUtf8(argv[[1]], argv[[2]])) Error: 2 arguments passed to .Internal(intToUtf8) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf85# #argv <- structure(list(x = NA_integer_, multiple = TRUE), .Names = c('x', 'multiple'));do.call('intToUtf8', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_intToUtf8.testintToUtf86# #argv <- structure(list(x = NA_integer_), .Names = 'x');do.call('intToUtf8', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_integer.testinteger1# #argv <- structure(list(length = 2), .Names = 'length');do.call('integer', argv) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_interaction.testInteraction# #{ a <- gl(2, 4, 8) ; b <- gl(2, 2, 8, labels = c("ctrl", "treat")) ; interaction(a, b) } [1] 1.ctrl 1.ctrl 1.treat 1.treat 2.ctrl 2.ctrl 2.treat 2.treat Levels: 1.ctrl 2.ctrl 1.treat 2.treat ##com.oracle.truffle.r.test.builtins.TestBuiltin_interaction.testInteraction# #{ a <- gl(2, 4, 8) ; b <- gl(2, 2, 8, labels = c("ctrl", "treat")) ; s <- gl(2, 1, 8, labels = c("M", "F")) ; interaction(a, b, s, sep = ":") } [1] 1:ctrl:M 1:ctrl:F 1:treat:M 1:treat:F 2:ctrl:M 2:ctrl:F 2:treat:M [8] 2:treat:F 8 Levels: 1:ctrl:M 2:ctrl:M 1:treat:M 2:treat:M 1:ctrl:F ... 2:treat:F ##com.oracle.truffle.r.test.builtins.TestBuiltin_interaction.testinteraction1# #argv <- list(c('a.b', 'a'), c('c', 'b.c'));do.call('interaction', argv) [1] a.b.c a.b.c Levels: a.b.c a.b.b.c a.c ##com.oracle.truffle.r.test.builtins.TestBuiltin_interactive.testinteractive1# #argv <- list();do.call('interactive', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_internal.testIndirectInternalInvocation#Output.IgnoreErrorMessage# #(get('.Internal', envir = baseenv(), mode = 'function')(paste0(1,2,3,4,5))) Error: 5 arguments passed to .Internal(paste0) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_internal.testIndirectInternalInvocation# #attr((get('.Internal', envir = baseenv(), mode = 'function'))(getNamespaceRegistry()), 'name') NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_internal.testIndirectInternalInvocation# #is.environment((get('.Internal', envir = baseenv(), mode = 'function'))(getNamespaceRegistry())) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', 'a') } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect('a', as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect('a', as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c('a', 'b', 'c')) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c('a', 'c', 'b')) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c(1, 2, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c(1:3)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c(1L, 2L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect('a', c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, 1+1i) } [1] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(1+1i, as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(1+1i, as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c(1+1i, 2+1i, 3+1i)) } [1] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c(1+1i, 4+1i, 3+1i)) } [1] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c(1, 2, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c(1:3)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c(1L, 2L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1+1i, c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, 1.1) } [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(1.1, as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(1.1, as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c(1, 2, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c(1.1:3.1)) } [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c(1:3)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c(1L, 2L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1.1, c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, T) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(1L, as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(1L, as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c(1, 2, 3)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c(1:3)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c(1L, 2L, 3L)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c(T, F)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(1L, c(T, F, T)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(NA, as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(NA, as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c(1, 2, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c(1:3)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c(1L, 2L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(NA, c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, T) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(T, as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(T, as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c(1, 2, 3)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c(1:3)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c(1L, 2L, 3L)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c(T, F)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(T, c(T, F, T)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), 'a') } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c('a', 'b', 'c'), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c('a', 'b', 'c'), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c('a', 'b', 'c')) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c('a', 'c', 'b')) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c(1, 2, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c(1:3)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c(1L, 2L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'b', 'c'), c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), 'a') } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c('a', 'c', 'b'), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c('a', 'c', 'b'), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c('a', 'b', 'c')) } [1] "a" "c" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c('a', 'c', 'b')) } [1] "a" "c" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c(1, 2, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c(1:3)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c(1L, 2L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c('a', 'c', 'b'), c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), 1+1i) } [1] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1+1i, 2+1i, 3+1i), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1+1i, 2+1i, 3+1i), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c(1+1i, 2+1i, 3+1i)) } [1] 1+1i 2+1i 3+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c(1+1i, 4+1i, 3+1i)) } [1] 1+1i 3+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c(1, 2, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c(1:3)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c(1L, 2L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 2+1i, 3+1i), c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), 1+1i) } [1] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1+1i, 4+1i, 3+1i), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1+1i, 4+1i, 3+1i), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c(1+1i, 2+1i, 3+1i)) } [1] 1+1i 3+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c(1+1i, 4+1i, 3+1i)) } [1] 1+1i 4+1i 3+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c(1, 2, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c(1:3)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c(1L, 2L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1+1i, 4+1i, 3+1i), c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), T) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1, 2, 3), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1, 2, 3), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c(1, 2, 3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c(1:3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c(1L, 2L, 3L)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c(2, 4, 3)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c(2L, 4L, 3L)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c(T, F)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1, 2, 3), c(T, F, T)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), 1.1) } [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1.1:3.1), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1.1:3.1), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c(1, 2, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c(1.1:3.1)) } [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c(1:3)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c(1L, 2L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1.1:3.1), c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), T) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1:3), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1:3), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c(1, 2, 3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c(1:3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c(1L, 2L, 3L)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c(2, 4, 3)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c(2L, 4L, 3L)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c(T, F)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1:3), c(T, F, T)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), T) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1L, 2L, 3L), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(1L, 2L, 3L), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c(1, 2, 3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c(1:3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c(1L, 2L, 3L)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c(2, 4, 3)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c(2L, 4L, 3L)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c(T, F)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(1L, 2L, 3L), c(T, F, T)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(2, 4, 3), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(2, 4, 3), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c(1, 2, 3)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c(1:3)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c(1L, 2L, 3L)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c(2, 4, 3)) } [1] 2 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c(2L, 4L, 3L)) } [1] 2 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2, 4, 3), c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), 1L) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), T) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(2L, 4L, 3L), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(2L, 4L, 3L), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c(1, 2, 3)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c(1:3)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c(1L, 2L, 3L)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c(2, 4, 3)) } [1] 2 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c(2L, 4L, 3L)) } [1] 2 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c(T, F)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(2L, 4L, 3L), c(T, F, T)) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), T) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(T, F), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(T, F), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c(1, 2, 3)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c(1:3)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c(1L, 2L, 3L)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c(T, F)) } [1] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F), c(T, F, T)) } [1] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), 'a') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), 1+1i) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), 1.1) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), NA) } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), T) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(T, F, T), as.raw(c(1, 2, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test#Ignored.ImplementationError# #{ intersect(c(T, F, T), as.raw(c(2, 4, 3))) } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c('a', 'b', 'c')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c('a', 'c', 'b')) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c(1+1i, 2+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c(1+1i, 4+1i, 3+1i)) } complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c(1, 2, 3)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c(1.1:3.1)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c(1:3)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c(1L, 2L, 3L)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c(2, 4, 3)) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c(2L, 4L, 3L)) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c(T, F)) } [1] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_intersect.test# #{ intersect(c(T, F, T), c(T, F, T)) } [1] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testInvisible# #{ f <- function() { invisible(23) } ; f() } ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testInvisible# #{ f <- function() { invisible(23) } ; toString(f()) } [1] "23" ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testInvisible# #{ f <- function(x, r) { if (x) invisible(r) else r }; f(FALSE, 1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testInvisible# #{ f <- function(x, r) { if (x) invisible(r) else r }; f(TRUE, 1) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testInvisible# #{ f <- function(x, r) { if (x) return(invisible(r)) else return(r) }; f(FALSE, 1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testInvisible# #{ f <- function(x, r) { if (x) return(invisible(r)) else return(r) }; f(TRUE, 1) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible1# #argv <- list(c(3.14159265358977, 3.14159265358981));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible10# #argv <- list(structure(list(surname = structure(1:5, .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(c(1L, 2L, 3L, 3L, 1L), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(1L, 1L, 1L, 2L, 1L), .Label = c('no', 'yes'), class = 'factor'), title = structure(c(NA_integer_, NA_integer_, NA_integer_, NA_integer_, NA_integer_), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA_integer_, NA_integer_, NA_integer_, NA_integer_, NA_integer_), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased', 'title', 'other.author'), row.names = c(NA, -5L), class = 'data.frame'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible11# #argv <- list(structure('Error in `[.data.frame`(dd, , \'x\') : undefined columns selected\n', class = 'try-error', condition = structure(list(message = 'undefined columns selected', call = quote(`[.data.frame`(dd, , 'x'))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible12# #argv <- list(structure(list(value = structure(c(NA, NA, 1L, 9L), .Names = c('size', 'current', 'direction', 'eval_depth')), visible = TRUE), .Names = c('value', 'visible')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible13# #argv <- list(structure(function (...) new('test1', ...), className = structure('test1', package = '.GlobalEnv'), package = '.GlobalEnv', class = structure('classGeneratorFunction', package = 'methods')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible14# #argv <- list(structure(list(coefficients = structure(c(-0.0880891704401362, -0.508170309402877, -0.00510235947825228, 0.0737329622006759), .Names = c('(Intercept)', 'x1', 'z', 'x1:z')), residuals = structure(c(0.471500137591588, -0.418206002310214, -1.08038471222353, -0.582889907355648, 0.671048026430597, 1.41161034263987, 0.0130575334430522, 0.598273046028054, -0.0752209852417045, -1.00878747900206), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), effects = structure(c(0.483887391035467, -0.316505532770654, -0.0456368905560498, -0.659487662652535, 0.502868792132386, 1.20242722895332, -0.301792379913696, 0.0429789614006214, -0.536741577656989, -1.91019253457038), .Names = c('(Intercept)', 'x1', 'z', 'x1:z', '', '', '', '', '', '')), rank = 4L, fitted.values = structure(c(-0.527628877120589, 0.262410495604884, -0.390367671675741, 0.104739852247028, -0.253106466230895, -0.0529307911108283, -0.115845260786048, -0.210601434468685, 0.0214159446587994, -0.368272077826542), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), assign = 0:3, qr = structure(list(qr = structure(c(-3.16227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0, 3.16227766016838, -0.240253073352042, 0.392202458681634, -0.240253073352042, 0.392202458681634, -0.240253073352042, 0.392202458681634, -0.240253073352042, 0.392202458681634, -17.3925271309261, -1.58113883008419, 8.94427190999916, 0.0204447427551466, -0.048810308101025, -0.203162054994832, -0.272417105851004, -0.426768852744811, -0.496023903600983, -0.65037565049479, 1.58113883008419, 17.3925271309261, 2.77555756156289e-17, -8.94427190999916, 0.202312619197469, -0.0523458957441388, 0.422028033632482, -0.279844076809084, 0.641743448067495, -0.507342257874029), .Dim = c(10L, 4L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10'), c('(Intercept)', 'x1', 'z', 'x1:z')), assign = 0:3, contrasts = structure(list( x = 'contr.helmert'), .Names = 'x')), qraux = c(1.31622776601684, 1.39220245868163, 1.17479648964895, 1.17515228532081), pivot = 1:4, tol = 1e-07, rank = 4L), .Names = c('qr', 'qraux', 'pivot', 'tol', 'rank'), class = 'qr'), df.residual = 6L, contrasts = structure(list(x = 'contr.helmert'), .Names = 'x'), xlevels = structure(list(), .Names = character(0)), call = quote(lm(formula = y ~ x * z)), terms = quote(y ~ x * z), model = structure(list(y = c(-0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861), x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE), z = 1:10), .Names = c('y', 'x', 'z'), terms = quote(y ~ x * z), row.names = c(NA, 10L), class = 'data.frame')), .Names = c('coefficients', 'residuals', 'effects', 'rank', 'fitted.values', 'assign', 'qr', 'df.residual', 'contrasts', 'xlevels', 'call', 'terms', 'model'), class = 'lm'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible15# #argv <- list(structure('Error in scan(file, what, nmax, sep, dec, quote, skip, nlines, na.strings, : \n line 1 did not have 4 elements\n', class = 'try-error', condition = structure(list(message = 'line 1 did not have 4 elements', call = quote(scan(file, what, nmax, sep, dec, quote, skip, nlines, na.strings, flush, fill, strip.white, quiet, blank.lines.skip, multi.line, comment.char, allowEscapes, encoding))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible16# #argv <- list(structure('Error in cor(Z[, FALSE], use = pairwise.complete.obs, method = kendall) : \n x is empty\n', class = 'try-error', condition = structure(list(message = 'x is empty', call = quote(cor(Z[, FALSE], use = 'pairwise.complete.obs', method = 'kendall'))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible17# #argv <- list(structure(list(A = c(1L, NA, 1L), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA, NA, NA), E = c(FALSE, NA, TRUE), F = structure(c(1L, NA, 2L), .Label = c('abc', 'def'), class = 'factor')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible18# #argv <- list(structure(c(3, 8), .Dim = 2L, .Dimnames = structure(list(g = c('1', '2')), .Names = 'g'), call = quote(by.data.frame(data = X, INDICES = g, FUN = colMeans)), class = 'by'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible19# #argv <- list(structure('Error in rnorm(2, c(1, NA)) : (converted from warning) NAs produced\n', class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rnorm(2, c(1, NA)))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible2# #argv <- list(structure('Error in cov(rnorm(10), NULL) : \n supply both x and y or a matrix-like x\n', class = 'try-error', condition = structure(list(message = 'supply both x and y or a matrix-like x', call = quote(cov(rnorm(10), NULL))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible20# #argv <- list(structure(list(z = structure(c(1395082040.29392, 1395082040.29392, 1395082040.29392, 1395082040.29392, 1395082040.29392), class = c('AsIs', 'POSIXct', 'POSIXt'))), .Names = 'z', row.names = c(NA, -5L), class = 'data.frame'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible21# #argv <- list(quote(~a + b:c + d + e + e:d));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible22# #argv <- list(structure(list(tables = structure(list(`Grand mean` = 103.87323943662, N = structure(c(78.7365206866197, 98.5088731171753, 113.842206450509, 123.008873117175), .Dim = 4L, .Dimnames = structure(list(N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = 'N'), class = 'mtable'), `V:N` = structure(c(79.5323303457107, 86.1989970123773, 69.7732394366197, 98.0323303457106, 108.032330345711, 89.1989970123773, 114.198997012377, 116.698997012377, 110.365663679044, 124.365663679044, 126.365663679044, 118.032330345711), .Dim = 3:4, .Dimnames = structure(list(V = c('Golden.rain', 'Marvellous', 'Victory'), N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = c('V', 'N')), class = 'mtable')), .Names = c('Grand mean', 'N', 'V:N')), n = structure(list(N = structure(c(17, 18, 18, 18), .Dim = 4L, .Dimnames = structure(list(N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = 'N')), `V:N` = structure(c(6, 6, 5, 6, 6, 6, 6, 6, 6, 6, 6, 6), .Dim = 3:4, .Dimnames = structure(list(V = c('Golden.rain', 'Marvellous', 'Victory'), N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = c('V', 'N')))), .Names = c('N', 'V:N'))), .Names = c('tables', 'n'), type = 'means', class = c('tables_aov', 'list.of')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible23# #argv <- list(structure(list(A = 0:10, `NA` = 20:30), .Names = c('A', NA), class = 'data.frame', row.names = c(NA, -11L)));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible24# #argv <- list(structure(c(-Inf, -Inf, -2.248e+263, -Inf, -3.777e+116, -1), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.'), class = 'table'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible25# #argv <- list(structure(list(Df = c(1, 1, NA, 2), Deviance = c(12.2441566485997, 28.4640218366572, 32.825622681839, 32.4303239692005), AIC = c(73.9421143635373, 90.1619795515948, 92.5235803967766, 96.1282816841381)), .Names = c('Df', 'Deviance', 'AIC'), row.names = c('+ M.user', '+ Temp', '', '+ Soft'), class = c('anova', 'data.frame')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible26# #argv <- list(c(-1, -0.5, 0, 0.5, 1));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible27# #argv <- list(structure(c('Min. : 5.00 ', '1st Qu.: 12.50 ', 'Median : 23.00 ', 'Mean : 29.48 ', '3rd Qu.: 33.50 ', 'Max. :161.00 ', 'Min. :0.0000 ', '1st Qu.:1.0000 ', 'Median :1.0000 ', 'Mean :0.7826 ', '3rd Qu.:1.0000 ', 'Max. :1.0000 ', 'Maintained :11 ', 'Nonmaintained:12 ', NA, NA, NA, NA), .Dim = c(6L, 3L), .Dimnames = list(c('', '', '', '', '', ''), c(' time', ' status', ' x')), class = 'table'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible28# #argv <- list(structure(list(latin1 = 0L, utf8 = 0L, bytes = 0L, unknown = structure(character(0), .Dim = c(0L, 2L), .Dimnames = list(NULL, c('non_ASCII', 'where')))), .Names = c('latin1', 'utf8', 'bytes', 'unknown'), class = 'check_package_datasets'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible29# #argv <- list(structure(NA, .Tsp = c(1, 1, 1), class = 'ts'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible3# #argv <- list(quote(Y ~ X));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible30# #argv <- list(structure(list(), class = 'formula'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible31# #argv <- list(structure(list(strip.vp = structure(list(x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), width = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), height = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), justification = 'centre', gp = structure(list(), class = 'gpar'), clip = FALSE, xscale = c(-0.0330971105140634, 1.03229244338581), yscale = c(0, 1), angle = 0, layout = NULL, layout.pos.row = c(1L, 1L), layout.pos.col = c(1L, 1L), valid.just = c(0.5, 0.5), valid.pos.row = c(1L, 1L), valid.pos.col = c(1L, 1L), name = 'GRID.VP.40'), .Names = c('x', 'y', 'width', 'height', 'justification', 'gp', 'clip', 'xscale', 'yscale', 'angle', 'layout', 'layout.pos.row', 'layout.pos.col', 'valid.just', 'valid.pos.row', 'valid.pos.col', 'name'), class = 'viewport'), plot.vp = structure(list(x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), width = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), height = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), justification = 'centre', gp = structure(list(), class = 'gpar'), clip = FALSE, xscale = c(-0.0330971105140634, 1.03229244338581), yscale = c(-0.0353837383445352, 1.04704589419998), angle = 0, layout = NULL, layout.pos.row = c(2L, 2L), layout.pos.col = c(1L, 1L), valid.just = c(0.5, 0.5), valid.pos.row = c(2L, 2L), valid.pos.col = c(1L, 1L), name = 'GRID.VP.41'), .Names = c('x', 'y', 'width', 'height', 'justification', 'gp', 'clip', 'xscale', 'yscale', 'angle', 'layout', 'layout.pos.row', 'layout.pos.col', 'valid.just', 'valid.pos.row', 'valid.pos.col', 'name'), class = 'viewport')), .Names = c('strip.vp', 'plot.vp')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible32# #argv <- list(structure(list(name = 'list', objs = structure(list(`package:base` = .Primitive('list'), .Primitive('list')), .Names = c('package:base', '')), where = c('package:base', 'namespace:base'), visible = c(TRUE, FALSE), dups = c(FALSE, TRUE)), .Names = c('name', 'objs', 'where', 'visible', 'dups'), class = 'getAnywhere'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible33# #argv <- list(structure(list(GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962, Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551)), .Names = c('GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year', 'Employed'), row.names = 1947:1962, class = 'data.frame'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible34# #argv <- list(structure(list(sec = 59.7693939208984, min = 47L, hour = 18L, mday = 17L, mon = 2L, year = 114L, wday = 1L, yday = 75L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible35# #argv <- list(structure(list(x = structure(c(63.8079770211941, 64.1015289795127, 64.3950809378313, 64.6886328961499, 64.9821848544685, 65.2757368127871, 65.5692887711057, 65.8628407294243, 66.1563926877429, 66.4499446460616, 66.7434966043802, 67.0370485626988, 67.3306005210174, 67.624152479336, 67.9177044376546, 68.2112563959732, 68.5048083542918, 68.7983603126104, 69.091912270929, 69.3854642292476, 69.6790161875662, 69.9725681458849, 70.2661201042035, 70.5596720625221, 70.8532240208407, 71.1467759791593, 71.4403279374779, 71.7338798957965, 72.0274318541151, 72.3209838124337, 72.6145357707524, 72.908087729071, 73.2016396873896, 73.4951916457082, 73.7887436040268, 74.0822955623454, 74.375847520664, 74.6693994789826, 74.9629514373012, 75.2565033956198, 75.5500553539384, 75.843607312257, 76.1371592705757, 76.4307112288943, 76.7242631872129, 77.0178151455315, 77.3113671038501, 77.6049190621687, 77.8984710204873, 78.1920229788059), unit = 'native', valid.unit = 4L, class = 'unit'), y = structure(c(0.000292389503184205, 0.000897790147984954, 0.00234624782100963, 0.00521720896677798, 0.00989423163518025, 0.015999825469344, 0.0221693602680603, 0.0266484406702544, 0.0287592128884921, 0.0302032637184832, 0.0349150884986298, 0.0473117449499264, 0.069811568153779, 0.101849712371392, 0.14014558800306, 0.179532924691013, 0.213121481011927, 0.233373692723354, 0.235396372946243, 0.221556776074102, 0.201658872746641, 0.187397555681655, 0.184299939839784, 0.187901304936084, 0.186879499085897, 0.171534710980926, 0.140953197828419, 0.103411084284294, 0.0700968149951466, 0.0478115464491638, 0.0363916682131507, 0.0310202066683672, 0.0267344490723088, 0.0212112857883806, 0.0149149265224817, 0.00956339674119522, 0.00665150505587597, 0.00689835920722663, 0.010231338259878, 0.0157315524205489, 0.0215689799990253, 0.0254154063025622, 0.0255363521874538, 0.0218531199052928, 0.0159232922023665, 0.00987834564939972, 0.00521442208935573, 0.00234582757042574, 0.000897736459776011, 0.000292383673435392), unit = 'native', valid.unit = 4L, class = 'unit'), arrow = NULL, name = 'plot_02.density.lines.panel.3.1', gp = structure(list(lty = 1, col = '#0080ff', lwd = 1, alpha = 1), .Names = c('lty', 'col', 'lwd', 'alpha'), class = 'gpar'), vp = NULL), .Names = c('x', 'y', 'arrow', 'name', 'gp', 'vp'), class = c('lines', 'grob', 'gDesc')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible37# #argv <- list(structure(list(sec = numeric(0), min = integer(0), hour = integer(0), mday = integer(0), mon = integer(0), year = integer(0), wday = integer(0), yday = integer(0), isdst = integer(0)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'UTC'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible38# #argv <- list(structure(list(value = 4.94065645841247e-324, visible = TRUE), .Names = c('value', 'visible')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible39# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor'), c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = c('c0', 'c0'), row.names = integer(0), class = 'data.frame'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible4# #argv <- list(structure(list(height = numeric(0), weight = numeric(0)), .Names = c('height', 'weight'), row.names = integer(0), class = 'data.frame'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible40# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible41# #argv <- list(c(1e-10, 1e+49, 1e+108, 1e+167, 1e+226));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible42# #argv <- list(structure('checkRd: (-3) Surv.Rd:90: Unnecessary braces at ‘{time2}’', class = 'checkRd'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible43# #argv <- list(structure(list(raster = structure('#000000', .Dim = c(1L, 1L), class = 'raster'), x = structure(0, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), width = NULL, height = NULL, just = 'centre', hjust = NULL, vjust = NULL, interpolate = TRUE, name = 'GRID.rastergrob.785', gp = structure(list(), class = 'gpar'), vp = NULL), .Names = c('raster', 'x', 'y', 'width', 'height', 'just', 'hjust', 'vjust', 'interpolate', 'name', 'gp', 'vp'), class = c('rastergrob', 'grob', 'gDesc')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible44# #argv <- list(structure(c('0', 'NULL', 'NULL'), .Names = c('Length', 'Class', 'Mode'), class = c('summaryDefault', 'table')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible45# #argv <- list(structure(list(TEST = structure(c(1L, 2L, 6L, 3L, 4L, 5L, 10L, 11L, 9L, 7L, 8L), .Label = c('1', '2', '4', '5', '\\040', '\\b', '\\n', '\\r', '\\t', '\\x20', 'c:\\spencer\\tests'), class = 'factor')), .Names = 'TEST', class = 'data.frame', row.names = c(NA, -11L)));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible46# #argv <- list(structure(list(size = numeric(0), isdir = logical(0), mode = structure(integer(0), class = 'octmode'), mtime = structure(numeric(0), class = c('POSIXct', 'POSIXt')), ctime = structure(numeric(0), class = c('POSIXct', 'POSIXt')), atime = structure(numeric(0), class = c('POSIXct', 'POSIXt')), uid = integer(0), gid = integer(0), uname = character(0), grname = character(0)), .Names = c('size', 'isdir', 'mode', 'mtime', 'ctime', 'atime', 'uid', 'gid', 'uname', 'grname'), class = 'data.frame', row.names = character(0)));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible47# #argv <- list(structure(list(a = c(1L, 4L, 7L), b = c(2L, 5L, 8L), c = c(3L, 6L, 9L)), .Names = c('a', 'b', 'c'), class = 'data.frame', row.names = c(NA, -3L)));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible49# #argv <- list(structure('Error in rnorm(1, sd = Inf) : (converted from warning) NAs produced\n', class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rnorm(1, sd = Inf))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible5# #argv <- list(structure(c('Min. : 1.000 ', '1st Qu.: 9.000 ', 'Median :18.000 ', 'Mean :14.742 ', '3rd Qu.:20.000 ', 'Max. :23.000 ', NA, 'Min. :5.0000 ', '1st Qu.:5.3000 ', 'Median :6.1000 ', 'Mean :6.0841 ', '3rd Qu.:6.6000 ', 'Max. :7.7000 ', NA, 'Min. : 1.000 ', '1st Qu.: 24.250 ', 'Median : 56.500 ', 'Mean : 56.928 ', '3rd Qu.: 86.750 ', 'Max. :117.000 ', 'NAs :16 ', 'Min. : 0.500 ', '1st Qu.: 11.325 ', 'Median : 23.400 ', 'Mean : 45.603 ', '3rd Qu.: 47.550 ', 'Max. :370.000 ', NA, 'Min. :0.00300 ', '1st Qu.:0.04425 ', 'Median :0.11300 ', 'Mean :0.15422 ', '3rd Qu.:0.21925 ', 'Max. :0.81000 ', NA), .Dim = c(7L, 5L), .Dimnames = list(c('', '', '', '', '', '', ''), c(' event', ' mag', ' station', ' dist', ' accel')), class = 'table'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible50# #argv <- list(structure(1395078479.75887, class = c('POSIXct', 'POSIXt')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible51# #argv <- list(structure('Error in read.table(\'foo1\') : no lines available in input\n', class = 'try-error', condition = structure(list(message = 'no lines available in input', call = quote(read.table('foo1'))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible52# #argv <- list(structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11), .Dim = c(10L, 2L), .Dimnames = list(NULL, c('tt', 'tt + 1')), .Tsp = c(1920.5, 1921.25, 12), class = c('mts', 'ts', 'matrix')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible6# #argv <- list(structure(list(call = quote(lm(formula = y ~ x1 + x2 + x3)), terms = quote(y ~ x1 + x2 + x3), residuals = structure(c(0.224762433374997, 0.4813346401898, -0.548705796690786, -0.873306430909872, 0.3255545927283, -0.288240908441576, 0.530823516045489, -0.0649703574297026, 1.2699009772491, -1.05715266611575), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), coefficients = structure(c(1.47191076131574, 0.586694550701453, 0.258706725324317, 0.948371836939988, 0.396080061109718, 0.350912037541581, 1.55203972111298, 1.48125242421363, 0.737240953991673, 0.164593338447767, 0.182090654313858, 0.484947927602608), .Dim = 3:4, .Dimnames = list(c('(Intercept)', 'x1', 'x3'), c('Estimate', 'Std. Error', 't value', 'Pr(>|t|)'))), aliased = structure(c(FALSE, FALSE, TRUE, FALSE), .Names = c('(Intercept)', 'x1', 'x2', 'x3')), sigma = 0.806334473232766, df = c(3L, 7L, 4L), r.squared = 0.932605950232242, adj.r.squared = 0.913350507441455, fstatistic = structure(c(48.4333681840033, 2, 7), .Names = c('value', 'numdf', 'dendf')), cov.unscaled = structure(c(1.38333333333333, -0.525000000000001, 0.416666666666667, -0.525000000000001, 0.241287878787879, -0.208333333333334, 0.416666666666667, -0.208333333333334, 0.18939393939394), .Dim = c(3L, 3L), .Dimnames = list(c('(Intercept)', 'x1', 'x3'), c('(Intercept)', 'x1', 'x3'))), correlation = structure(c(1, -0.908715905467124, 0.814033538872717, -0.908715905467124, 1, -0.974558628915209, 0.814033538872717, -0.974558628915209, 1), .Dim = c(3L, 3L), .Dimnames = list( c('(Intercept)', 'x1', 'x3'), c('(Intercept)', 'x1', 'x3'))), symbolic.cor = FALSE), .Names = c('call', 'terms', 'residuals', 'coefficients', 'aliased', 'sigma', 'df', 'r.squared', 'adj.r.squared', 'fstatistic', 'cov.unscaled', 'correlation', 'symbolic.cor'), class = 'summary.lm'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible7# #argv <- list(structure(list(call = quote(lm(formula = y ~ 0)), terms = quote(y ~ 0), aliased = logical(0), residuals = structure(c(-0.667819876370237, 0.170711734013213, 0.552921941721332, -0.253162069270378, -0.00786394222146348, 0.0246733498130512, 0.0730305465518564, -1.36919169254062, 0.0881443844426084, -0.0834190388782434), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), df = c(0L, 10L, 0L), coefficients = structure(logical(0), .Dim = c(0L, 4L), .Dimnames = list(NULL, c('Estimate', 'Std. Error', 't value', 'Pr(>|t|)'))), sigma = 0.523484262069588, adj.r.squared = 0, r.squared = 0), .Names = c('call', 'terms', 'aliased', 'residuals', 'df', 'coefficients', 'sigma', 'adj.r.squared', 'r.squared'), class = 'summary.lm'));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible8# #argv <- list(structure(list(width = 80L, minIndent = 10L, extraIndent = 4L, sectionIndent = 5L, sectionExtra = 2L, itemBullet = '• ', enumFormat = function (n) sprintf('%d. ', n), showURLs = FALSE, code_quote = TRUE, underline_titles = FALSE), .Names = c('width', 'minIndent', 'extraIndent', 'sectionIndent', 'sectionExtra', 'itemBullet', 'enumFormat', 'showURLs', 'code_quote', 'underline_titles')));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_invisible.testinvisible9# #argv <- list(quote(breaks ~ (wool + tension)^2));invisible(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_isNamespaceEnv.testisNamespaceEnv1# #argv <- list(FALSE); .Internal(isNamespaceEnv(argv[[1]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isNamespaceEnv.testisNamespaceEnv2# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L))); .Internal(isNamespaceEnv(argv[[1]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isNamespaceEnv.testisNamespaceEnv3# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame')); .Internal(isNamespaceEnv(argv[[1]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isOpen.testisOpen1# #argv <- list(structure(2L, class = c('terminal', 'connection')), 0L); .Internal(isOpen(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isOpen.testisOpen3# #argv <- list(FALSE, 2L); .Internal(isOpen(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isR.testisR1# #argv <- list();do.call('is.R', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS41# #argv <- list(c('time', 'status'));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS410# #argv <- list(structure(list(coefficients = structure(c(62.4053692999179, 1.55110264750845, 0.510167579684914, 0.101909403579661, -0.144061029071015), .Names = c('(Intercept)', 'x1', 'x2', 'x3', 'x4')), residuals = structure(c(0.00476041849820263, 1.51120069970905, -1.67093753208295, -1.72710025504269, 0.250755561773019, 3.92544270216433, -1.44866908650026, -3.17498851728652, 1.3783494772083, 0.281547998741553, 1.99098357125943, 0.972989034920119, -2.2943340733616), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13')), effects = structure(c(-344.052796708698, 38.0798677535417, -34.7531619513928, -3.12951579377076, 0.496965514049109, 4.50219669010871, -0.53327716269669, -2.71488989732451, 1.79317596396333, 1.57288365899254, 2.82474425399188, 1.8967418325489, -1.63480882826157), .Names = c('(Intercept)', 'x1', 'x2', 'x3', 'x4', '', '', '', '', '', '', '', '')), rank = 5L, fitted.values = structure(c(78.4952395815018, 72.7887993002909, 105.970937532083, 89.3271002550427, 95.649244438227, 105.274557297836, 104.1486690865, 75.6749885172865, 91.7216505227917, 115.618452001258, 81.8090164287406, 112.32701096508, 111.694334073362), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13')), assign = 0:4, qr = structure(list(qr = structure(c(-3.60555127546399, 0.277350098112615, 0.277350098112615, 0.277350098112615, 0.277350098112615, 0.277350098112615, 0.277350098112615, 0.277350098112615, 0.277350098112615, 0.277350098112615, 0.277350098112615, 0.277350098112615, 0.277350098112615, -26.9029595169236, 20.3772120082893, -0.178565892506596, -0.178565892506596, 0.0177318148722558, -0.178565892506596, 0.214029522251108, 0.312178375940534, 0.263103949095821, -0.669310160953726, 0.312178375940534, -0.178565892506596, -0.129491465661883, -173.621161418497, 12.3214560939341, -52.4773668110126, -0.304364982610169, 0.171821393780133, 0.152975037639542, 0.609896101816292, -0.114330335930658, 0.304950385474031, -0.189506282456539, 0.0571721716629835, 0.362589213587327, 0.41970434660942, -42.43456501123, -18.2858864335223, -1.11991681104158, -12.5171816310368, -0.405342735734607, 0.108637576500954, 0.150506108798058, 0.497910771855039, 0.197741319088291, 0.429225499683342, 0.557905444893665, 0.0843208353807417, -0.0702259750833564, -108.16653826392, -14.2315837849668, 54.6072781350954, 12.8688326829848, -3.44968738078449, -0.0383654655076831, 0.50336264362848, 0.326250451511037, -0.0404173233188265, 0.0147578414456289, 0.526049642157631, 0.437713824243366, 0.410519010978314), .Dim = c(13L, 5L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13'), c('(Intercept)', 'x1', 'x2', 'x3', 'x4')), assign = 0:4), qraux = c(1.27735009811261, 1.31217837594053, 1.17203087181661, 1.08180209589898, 1.00399408483144), pivot = 1:5, tol = 1e-07, rank = 5L), .Names = c('qr', 'qraux', 'pivot', 'tol', 'rank'), class = 'qr'), df.residual = 8L, xlevels = structure(list(), .Names = character(0)), call = quote(lm(formula = y ~ x1 + x2 + x3 + x4, data = d2)), terms = quote(y ~ x1 + x2 + x3 + x4), model = structure(list(y = c(78.5, 74.3, 104.3, 87.6, 95.9, 109.2, 102.7, 72.5, 93.1, 115.9, 83.8, 113.3, 109.4), x1 = c(7, 1, 11, 11, 7, 11, 3, 1, 2, 21, 1, 11, 10), x2 = c(26, 29, 56, 31, 52, 55, 71, 31, 54, 47, 40, 66, 68), x3 = c(6, 15, 8, 8, 6, 9, 17, 22, 18, 4, 23, 9, 8), x4 = c(60, 52, 20, 47, 33, 22, 6, 44, 22, 26, 34, 12, 12)), .Names = c('y', 'x1', 'x2', 'x3', 'x4'), terms = quote(y ~ x1 + x2 + x3 + x4), row.names = c(NA, 13L), class = 'data.frame'), formula = quote(y ~ x1 + x2 + x3 + x4)), .Names = c('coefficients', 'residuals', 'effects', 'rank', 'fitted.values', 'assign', 'qr', 'df.residual', 'xlevels', 'call', 'terms', 'model', 'formula'), class = 'lm'));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS411# #argv <- list(3.14159265358979);isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS412# #argv <- list(structure(1, .Dim = 1L));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS413# #argv <- list(structure(c(2L, 1L, 3L), .Label = c('1', '2', NA), class = 'factor'));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS414# #argv <- list(structure(list(usr = c(0.568, 1.432, -1.08, 1.08), xaxp = c(0.6, 1.4, 4), yaxp = c(-1, 1, 4)), .Names = c('usr', 'xaxp', 'yaxp')));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS415# #argv <- list(structure(list(row.names = c('rate', 'additive', 'rate:additive', 'Residuals'), SS = structure(list(rate = structure(c(1.7405, -1.5045, 0.855500000000001, -1.5045, 1.3005, -0.739500000000001, 0.855500000000001, -0.739500000000001, 0.420500000000001), .Dim = c(3L, 3L), .Dimnames = list(c('tear', 'gloss', 'opacity'), c('tear', 'gloss', 'opacity'))), additive = structure(c(0.760499999999999, 0.682499999999998, 1.9305, 0.682499999999998, 0.612499999999998, 1.7325, 1.9305, 1.7325, 4.90050000000001), .Dim = c(3L, 3L), .Dimnames = list(c('tear', 'gloss', 'opacity'), c('tear', 'gloss', 'opacity'))), `rate:additive` = structure(c(0.000500000000000012, 0.0165000000000002, 0.0445000000000006, 0.0165000000000002, 0.5445, 1.4685, 0.0445000000000006, 1.4685, 3.9605), .Dim = c(3L, 3L), .Dimnames = list(c('tear', 'gloss', 'opacity'), c('tear', 'gloss', 'opacity'))), Residuals = structure(c(1.764, 0.0200000000000005, -3.07, 0.0200000000000005, 2.628, -0.551999999999994, -3.07, -0.551999999999994, 64.924), .Dim = c(3L, 3L), .Dimnames = list(c('tear', 'gloss', 'opacity'), c('tear', 'gloss', 'opacity')))), .Names = c('rate', 'additive', 'rate:additive', 'Residuals')), Eigenvalues = structure(c(1.61877188028067, 0.911918322770912, 0.286826136427727, -8.75998844614162e-17, -6.73817551294033e-18, 8.58370095630716e-18, 1.36263996836868e-17, -6.73817551294033e-18, -2.24871081520413e-19), .Dim = c(3L, 3L), .Dimnames = list(c('rate', 'additive', 'rate:additive'), NULL)), stats = structure(c(1, 1, 1, 16, 0.618141615338857, 0.476965104581081, 0.222894242126575, NA, 7.55426877464313, 4.25561883959759, 1.33852196999606, NA, 3, 3, 3, NA, 14, 14, 14, NA, 0.00303404516026092, 0.0247452809990207, 0.301781645099671, NA), .Dim = c(4L, 6L), .Dimnames = list(c('rate', 'additive', 'rate:additive', 'Residuals'), c('Df', 'Pillai', 'approx F', 'num Df', 'den Df', 'Pr(>F)')))), .Names = c('row.names', 'SS', 'Eigenvalues', 'stats'), class = 'summary.manova'));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS416# #argv <- list(4.94065645841247e-324);isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS417# #argv <- list(structure(list(), .Names = character(0), row.names = integer(0), class = 'data.frame'));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS42# #argv <- list(structure(1:10, .Tsp = c(1959.25, 1961.5, 4), class = 'ts'));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS43# #argv <- list(1.79769313486232e+308);isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS44# #argv <- list(structure(c('a1', NA, NA, 'a4'), class = 'AsIs'));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS45# #argv <- list(structure(list(Df = c(NA, 2L, 2L), Deviance = c(NA, 5.45230478674972, 2.66453525910038e-15), `Resid. Df` = c(8L, 6L, 4L), `Resid. Dev` = c(10.5814458637509, 5.12914107700115, 5.12914107700115)), .Names = c('Df', 'Deviance', 'Resid. Df', 'Resid. Dev'), row.names = c('NULL', 'outcome', 'treatment'), class = c('anova', 'data.frame'), heading = 'Analysis of Deviance Table\n\nModel: poisson, link: log\n\nResponse: counts\n\nTerms added sequentially (first to last)\n\n'));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS46# #argv <- list(structure(list(f = structure(c(1L, 1L, 1L), .Label = c('1', '2'), class = 'factor'), u = structure(12:14, unit = 'kg', class = 'avector')), .Names = c('f', 'u'), row.names = 2:4, class = 'data.frame'));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS47# #argv <- list(structure(c(1+1i, 3+1i, 2+1i, 4+1i, 5-1i, 7-1i, 6-1i, 8-1i), .Dim = c(2L, 2L, 2L)));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS48# #argv <- list(structure(list(a = c(1L, 2L, 3L, NA), b = c(NA, 3.14159265358979, 3.14159265358979, 3.14159265358979), c = c(TRUE, NA, FALSE, TRUE), d = structure(c(1L, 2L, NA, 3L), .Label = c('aa', 'bb', 'dd'), class = 'factor'), e = structure(c(1L, NA, NA, 2L), .Label = c('a1', 'a4'), class = 'factor'), f = structure(c(11323, NA, NA, 12717), class = 'Date')), .Names = c('a', 'b', 'c', 'd', 'e', 'f'), row.names = c(NA, -4L), class = 'data.frame', data_types = c('N', 'N', 'L', 'C', 'C', 'D')));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isS4.testisS49# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));isS4(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isSingle.testisSingle0# #is.single function (x) .Primitive("is.single") ##com.oracle.truffle.r.test.builtins.TestBuiltin_isSingle.testisSingle1# #is.single() Error in is.single() : 0 arguments passed to 'is.single' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_isSingle.testisSingle2# #is.single(0) Error in is.single(0) : type "single" unimplemented in R ##com.oracle.truffle.r.test.builtins.TestBuiltin_isSingle.testisSingle3# #is.single(NULL) Error in is.single(NULL) : type "single" unimplemented in R ##com.oracle.truffle.r.test.builtins.TestBuiltin_isSingle.testisSingle4# #is.single(+) Error: unexpected ')' in "is.single(+)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testIsTRUE# #{ file.path("a", "b", c("d","e","f")) } [1] "a/b/d" "a/b/e" "a/b/f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testIsTRUE# #{ file.path() } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testIsTRUE# #{ isTRUE(1) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testIsTRUE# #{ isTRUE(FALSE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testIsTRUE# #{ isTRUE(NA) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testIsTRUE# #{ isTRUE(NULL) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testIsTRUE# #{ isTRUE(TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testIsTRUE# #{ isTRUE(as.vector(1)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testIsTRUE# #{ isTRUE(as.vector(FALSE)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testIsTRUE# #{ isTRUE(as.vector(TRUE)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isTRUE.testisTRUE1# #argv <- structure(list(x = TRUE), .Names = 'x');do.call('isTRUE', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray1# #argv <- list(structure(list(weight = c(4.17, 5.58), group = structure(c(1L, 1L), .Label = c('Ctl', 'Trt'), class = 'factor')), .Names = c('weight', 'group'), row.names = 1:2, class = 'data.frame'));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray10# #argv <- list(structure(integer(0), .Names = character(0)));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray11# #argv <- list(structure(list(c0 = logical(0)), .Names = 'c0', row.names = integer(0), class = 'difftime'));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray12# #argv <- list(structure(list(B = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L), .Label = c('I', 'II', 'III', 'IV', 'V', 'VI'), class = 'factor'), V = structure(c(3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L), .Label = c('Golden.rain', 'Marvellous', 'Victory'), class = 'factor'), N = structure(c(2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt'), class = 'factor'), Y = c(130L, 157L, 174L, 117L, 114L, 161L, 141L, 105L, 140L, 118L, 156L, 61L, 91L, 97L, 100L, 70L, 108L, 126L, 149L, 96L, 124L, 121L, 144L, 68L, 64L, 112L, 86L, 60L, 102L, 89L, 96L, 89L, 129L, 132L, 124L, 74L, 89L, 81L, 122L, 64L, 103L, 132L, 133L, 70L, 89L, 104L, 117L, 62L, 90L, 100L, 116L, 80L, 82L, 94L, 126L, 63L, 70L, 109L, 99L, 53L, 74L, 118L, 113L, 89L, 82L, 86L, 104L, 97L, 99L, 119L, 121L)), .Names = c('B', 'V', 'N', 'Y'), row.names = 2:72, class = 'data.frame'));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray13# #argv <- list(1.79769313486232e+308);is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray14# #argv <- list(structure(list(a = 1), .Dim = 1L, .Dimnames = list('a')));is.array(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray15# #argv <- list(structure(c(-0.826728474083517, -0.154469781470927, 0.390336546510923, 1.36531474451071, 2.06722571939869, 1.96521311125433, 1.45602298338166, 0.730191404067138, -0.941608750081938, -0.839732558506723, -0.0905911085922035, 0.450465973953452, 1.12065714554563, 1.45760317860118, 1.25109677501882, 1.2162018587134, 1.45496813096317, -0.271923056200992, -2.39070401244086, -2.40312653243942, 1.3490211050246, 0.723634003520978, -0.525571703048375, -2.20018568844273, -1.57021740950431, -1.15394138529193, -0.771438011070496, 0.948968136215006, 1.11028283982967, 1.3490211050246, 0.723634003520978, -0.771438011070496, -1.76787333029837, -2.97849067734298, -2.56564546193719, -1.42386100140387, -0.482534191368393, 0.15506930200634, 0.878254497780181, 1.05319014844382, 0.0786502243396558, -0.896275208780418, -0.852907979665288, -1.36905276490888, -0.852907979665288, 0.378793517229249, 1.51661659600387, 1.37393548755461, -1.19044178751146, -1.01371204398328, -0.413541319881442, -0.0155111902607956, 0.511260101660621, 1.1596935438887, 1.49073250236106, 1.90481616825336, 1.72198968844944, 1.06922804353907, -0.525571703048375, -2.20018568844273, -1.57021740950431, -1.15394138529193, -0.771438011070496, 0.948968136215006, 1.11028283982967, 1.3490211050246, 0.723634003520978, -0.771438011070496, -1.76787333029837, 1.90481616825336, -1.15394138529193, -0.771438011070496, 0.948968136215006, 1.11028283982967, 1.3490211050246, 0.723634003520978, -0.771438011070496, -1.76787333029837, 1.17726251300777, 0.873546391155001, -0.257195249490748, -1.08470959372261, -1.32132136208769, -1.28389495656857, -0.471605120836204, 0.606878400401293, 1.31985237043395, 2.02783906485667, 1.57046182864688, -0.252818874890949, -1.24388962195487, -0.626057778621366, 1.49073250236106, 1.90481616825336, 1.72198968844944, 1.06922804353907, -0.525571703048375, -2.20018568844273, -1.57021740950431, -1.15394138529193, -0.771438011070496, 0.948968136215006, 1.11028283982967, 1.45760317860118, 1.25109677501882, 1.2162018587134, 1.45496813096317, -0.271923056200992, -2.39070401244086, -2.40312653243942, -2.10302193998908, -1.35143116355906, -0.796191750223435, 0.24658809164983), .Dim = c(114L, 1L), .Dimnames = list(NULL, 'Series 1'), .Tsp = c(1, 114, 1), class = 'ts'));is.array(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray16# #argv <- list(structure(c(1.82608695652174, 1.17391304347826, 1.17391304347826, 4.17391304347826, 1.82608695652174, 1.82608695652174, 2.17391304347826, 0.173913043478262, 4.17391304347826, 0.826086956521738, 2.17391304347826, 2.17391304347826, 2.17391304347826, 4.17391304347826, 2.82608695652174, 2.17391304347826, 2.17391304347826, 0.826086956521738, 3.82608695652174, 1.82608695652174, 4.82608695652174, 0.173913043478262, 7.82608695652174, 1.15, 5.15, 0.85, 1.15, 2.85, 2.85, 1.85, NA, 6.15, 2.85, 0.15, 3.15, 0.15, NA, NA, 1.15, 1.85, 0.15, 0.85, 0.85, 2.15, 2.85, 2.85, 32.2608695652174, 54.2608695652174, 36.2608695652174, 45.2608695652174, 194.739130434783, 130.739130434783, 35.2608695652174, 59.2608695652174, 63.2608695652174, 25.7391304347826, 25.2608695652174, 44.2608695652174, 16.2608695652174, 63.2608695652174, 53.2608695652174, 56.2608695652174, 19.2608695652174, 35.2608695652174, 39.2608695652174, 7.26086956521739, 38.2608695652174, 213.739130434783, 158.739130434783, 8.09999999999999, 94.9, 59.9, 49.9, 176.1, 11.1, 59.9, NA, 100.1, 15.1, 21.1, 84.1, 65.1, NA, NA, 63.9, 37.9, 26.9, 128.9, 42.1, 87.9, 118.1, 30.9), .Dim = c(23L, 4L), .Dimnames = list(NULL, c('V1', 'V2', 'V3', 'V4')), '`scaled:center`' = structure(c(10.8260869565217, 3.85, 95.2608695652174, 137.9), .Names = c('V1', 'V2', 'V3', 'V4'))));is.array(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray17# #argv <- list(c('1', '2', NA));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray18# #argv <- list(structure(list(y = c(0.219628047744843, 0.360454661130887, NA, 0.114681204747219, -1.14267533343616, 0.772374419482067, 0.681741904304867, 0.171869265068012, 2.08409180391906, 0.367547276775469), x1 = c(1L, 2L, 3L, NA, 5L, 6L, 7L, 8L, 9L, 10L), x2 = 1:10, x3 = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0), wt = c(0, 1, 1, 1, 1, 1, 1, 1, 1, 1)), .Names = c('y', 'x1', 'x2', 'x3', 'wt'), row.names = c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j'), class = 'data.frame'));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray19# #argv <- list(structure(list(x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE), y = c(-0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861)), .Names = c('x', 'y'), row.names = c(NA, -10L), class = 'data.frame'));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray2# #argv <- list(structure(list(weight = c(4.17, 5.58, 5.18, 6.11, 4.5, 4.61, 5.17, 4.53, 5.33, 5.14, 4.81, 4.17, 4.41, 3.59, 5.87, 3.83, 6.03, 4.89, 4.32, 4.69), group = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Ctl', 'Trt'), class = 'factor')), .Names = c('weight', 'group'), row.names = c(NA, -20L), class = 'data.frame'));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray20# #argv <- list(structure(c(365, 365, 365, 366, 1, 0), .Dim = c(3L, 2L)));is.array(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray21# #argv <- list(integer(0));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray22# #argv <- list(structure(1:12, .Dim = 3:4, .Dimnames = list(c('A', 'B', 'C'), c('D', 'E', 'F', 'G'))));is.array(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray23# #argv <- list(c(0.568, 1.432, -1.08, 1.08));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray3# #argv <- list(structure(c(3.3675190249981e-55, 0.765191717864009, 1.84321904447013e-13, 0.270563224172485, 1.09996038197079, 1.31584681249013e-26, 0.00018392029356426, 0.515909871821833, 3.2666146281237e-45, -9.79475754683005e-56, -0.139604410987981, -1.56689901864133e-13, -0.285096750996398, -0.00590762252543826, -1.87837727043588e-27, -1.95765906855729e-05, -0.587847588896037, -1.0000270983218e-45), .Dim = c(9L, 2L), .Dimnames = list(NULL, c('Comp.1', 'Comp.2'))));is.array(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray4# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray5# #argv <- list(structure(c(TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE), .Dim = c(11L, 2L)));is.array(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray6# #argv <- list(structure(c(3+2i, 3+2i, NA, 3+2i, 3+2i, 3+2i, 3+2i, 3+2i, 4-5i, 3-5i, NA, NA, 2-5i, 3-5i, 4-5i, 5-5i), .Dim = c(8L, 2L), .Dimnames = list(NULL, c('x1', 'x2'))));is.array(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray7# #argv <- list(c('2001-01-01', NA, NA, '2004-10-26'));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray8# #argv <- list(structure(list(breaks = c(26, 30, 54, 25, 70, 52, 51, 26, 67, 27, 14, 29, 19, 29, 31, 41, 20, 44), wool = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('A', 'B'), class = 'factor'), tension = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), .Label = c('L', 'M', 'H'), class = 'factor')), .Names = c('breaks', 'wool', 'tension'), row.names = c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 35L, 36L), class = 'data.frame'));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarray9# #argv <- list(structure(list(carb = c(33, 40, 37, 27, 30, 43, 34, 48, 30, 38, 50, 51, 30, 36, 41, 42, 46, 24, 35, 37), age = c(33, 47, 49, 35, 46, 52, 62, 23, 32, 42, 31, 61, 63, 40, 50, 64, 56, 61, 48, 28), wgt = c(100, 92, 135, 144, 140, 101, 95, 101, 98, 105, 108, 85, 130, 127, 109, 107, 117, 100, 118, 102), prot = c(14, 15, 18, 12, 15, 15, 14, 17, 15, 14, 17, 19, 19, 20, 15, 16, 18, 13, 18, 14)), .Names = c('carb', 'age', 'wgt', 'prot'), row.names = c(NA, -20L), class = 'data.frame'));is.array(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isarray.testisarrayGenericDispatch# #{ is.array.cls <- function(x) 42; is.array(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testIsAtomic# #{ !is.atomic(function() {}) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testIsAtomic# #{ !is.atomic(list()) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testIsAtomic# #{ is.atomic(1) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testIsAtomic# #{ is.atomic(1:3) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testIsAtomic# #{ is.atomic(1L) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testIsAtomic# #{ is.atomic(NA) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testIsAtomic# #{ is.atomic(NULL) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testIsAtomic# #{ is.atomic(TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testIsAtomic# #{ is.atomic(c(1,2,3)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic1# #argv <- list(c('01', '02', '03', '04', '05', '06', '07', '08', '09', '10', '11', '12'));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic10# #argv <- list(structure(c(123.263157894737, 88.6052631578949, 77.0526315789476, 60.9473684210528, 54.3947368421055, 43.8421052631581, 34.2894736842107, 14.7368421052633, 10.6315789473686, 1.07894736842124, -9.47368421052613, -11.0263157894735, -16.1315789473682, -13.6842105263156, -3.23684210526298, -1.34210526315772, 11.1052631578949, -0.44736842105246, 7.00000000000017, 7.4473684210528, 6.89473684210543, 5.34210526315806, -8.21052631578931, -15.7631578947367, -3.31578947368405, 24.5789473684212, 27.0263157894738, 26.4736842105265, 21.9210526315791, 23.3684210526317, 27.263157894737, 19.6052631578949, 21.0526315789475, 26.5000000000001, 22.9473684210528, 12.3947368421054, 1.84210526315803, 5.28947368421066, -1.81578947368408, 4.63157894736855, 24.5263157894738, 10.9736842105264, 4.42105263157907, -10.1315789473683, -10.6842105263157, 12.763157894737, 33.2105263157896, 35.1052631578949, 44.5526315789475, 41.0000000000001, 46.4473684210527, 59.8947368421054, 69.342105263158, 64.7894736842106, 48.6842105263159, 63.1315789473685, 54.0263157894738, 46.4736842105264, 41.921052631579, 35.3684210526317, 27.8157894736843, 32.2631578947369, 36.7105263157896, 32.1578947368422, 23.6052631578948, 14.0526315789475, 12.5000000000001, -5.05263157894728, 9.84210526315798, 7.28947368421061, 16.7368421052632, 13.1842105263159, 13.6315789473685, 7.07894736842113, 9.52631578947376, 6.42105263157902, 4.31578947368428, -7.23684210526309, -15.7894736842105, 0.657894736842167, -5.8947368421052, 0.552631578947427, 7.44736842105269, -10.1052631578947, -3.65789473684205, 0.789473684210577, 7.23684210526321, 16.6842105263158, 7.13157894736847, -4.4210526315789, -5.97368421052627, -11.5263157894736, -4.07894736842101, -16.6315789473684, -14.1842105263158, -19.7368421052631, -11.2894736842105, -5.84210526315786, -13.3947368421052, -14.9473684210526, -15.5, -21.0526315789473, -6.60526315789471, -14.1578947368421, -8.71052631578945, -6.26315789473682, -11.8157894736842, -19.3684210526316, -6.92105263157893, -18.4736842105263, -19.0263157894737, -15.578947368421, -16.1315789473684, -12.6842105263158, 5.76315789473685, 3.21052631578948, 2.65789473684211, 5.10526315789474, 11.5526315789474), .Names = c('11', '12', '13', '15', '26', '30', '31', '53', '54', '59', '60', '65', '71', '81', '88', '92', '93', '95', '105', '107', '110', '116', '118', '131', '132', '135', '142', '144', '147', '156', '163', '166', '170', '174', '175', '176', '177', '179', '180', '181', '183', '185', '188', '189', '191', '196', '197', '202', '207', '210', '212', '218', '221', '222', '223', '225', '229', '230', '237', '239', '246', '259', '267', '269', '270', '279', '283', '284', '285', '286', '288', '291', '292', '300', '301', '303', '306', '310', '320', '329', '337', '353', '363', '364', '371', '387', '390', '394', '404', '413', '428', '429', '442', '444', '455', '457', '458', '460', '477', '519', '524', '533', '558', '567', '574', '583', '613', '624', '643', '655', '689', '707', '791', '806', '814', '840', '883', '1010', '1022')));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic11# #argv <- list(structure(c(0, -0.0555555555555556, 0.02, 0.0625, 0.0625, 0.04, 0, 0), .Dim = c(8L, 1L), .Dimnames = list(c('2', '3', '6', '7', '8', '9', '14', '17'), 'x')));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic12# #argv <- list(structure(c(2.21843970753346, 1.80732678656753, -1.09399175987006, 0.585986462327552, -5.68458926982395, 1.23352238598674, 0.457950438444482, 2.51599006679516, -2.28780372840319, 5.53596062467695, 2.17890565095959, -1.59611751350773, -2.9672978602151, 0.745175851232308, 1.93388282434376, -3.03559459078455, 2.19500990255906, 0.0725275773318347, -0.75336064096447, -1.15505962102859, -2.84782886882524, -1.41070341448251, -0.540252474026749, 4.87719739781058, 0.890715639552621, -0.968642103099399, 1.73177156113283, -0.993218102309356, -0.656454198323984, -1.5299506933835, -0.298424468882268, 6.51011264717937, 2.68326774833378, 1.99295445531679, -0.214079422583434, 6.73505308264589, -4.54579214489424, -2.3991834444486, -1.71479569181251, -6.47293095421849, -1.67116930820449, -11.5853328029437, -2.48588878138021, -0.888857646918452, 8.06807102468956, -0.216046323028316, 6.24682938323398, -1.74761908105831, 2.53082303181417, 2.31410662801887, 2.97453294161523, -2.88723068649699, -1.04144266580674, -0.835536300630093, -6.10229135345437, -4.37605802846523, -1.94289029309402e-16, 5.96619037131792, -1.1474434665393, 3.78819830631063, -3.01580771910632, -0.656454198323984, 1.50824785799851, -2.06401783962239, -3.02346226775125, 0.407243897855763, -3.96478352340807, -2.12718621336067, -0.78924288871239, -3.03559459078455, 0.457950438444496, -0.797900839851943, -3.38233849466459, 1.97815029009903, 0.745175851232309, -1.09645503136389, 0.341748714147263, 7.32472922782987, -1.33672649241008, 1.51931399477032, 0.00590129163826772, -4.09533092706814, 0.195481697042187, -2.7736762657602, -3.48737543915568, 0.536312040203338, 0.775871729180551, 4.37979177946206, 1.30271070089245, 4.2132287611068, 7.33457656622414, 3.28311350719274, -1.30271070089245), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93')));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic13# #argv <- list(c(1, 0, 2, NA, 3));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic14# #argv <- list(c(1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.00566013786017473, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, -0.00900237050730269, -0.728901016108085, 1, 0, 0, 0, 0, 0, 0, 0, 0, -0.0165439610603712, 0.195986923200517, -0.65974257839475, 1, 0, 0, 0, 0, 0, 0, 0, -0.066085607580362, -0.0156976524162818, 0.173905017001082, -0.499536921684336, 1, 0, 0, 0, 0, 0, 0, -0.0738085645370442, -0.0203225592950423, -0.115986092442635, 0.0129919901272555, -0.442920654638837, 1, 0, 0, 0, 0, 0, 0.0393894522336503, -0.0197375262983596, -0.124011676515792, -0.217221939591068, -0.129869023991585, -0.565387274218169, 1, 0, 0, 0, 0, 0.0607863121945582, -0.0166644168652946, -0.107337280394758, -0.197961946387821, -0.278643450192551, -0.207586147284064, -0.767412521925717, 1, 0, 0, 0, 0.062350529551034, -0.00752786862124525, -0.0512212310455943, -0.0966787787982999, -0.13451920005707, -0.183723918913255, -0.15174930099133, -1.08016400642495, 1, 0, 0, 0.00956599068508591, -0.00134207672049057, -0.00895378984363029, -0.0175914048294707, -0.0252596683886793, -0.0334470581271047, -0.0623904491074943, 0.117178336161866, -1.32461347964996, 1, 0, -0.000288769768734922, -7.2526747819756e-05, -0.000396728614559744, -0.000760325293277726, -0.00119170347009929, -0.00158048211775626, -0.00256503558312322, -0.00605270851626604, 0.3995724375217, -0.740914424130097, 1));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic15# #argv <- list(structure(list(age = 62.4473684210526, age.strata.sex.sex.2 = 24.109649122807), .Names = c('age', 'age.strata.sex.sex.2'), row.names = c(NA, -1L), class = 'data.frame'));is.atomic(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic16# #argv <- list(structure(list(base = c(11L, 11L, 6L, 8L, 66L, 27L, 12L, 52L, 23L, 10L, 52L, 33L, 18L, 42L, 87L, 50L, 18L, 111L, 18L, 20L, 12L, 9L, 17L, 28L, 55L, 9L, 10L, 47L, 76L, 38L, 19L, 10L, 19L, 24L, 31L, 14L, 11L, 67L, 41L, 7L, 22L, 13L, 46L, 36L, 38L, 7L, 36L, 11L, 151L, 22L, 41L, 32L, 56L, 24L, 16L, 22L, 25L, 13L, 12L)), .Names = 'base', class = 'data.frame', row.names = c(1L, 5L, 9L, 13L, 17L, 21L, 25L, 29L, 33L, 37L, 41L, 45L, 49L, 53L, 57L, 61L, 65L, 69L, 73L, 77L, 81L, 85L, 89L, 93L, 97L, 101L, 105L, 109L, 113L, 117L, 121L, 125L, 129L, 133L, 137L, 141L, 145L, 149L, 153L, 157L, 161L, 165L, 169L, 173L, 177L, 181L, 185L, 189L, 193L, 197L, 201L, 205L, 209L, 213L, 217L, 221L, 225L, 229L, 233L)));is.atomic(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic17# #argv <- list(c(0, 0, 0, 0, 0, 0, 2.47032822920623e-323, 0, 0, 0, 0, 0));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic18# #argv <- list(structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic19# #argv <- list(c(NA, 'Ripley', 'Venables & Smith'));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic2# #argv <- list(structure(c(1, 2, 3, 0, 10, NA), .Dim = c(3L, 2L)));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic20# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic21# #argv <- list(structure(FALSE, .Tsp = c(1, 1, 1), class = 'ts'));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic22# #argv <- list(structure(numeric(0), .Dim = c(4L, 0L)));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic23# #argv <- list(structure(1:3, .Label = c('4', '5', '6'), class = 'factor'));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic24# #argv <- list(structure(c(1L, 1L, 1L, 2L, 2L, 2L, 3L, 3L, 3L, 4L, 4L, 4L), .Label = c('freckle', 'superficial', 'nodular', 'indeterminate'), class = 'factor', contrasts = 'contr.treatment'));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic25# #argv <- list(raw(0));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic26# #argv <- list(c(19.7787405591752, 12504507.4953993, 12504507.4953993, 5.96190157728191e+41));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic27# #argv <- list(character(0));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic28# #argv <- list(structure(list(a1 = 1:3, a2 = 4:6, a3 = 3.14159265358979, a4 = c('a', 'b', 'c')), .Names = c('a1', 'a2', 'a3', 'a4')));is.atomic(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic29# #argv <- list(structure(c(2L, 1L, 3L), .Label = c('1', '2', NA), class = 'factor'));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic3# #argv <- list(structure(list(x = 1:10, yyy = 11:20), .Names = c('x', 'yyy'), row.names = c(NA, -10L), class = 'data.frame'));is.atomic(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic30# #argv <- list(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic31# #argv <- list(c(2L, 1L, NA));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic32# #argv <- list(structure(1:20, .Tsp = c(1, 20, 1), class = 'ts'));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic4# #argv <- list(c(-1.12778377684043, -12820.0784261145, -21650982809.6744, -473300382255715392, -6.08456909882282e+25, -3.04622557026196e+34, -4.60125024792566e+43, -1.76183826972506e+53, -1.5069799345972e+63, -2.61556777274611e+73, -8.54170618068872e+83, -4.9383857330861e+94, -4.80716085942859e+105, -7.55412056676629e+116, -1.84898368353639e+128, -6.83535188151783e+139, -3.71562599613334e+151, -2.90089508183654e+163, -3.18582547396557e+175, -4.83110332887119e+187, -9.94902790498679e+199, -2.74100158340596e+212, -9.96611412047338e+224, -4.72336572671053e+237, -2.88514442494869e+250, -2.24780296109123e+263, -2.21240023126594e+276, -2.72671165723473e+289, -4.17369555651928e+302, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic5# #argv <- list(c(2.5, 6, 6, 7.5, 8, 8, 16, 6, 5, 6, 28, 5, 9.5, 6, 4.5, 10, 14, 3, 4.5, 5.5, 3, 3.5, 6, 2, 3, 4, 6, 5, 6.5, 5, 10, 6, 18, 4.5, 20));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic6# #argv <- list(structure(c(1, 2, 2, 3, 3, 3, 4, 5), .Names = c('dsyMatrix', 'ddenseMatrix', 'symmetricMatrix', 'dMatrix', 'denseMatrix', 'compMatrix', 'Matrix', 'mMatrix')));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic7# #argv <- list(c(-Inf, -Inf, -Inf, -Inf, 0, 1, 2, 3, Inf, Inf, Inf));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic8# #argv <- list(structure(c(4.17, 5.58, 5.18, 6.11, 4.5, 4.61, 5.17, 4.53, 5.33, 5.14, 4.81, 4.17, 4.41, 3.59, 5.87, 3.83, 6.03, 4.89, 4.32, 4.69, 17.3889, 31.1364, 26.8324, 37.3321, 20.25, 21.2521, 26.7289, 20.5209, 28.4089, 26.4196, 23.1361, 17.3889, 19.4481, 12.8881, 34.4569, 14.6689, 36.3609, 23.9121, 18.6624, 21.9961), .Dim = c(20L, 2L), .Dimnames = list(NULL, c('w', 'w2'))));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isatomic.testisatomic9# #argv <- list(structure(c(TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE), .Names = c('1', '2', '3', '4', '5', '6', '7', '8')));is.atomic(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testIsCall# #{ callExpr <- quote(asd[,1]); lapply(callExpr, function(x) is.call(x)) } [[1]] [1] FALSE [[2]] [1] FALSE [[3]] [1] FALSE [[4]] [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testIsCall# #{ cl <- call("f") ; is.call(cl) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testIsCall# #{ cl <- call("f", 2, 3) ; is.call(cl) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testIsCall# #{ cl <- list(f, 2, 3) ; is.call(cl) } Error: object 'f' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testIsCall# #{ is.call(call) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall1# #argv <- list(structure(list(dim = c(93L, 19L), dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93'), c('dfb.1_', 'dfb.Wght', 'dfb.Cyl4', 'dfb.Cyl5', 'dfb.Cyl6', 'dfb.Cyl8', 'dfb.Cyln', 'dfb.TypL', 'dfb.TypM', 'dfb.TypSm', 'dfb.TypSp', 'dfb.TypV', 'dfb.EngS', 'dfb.DrTF', 'dfb.DrTR', 'dffit', 'cov.r', 'cook.d', 'hat'))), .Names = c('dim', 'dimnames')));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall10# #argv <- list(structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall11# #argv <- list(c(TRUE, FALSE, TRUE, NA, FALSE, FALSE, TRUE));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall12# #argv <- list(structure(c(NA, 9.93, 26.79, 820.91), .Names = c('', '- x4', '- x2', '- x1')));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall13# #argv <- list(structure(list(nationality = structure(c(1L, 2L, 2L, 3L, 3L, 1L), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(1L, 1L, 1L, 1L, 2L, 1L), .Label = c('no', 'yes'), class = 'factor'), title = structure(c(3L, 6L, 7L, 4L, 2L, 5L), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA, NA, NA, NA, NA, 1L), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('nationality', 'deceased', 'title', 'other.author'), class = 'data.frame', row.names = c(NA, -6L)));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall14# #argv <- list(structure(c(10L, 10L, 10L, 10L, 10L), .Dim = 5L, .Dimnames = structure(list(a = c('0.333333333333333', '0.5', '1', 'Inf', NA)), .Names = 'a')));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall15# #argv <- list(1.79769313486232e+308);is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall16# #argv <- list(c(3.71357206670431, 3.58351893845611, 2.484906649788, 2.89037175789616, NA, 3.3322045101752, 3.13549421592915, 2.94443897916644, 2.07944154167984, NA, 1.94591014905531, 2.77258872223978, 2.39789527279837, 2.63905732961526, 2.89037175789616, 2.63905732961526, 3.52636052461616, 1.79175946922805, 3.40119738166216, 2.39789527279837, 0, 2.39789527279837, 1.38629436111989, 3.46573590279973, NA, NA, NA, 3.13549421592915, 3.80666248977032, 4.74493212836325, 3.61091791264422, NA, NA, NA, NA, NA, NA, 3.36729582998647, NA, 4.26267987704132, 3.66356164612965, NA, NA, 3.13549421592915, NA, NA, 3.04452243772342, 3.61091791264422, 2.99573227355399, 2.484906649788, 2.56494935746154, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 4.90527477843843, 3.89182029811063, 3.46573590279973, NA, 4.15888308335967, 3.68887945411394, 4.34380542185368, 4.57471097850338, 4.57471097850338, 4.44265125649032, NA, 2.30258509299405, 3.29583686600433, NA, 1.94591014905531, 3.87120101090789, 3.55534806148941, 4.11087386417331, 4.36944785246702, 4.14313472639153, 2.77258872223978, NA, NA, 4.38202663467388, 4.68213122712422, 2.99573227355399, 3.95124371858143, 4.40671924726425, 3.91202300542815, 4.15888308335967, 4.07753744390572, 3.66356164612965, 2.19722457733622, 2.77258872223978, 4.35670882668959, 3.55534806148941, 4.18965474202643, 4.80402104473326, 4.48863636973214, 4.70048036579242, NA, NA, 3.78418963391826, 3.3322045101752, 4.17438726989564, NA, 3.09104245335832, 4.07753744390572, 3.13549421592915, 3.43398720448515, 3.78418963391826, 3.04452243772342, 2.19722457733622, NA, 3.80666248977032, 5.12396397940326, 4.29045944114839, NA, 4.33073334028633, 4.77068462446567, 4.43081679884331, 4.44265125649032, 4.56434819146784, 4.35670882668959, 4.29045944114839, 4.51085950651685, 3.85014760171006, 3.46573590279973, 2.99573227355399, 3.13549421592915, 3.04452243772342, 3.17805383034795, 3.78418963391826, 3.04452243772342, 3.3322045101752, 2.19722457733622, 2.56494935746154, 3.8286413964891, 2.89037175789616, 2.56494935746154, 3.17805383034795, 2.77258872223978, 2.56494935746154, 3.13549421592915, 3.58351893845611, 1.94591014905531, 2.63905732961526, 3.40119738166216, NA, 2.63905732961526, 2.89037175789616, 2.99573227355399));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall17# #argv <- list(c(1.1+0i, NA, 3+0i));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall18# #argv <- list(structure(c('***', '***', '*', '*'), legend = '0 ‘***’ 0.001 ‘**’ 0.01 ‘*’ 0.05 ‘.’ 0.1 ‘ ’ 1', class = 'noquote'));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall19# #argv <- list(structure(3.14159265358979, .Tsp = c(1, 1, 1), class = 'ts'));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall2# #argv <- list(structure(1:10, .Tsp = c(1920.5, 1921.25, 12), class = 'ts'));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall20# #argv <- list(structure(c(0.00290239468554394, 0.00140705152597278, 0.00182415100508828, 0.000171517300342801, 0.0747454613066304, 0.00103234723292907, 0.000179983318697126, 0.0352586084465556, 0.00336847595628202, 0.0640696486471412, 0.013210800275195, 0.00194778778741287, 0.00351950115137133, 0.000700468320296444, 0.00252844357735001, 0.0143720121954949, 0.0092342255427433, 7.64817786749446e-06, 0.00387339857745543, 0.00121246491006704, 0.00624917129689855, 0.00187753034805145, 0.000103002251547083, 0.0136703020254034, 0.000349542811339773, 0.00120367047056317, 0.00194205014408538, 0.00462815827742801, 0.000149291834133954, 0.00193441236645676, 9.00084520363835e-05, 0.0160915134527436, 0.0034667595853861, 0.00481936427422654, 3.13343033856193e-05, 0.0564685345533007, 0.00929771993193245, 0.0103876340982416, 0.0133005891226511, 0.0325989357511191, 0.00228122925969391, 0.0460976655088242, 0.0030036374596782, 0.000271060875811076, 0.0301696315261026, 4.72002631048293e-05, 0.0262321004865234, 0.00594174673473018, 0.00288915040856097, 0.00635277836091401, 0.00569342819072192, 0.0163907345734164, 0.000360581939026221, 0.000237725871915377, 0.0164062036225434, 0.0238391417439455, NaN, 0.0421542087325977, 0.00133954856768466, 0.0113421570571087, 0.00818242287729128, 0.000149291834133954, 0.00162069399881579, 0.00180262291288582, 0.0043164627226381, 0.000407784303899558, 0.0087630128035445, 0.00179253664026378, 0.000416739394150714, 0.0143720121954949, 0.000179983318697137, 0.00115986529332947, 0.00377736311314377, 0.00219491136307178, 0.000700468320296447, 0.000522557531637987, 9.86336244510677e-05, 0.0216346027446621, 0.000659639144027213, 0.0137501462695059, 5.91425796333253e-08, 0.0279425064631674, 0.000170828237014783, 0.00424546903556132, 0.0114879015536739, 0.000173346990819205, 0.00138111062254461, 0.00772582941114727, 0.0277947034678616, 0.00892024547056825, 0.061857770987456, 0.0125790610228498, 0.0277947034678616), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93')));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall21# #argv <- list(structure(c(1920, 1920, 1920, 1920, 1920, 1920, 1921, 1921, 1921, 1921), .Tsp = c(1920.5, 1921.25, 12), class = 'ts'));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall23# #argv <- list(structure(c(2671, 6.026e+77, 3.161e+152, 3.501e+299, 2.409e+227, 1.529e+302), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.')));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall24# #argv <- list(structure(c(1, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 3, 4, 4, 4, 4, 4, 4, 4, 4, 4, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 6, 7, 8, 8, 8, 8, 8, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 10, 11, 11, 11, 12, 13, 13, 14, 14, 14, 14, 15, 15, 15, 15, 16, 16, 16, 17, 17, 17, 18, 18, 18, 18, 18, 18, 18, 18, 18, 18, 18, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 19, 20, 20, 20, 20, 20, 20, 20, 20, 20, 20, 20, 20, 20, 20, 20, 20, 21, 21, 21, 21, 21, 21, 21, 22, 22, 22, 22, 22, 22, 22, 22, 22, 22, 23, 23, 23, 23, 23, 23, 23, 23, 23, 23, 23, 23, 23, 23, 23, 23, 23, 23, 7, 7.4, 7.4, 7.4, 7.4, 7.4, 7.4, 7.4, 7.4, 7.4, 7.4, 5.3, 6.1, 6.1, 6.1, 6.1, 6.1, 6.1, 6.1, 6.1, 6.1, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 5.6, 5.7, 5.3, 5.3, 5.3, 5.3, 5.3, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 6.6, 5.3, 7.7, 7.7, 7.7, 6.2, 5.6, 5.6, 5.2, 5.2, 5.2, 5.2, 6, 6, 6, 6, 5.1, 5.1, 5.1, 7.6, 7.6, 7.6, 5.8, 5.8, 5.8, 5.8, 5.8, 5.8, 5.8, 5.8, 5.8, 5.8, 5.8, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 6.5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5.8, 5.8, 5.8, 5.8, 5.8, 5.8, 5.8, 5.5, 5.5, 5.5, 5.5, 5.5, 5.5, 5.5, 5.5, 5.5, 5.5, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 5.3, 24, 13, 15, 68, 39, 74, 22, 1, 8, 55, 24, 20, 51, 13, 3, 4, 5, 6, 15, 2, 8, 60, 67, 23, 58, 24, 22, 21, 37, 74, 59, 39, 14, 14, 19, 23, 70, 21, 22, 31, 29, 30, 45, 58, 17, 7, 19, 26, 39, 74, 57, 59, 12, 72, 70, 37, 64, 16, 18, 21, 22, 8, 62, 61, 63, 71, 105, 64, 10, 41, 8, 27, 11, 34, 32, 33, 68, 107, NA, 66, NA, 65, 48, 52, 43, 47, 46, 44, 41, 54, 28, 50, 40, NA, 69, NA, 75, 109, NA, 86, 112, 110, 104, 24, 111, 87, NA, NA, 92, 73, 85, 90, 89, NA, 83, NA, 102, NA, 108, 88, 91, 93, NA, 94, 84, NA, 106, NA, 95, 82, 56, 87, 109, 75, 104, 110, 112, 111, 24, 73, 85, 86, 90, 89, 102, 88, 92, 9, 49, 42, 38, 35, 36, 25, NA, NA, 9, 49, 42, NA, 36, 38, 25, 53, 79, 78, 103, 77, 80, 114, 97, 113, 76, 96, 81, 116, 99, 117, 115, 98, 101, 100, 12, 148, 42, 85, 107, 109, 156, 224, 293, 359, 370, 8, 16.1, 63.6, 6.6, 9.3, 13, 17.3, 105, 112, 123, 105, 122, 141, 200, 45, 130, 147, 187, 197, 203, 211, 62, 62, 19, 21, 13, 22, 29, 17, 19.6, 20.2, 21.1, 21.9, 24.2, 66, 87, 23.4, 24.6, 25.7, 28.6, 37.4, 46.7, 56.9, 60.7, 61.4, 62, 64, 82, 88, 91, 31, 45, 145, 300, 5, 50, 16, 17, 8, 10, 10, 8, 32, 30, 31, 2.9, 3.2, 7.6, 25.4, 32.9, 92.2, 1.2, 1.6, 9.1, 3.7, 5.3, 7.4, 17.9, 19.2, 23.4, 30, 38.9, 23.5, 26, 0.5, 0.6, 1.3, 1.4, 2.6, 3.8, 4, 5.1, 6.2, 6.8, 7.5, 7.6, 8.4, 8.5, 8.5, 10.6, 12.6, 12.7, 12.9, 14, 15, 16, 17.7, 18, 22, 22, 23, 23.2, 29, 32, 32.7, 36, 43.5, 49, 60, 64, 7.5, 8.8, 8.9, 9.4, 9.7, 9.7, 10.5, 10.5, 12, 12.2, 12.8, 14.6, 14.9, 17.6, 23.9, 25, 10.8, 15.7, 16.7, 20.8, 28.5, 33.1, 40.3, 4, 10.1, 11.1, 17.7, 22.5, 26.5, 29, 30.9, 37.8, 48.3, 5.8, 12, 12.1, 20.5, 20.5, 25.3, 35.9, 36.1, 36.3, 38.5, 41.4, 43.6, 44.4, 46.1, 47.1, 47.7, 49.2, 53.1, 0.359, 0.014, 0.196, 0.135, 0.062, 0.054, 0.014, 0.018, 0.01, 0.004, 0.004, 0.127, 0.411, 0.018, 0.509, 0.467, 0.279, 0.072, 0.012, 0.006, 0.003, 0.018, 0.048, 0.011, 0.007, 0.142, 0.031, 0.006, 0.01, 0.01, 0.006, 0.013, 0.005, 0.003, 0.086, 0.179, 0.205, 0.073, 0.045, 0.374, 0.2, 0.147, 0.188, 0.204, 0.335, 0.057, 0.021, 0.152, 0.217, 0.114, 0.15, 0.148, 0.112, 0.043, 0.057, 0.03, 0.027, 0.028, 0.034, 0.03, 0.039, 0.03, 0.11, 0.01, 0.01, 0.39, 0.031, 0.13, 0.011, 0.12, 0.17, 0.14, 0.11, 0.04, 0.07, 0.08, 0.21, 0.39, 0.28, 0.16, 0.064, 0.09, 0.42, 0.23, 0.13, 0.26, 0.27, 0.26, 0.11, 0.12, 0.038, 0.044, 0.046, 0.17, 0.21, 0.32, 0.52, 0.72, 0.32, 0.81, 0.64, 0.56, 0.51, 0.4, 0.61, 0.26, 0.24, 0.46, 0.22, 0.23, 0.28, 0.38, 0.27, 0.31, 0.2, 0.11, 0.43, 0.27, 0.15, 0.15, 0.15, 0.13, 0.19, 0.13, 0.066, 0.35, 0.1, 0.16, 0.14, 0.049, 0.034, 0.264, 0.263, 0.23, 0.147, 0.286, 0.157, 0.237, 0.133, 0.055, 0.097, 0.129, 0.192, 0.147, 0.154, 0.06, 0.057, 0.12, 0.154, 0.052, 0.045, 0.086, 0.056, 0.065, 0.259, 0.267, 0.071, 0.275, 0.058, 0.026, 0.039, 0.112, 0.065, 0.026, 0.123, 0.133, 0.073, 0.097, 0.096, 0.23, 0.082, 0.11, 0.11, 0.094, 0.04, 0.05, 0.022, 0.07, 0.08, 0.033, 0.017, 0.022), .Dim = c(182L, 5L), .Dimnames = list(NULL, c('event', 'mag', 'station', 'dist', 'accel'))));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall25# #argv <- list(structure(c(8.444, 12.244, 11.967, 32.826), .Names = c('+ Temp', '', '+ Soft', '- M.user')));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall26# #argv <- list(quote(cbind(X, M) ~ M.user + Temp + M.user:Temp));is.call(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall3# #argv <- list(structure(c(1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1961, 1961, 1961, 1961, 1961, 1961, 1961, 1961, 1961), .Tsp = c(1960.08333333333, 1961.66666666667, 12), class = 'ts'));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall4# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall5# #argv <- list(structure(list(), .Names = character(0), row.names = integer(0), class = 'data.frame'));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall6# #argv <- list(structure(list(var = structure(c(4L, 4L, 1L, 2L, 1L, 2L, 3L, 1L, 2L, 1L, 2L, 1L, 1L, 1L, 2L, 3L, 2L, 1L, 3L, 1L, 1L, 1L, 3L, 1L, 1L), .Label = c('', 'Age', 'Number', 'Start'), class = 'factor'), wt = c(318, 244, 114, 130, 49, 81, 65, 34, 31, 17, 14, 3, 11, 16, 74, 42, 35, 16, 19, 10, 9, 7, 32, 3, 29), dev = c(95.4, 34.5652173913044, 0, 34.5652173913044, 0, 34.5652173913044, 15.2086956521739, 0, 15.2086956521739, 0, 5.36385542168675, 0, 0, 3.57590361445783, 53.6385542168675, 22.1217391304348, 12.4434782608696, 0, 12.4434782608696, 0, 0, 0, 7.15180722891566, 0, 1.78795180722892), yval = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 2, 1, 2, 2, 2, 1, 1, 1, 1, 1, 2, 2, 2, 1, 2), complexity = c(0.165415284325709, 0.0551384281085695, 0.039, 0.0551384281085695, 0.039, 0.0551384281085695, 0.0515976951283394, 0.039, 0.0515976951283394, 0.039, 0.0515976951283394, 0.039, 0.039, 0.039, 0.165415284325709, 0.101449275362319, 0.0652173913043478, 0.039, 0.0652173913043478, 0.039, 0.039, 0.039, 0.0562248995983936, 0.039, 0.039), ncompete = c(2L, 2L, 0L, 2L, 0L, 2L, 2L, 0L, 2L, 0L, 2L, 0L, 0L, 0L, 2L, 2L, 2L, 0L, 2L, 0L, 0L, 0L, 2L, 0L, 0L), nsurrogate = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), yval2 = structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 2, 1, 2, 2, 2, 1, 1, 1, 1, 1, 2, 2, 2, 1, 2, 249, 219, 114, 105, 49, 56, 54, 34, 20, 17, 3, 3, 0, 2, 30, 26, 26, 16, 10, 10, 0, 0, 4, 3, 1, 69, 25, 0, 25, 0, 25, 11, 0, 11, 0, 11, 0, 11, 14, 44, 16, 9, 0, 9, 0, 9, 7, 28, 0, 28, 0.7, 0.849942146369685, 1, 0.730869001297017, 1, 0.591562233449249, 0.760430333245867, 1, 0.540359120657828, 1, 0.149906890130354, 1, 0, 0.0845588235294117, 0.305967312808818, 0.512362301101591, 0.651314765831648, 1, 0.418073227733056, 1, 0, 0, 0.0845588235294117, 1, 0.0225711481844946, 0.3, 0.150057853630315, 0, 0.269130998702983, 0, 0.408437766550751, 0.239569666754133, 0, 0.459640879342172, 0, 0.850093109869646, 0, 1, 0.915441176470588, 0.694032687191182, 0.487637698898409, 0.348685234168352, 0, 0.581926772266944, 0, 1, 1, 0.915441176470588, 0, 0.977428851815505, 1, 0.724358302776323, 0.320481927710843, 0.403876375065479, 0.137751004016064, 0.266125371049415, 0.199633315872184, 0.095582329317269, 0.104050986554915, 0.0477911646586345, 0.0562598218962808, 0.00843373493975903, 0.0478260869565217, 0.0664920551772307, 0.275641697223677, 0.142657586869216, 0.11222280426052, 0.0449799196787148, 0.0672428845818055, 0.0281124497991968, 0.0391304347826087, 0.0304347826086957, 0.132984110354461, 0.00843373493975903, 0.124550375414702), .Dim = c(25L, 6L), .Dimnames = list(NULL, c('', '', '', '', '', 'nodeprob')))), .Names = c('var', 'wt', 'dev', 'yval', 'complexity', 'ncompete', 'nsurrogate', 'yval2'), class = 'data.frame', row.names = c(1L, 2L, 4L, 5L, 10L, 11L, 22L, 44L, 45L, 90L, 91L, 182L, 183L, 23L, 3L, 6L, 12L, 24L, 25L, 50L, 51L, 13L, 7L, 14L, 15L)));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall7# #argv <- list(structure(c(2.828, -1.04, -2.738, 3.084), .Names = c('(Intercept)', 'age', 'wgt', 'prot')));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall8# #argv <- list(structure(list(a = 1), .Dim = 1L, .Dimnames = list('a')));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscall.testiscall9# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));is.call(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ischaracter.testischaracter1# #argv <- list('pch');is.character(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ischaracter.testischaracter10# #argv <- list('\'class\' is a reserved slot name and cannot be redefined');do.call('is.character', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ischaracter.testischaracter2# #argv <- list(structure(list(mai = c(0.51, 0.41, 0.41, 0.21), mar = c(5.1, 4.1, 4.1, 2.1), cex = 1, yaxs = 'r'), .Names = c('mai', 'mar', 'cex', 'yaxs')));is.character(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ischaracter.testischaracter3# #argv <- list(structure(list(usr = c(-0.04, 1.04, -0.04, 1.04), mgp = c(3, 1, 0)), .Names = c('usr', 'mgp')));is.character(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ischaracter.testischaracter4# #argv <- list(c(-1, 1, -1, 1));is.character(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ischaracter.testischaracter5# #argv <- list(structure(list(usr = c(-4.82721591443179, -1.44459960821772, -4.82721591443179, -1.44459960821772)), .Names = 'usr'));is.character(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ischaracter.testischaracter6# #argv <- list(structure(list(`character(0)` = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'character(0)', row.names = character(0), class = 'data.frame'));is.character(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ischaracter.testischaracter7# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.character(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ischaracter.testischaracter8# #argv <- list(structure(c(238L, 154L, 73L), .Dim = c(3L, 1L), .Dimnames = list(c('red', 'green', 'blue'), NULL)));is.character(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscomplex.testiscomplex1# #argv <- list(integer(0));is.complex(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscomplex.testiscomplex2# #argv <- list(structure(list(`character(0)` = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'character(0)', row.names = character(0), class = 'data.frame'));is.complex(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscomplex.testiscomplex3# #argv <- list(structure(1:24, .Dim = 2:4));is.complex(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscomplex.testiscomplex4# #argv <- list(NA_complex_);is.complex(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscomplex.testiscomplex5# #argv <- list(1.3+0i);is.complex(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscomplex.testiscomplex6# #argv <- list(complex(0));is.complex(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_iscomplex.testiscomplex7# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.complex(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isdouble.testisdouble1# #argv <- list(list(1, list(3, 'A')));is.double(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isdouble.testisdouble2# #argv <- list(structure(1:7, .Names = c('a1', 'a2', 'a3', 'a4', 'a5', 'a6', 'a7')));is.double(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isdouble.testisdouble3# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.double(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isdouble.testisdouble4# #argv <- list(structure(list(`character(0)` = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'character(0)', row.names = character(0), class = 'data.frame'));is.double(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isdouble.testisdouble5# #argv <- list(structure(1:24, .Dim = 2:4));is.double(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isdouble.testisdouble7# #argv <- list(structure(c(1, 5, 9, 13, 17, 21, 2, 6, 10, 14, 18, 22, 3, 7, 11, 15, 19, 23, 4, 8, 12, 16, 20, 24), .Dim = c(6L, 4L)));do.call('is.double', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment1# #argv <- list(structure(list(B = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L), .Label = c('I', 'II', 'III', 'IV', 'V', 'VI'), class = 'factor'), V = structure(c(3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L), .Label = c('Golden.rain', 'Marvellous', 'Victory'), class = 'factor'), N = structure(c(2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt'), class = 'factor'), Y = c(130L, 157L, 174L, 117L, 114L, 161L, 141L, 105L, 140L, 118L, 156L, 61L, 91L, 97L, 100L, 70L, 108L, 126L, 149L, 96L, 124L, 121L, 144L, 68L, 64L, 112L, 86L, 60L, 102L, 89L, 96L, 89L, 129L, 132L, 124L, 74L, 89L, 81L, 122L, 64L, 103L, 132L, 133L, 70L, 89L, 104L, 117L, 62L, 90L, 100L, 116L, 80L, 82L, 94L, 126L, 63L, 70L, 109L, 99L, 53L, 74L, 118L, 113L, 89L, 82L, 86L, 104L, 97L, 99L, 119L, 121L)), .Names = c('B', 'V', 'N', 'Y'), row.names = 2:72, class = 'data.frame'));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment10# #argv <- list(structure(list(breaks = c(26, 30, 54, 25, 70, 52, 51, 26, 67, 18, 21, 29, 17, 12, 18, 35, 30, 36, 36, 21, 24, 18, 10, 43, 28, 15, 26, 27, 14, 29, 19, 29, 31, 41, 20, 44, 42, 26, 19, 16, 39, 28, 21, 39, 29, 20, 21, 24, 17, 13, 15, 15, 16, 28), wool = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('A', 'B'), class = 'factor'), tension = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('L', 'M', 'H'), class = 'factor')), .Names = c('breaks', 'wool', 'tension'), row.names = c(NA, -54L), class = 'data.frame'));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment11# #argv <- list(structure(list(y = c(0.219628047744843, 0.360454661130887, NA, 0.114681204747219, -1.14267533343616, 0.772374419482067, 0.681741904304867, 0.171869265068012, 2.08409180391906, 0.367547276775469), x1 = c(1L, 2L, 3L, NA, 5L, 6L, 7L, 8L, 9L, 10L), x2 = 1:10, x3 = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0), wt = c(0, 1, 1, 1, 1, 1, 1, 1, 1, 1)), .Names = c('y', 'x1', 'x2', 'x3', 'wt'), row.names = c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j'), class = 'data.frame'));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment12# #argv <- list(structure(list(x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE), y = c(-0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861)), .Names = c('x', 'y'), row.names = c(NA, -10L), class = 'data.frame'));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment13# #argv <- list(structure(list(weight = c(1.9, 3.1, 3.3, 4.8, 5.3, 6.1, 6.4, 7.6, 9.8, 12.4), depression = c(2, 1, 5, 5, 20, 20, 23, 10, 30, 25)), .Names = c('weight', 'depression'), row.names = c(NA, -10L), class = 'data.frame'));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment14# #argv <- list(structure(list(loglik = c(-577.080015666702, -568.702653976085, -567.639101463216, -565.252511135152), Chisq = c(NA, 16.7547233812336, 2.12710502573896, 4.77318065612872), Df = c(NA, 1, 1, 3), `Pr(>|Chi|)` = c(NA, 4.25362427346476e-05, 0.144713844418628, 0.189179603743297)), .Names = c('loglik', 'Chisq', 'Df', 'Pr(>|Chi|)'), row.names = c('NULL', 'ph.ecog', 'wt.loss', 'poly(age, 3)'), class = c('anova', 'data.frame'), heading = 'Analysis of Deviance Table\n Cox model: response is Surv(time, status)\nTerms added sequentially (first to last)\n'));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment16# #argv <- list(numeric(0));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment2# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment3# #argv <- list(structure(list(ID = c(65L, 65L), Age = c(18L, 18L), OME = structure(c(1L, 1L), .Label = c('N/A', 'high', 'low'), class = 'factor'), Loud = c(35L, 50L), Noise = structure(c(2L, 2L), .Label = c('coherent', 'incoherent'), class = 'factor'), Correct = 0:1, Trials = c(1L, 1L), UID = c(71L, 71L), UIDn = c(71.1, 71.1)), .Names = c('ID', 'Age', 'OME', 'Loud', 'Noise', 'Correct', 'Trials', 'UID', 'UIDn'), row.names = c(691L, 701L), class = 'data.frame'));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment4# #argv <- list(c(1.21066831870929-1.66634219937781i, -1.3109785475009-4.03477541783013i, -8.31047673770943-2.70023589529419i, -14.5607479203187+10.5790080335186i, 0.0000113099668+37.0708585836817i, 61.7727497177743+44.8804951883406i, 149.572574104172-48.599145973822i, 100.099969025816-308.076538446181i, -392.173075447774-539.779307378543i, -1374.2485561312+0.00083854036i, -1663.75779164483+2289.96937670968i, 1801.61375934412+5544.78319295828i, 11420.6629218159+3710.7883116515i, 20010.0779347631-14538.198725138i, -0.0466281166-50944.5738831589i, -84891.1497420117-61676.9039120865i, -205549.85324714+66787.431606375i, -137561.979567894+423373.822075425i, 538943.735314369+741790.604941508i, 1888559.09402798-2.30472576i));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment5# #argv <- list(structure(c(FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = c(5L, 5L)));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment6# #argv <- list(structure(list(y = structure(c(8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536, 9.79424), .Tsp = c(1962.25, 1971.75, 4), class = 'ts'), lag.quarterly.revenue = c(8.79636, 8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536), price.index = c(4.70997, 4.70217, 4.68944, 4.68558, 4.64019, 4.62553, 4.61991, 4.61654, 4.61407, 4.60766, 4.60227, 4.5896, 4.57592, 4.58661, 4.57997, 4.57176, 4.56104, 4.54906, 4.53957, 4.51018, 4.50352, 4.4936, 4.46505, 4.44924, 4.43966, 4.42025, 4.4106, 4.41151, 4.3981, 4.38513, 4.3732, 4.3277, 4.32023, 4.30909, 4.30909, 4.30552, 4.29627, 4.27839, 4.27789), income.level = c(5.8211, 5.82558, 5.83112, 5.84046, 5.85036, 5.86464, 5.87769, 5.89763, 5.92574, 5.94232, 5.95365, 5.9612, 5.97805, 6.00377, 6.02829, 6.03475, 6.03906, 6.05046, 6.05563, 6.06093, 6.07103, 6.08018, 6.08858, 6.10199, 6.11207, 6.11596, 6.12129, 6.122, 6.13119, 6.14705, 6.15336, 6.15627, 6.16274, 6.17369, 6.16135, 6.18231, 6.18768, 6.19377, 6.2003), market.potential = c(12.9699, 12.9733, 12.9774, 12.9806, 12.9831, 12.9854, 12.99, 12.9943, 12.9992, 13.0033, 13.0099, 13.0159, 13.0212, 13.0265, 13.0351, 13.0429, 13.0497, 13.0551, 13.0634, 13.0693, 13.0737, 13.077, 13.0849, 13.0918, 13.095, 13.0984, 13.1089, 13.1169, 13.1222, 13.1266, 13.1356, 13.1415, 13.1444, 13.1459, 13.152, 13.1593, 13.1579, 13.1625, 13.1664)), .Names = c('y', 'lag.quarterly.revenue', 'price.index', 'income.level', 'market.potential'), row.names = c('1962.25', '1962.5', '1962.75', '1963', '1963.25', '1963.5', '1963.75', '1964', '1964.25', '1964.5', '1964.75', '1965', '1965.25', '1965.5', '1965.75', '1966', '1966.25', '1966.5', '1966.75', '1967', '1967.25', '1967.5', '1967.75', '1968', '1968.25', '1968.5', '1968.75', '1969', '1969.25', '1969.5', '1969.75', '1970', '1970.25', '1970.5', '1970.75', '1971', '1971.25', '1971.5', '1971.75'), class = 'data.frame'));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment7# #argv <- list(structure(c(1+0i, 5+0i, 9+0i, 13+0i, 17+0i, 21+0i, 2+0i, 6+0i, 10+0i, 14+0i, 18+0i, 22+0i, 3+0i, 7+0i, 11+0i, 15+0i, 19+0i, 23+0i, 4+0i, 8+0i, 12+0i, 16+0i, 20+0i, 24+0i), .Dim = c(6L, 4L)));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment8# #argv <- list(structure(list(z = c(-3.32814298919898, -2.50040106767383, -1.77388580318944, -1.1253131847654, -0.538436159302777, 0, 0.494272294062615, 0.955576378633541, 1.38763151510367, 1.79457990658358, 2.17975641634868, 2.54588157879649, 2.89520069061619), par.vals = structure(c(14.1116522107389, 16.2879401909036, 18.4642281710683, 20.640516151233, 22.8168041313977, 24.9930921115624, 27.1693800917271, 29.3456680718919, 31.5219560520566, 33.6982440322213, 35.874532012386, 38.0508199925507, 40.2271079727154, 9.77292620586829, 6.94555751970939, 5.3344468962477, 4.29948550876711, 3.58192055542193, 3.05706219239734, 2.6578922832996, 2.34490705796319, 2.09354140228955, 1.88766190416604, 1.71625883349025, 1.57157057930468, 1.44797941211333), .Dim = c(13L, 2L), .Dimnames = list(NULL, c('ymax', 'xhalf')))), .Names = c('z', 'par.vals'), row.names = c(NA, -13L), class = 'data.frame'));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isenvironment.testisenvironment9# #argv <- list(structure(list(GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962, Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551)), .Names = c('GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year', 'Employed'), row.names = 1947:1962, class = 'data.frame'));is.environment(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression1# #argv <- list(c(20L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 20L, 20L, 20L, 20L, 19L, 19L, 19L, 20L, 20L, 20L, 19L, 20L, 19L, 19L, 19L, 20L));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression10# #argv <- list(structure(list(a = 1), .Dim = 1L, .Dimnames = list('a')));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression11# #argv <- list(structure(list(var = structure(c(3L, 5L, 3L, 1L, 1L, 1L, 3L, 4L, 1L, 2L, 1L, 1L, 1L), .Label = c('', 'frost', 'life.exp', 'population', 'region'), class = 'factor'), n = c(50L, 21L, 13L, 10L, 3L, 8L, 29L, 21L, 4L, 17L, 9L, 8L, 8L), wt = c(50, 21, 13, 10, 3, 8, 29, 21, 4, 17, 9, 8, 8), dev = c(667.7458, 87.3866666666667, 18.8523076923077, 6.989, 2.84666666666667, 28.2, 222.311724137931, 116.909523809524, 10.18, 50.8823529411765, 24.24, 11.62, 14.415), yval = c(7.378, 4.23333333333333, 3.14615384615385, 2.69, 4.66666666666667, 6, 9.6551724137931, 8.56190476190476, 5.2, 9.35294117647059, 8.46666666666667, 10.35, 12.525), complexity = c(0.536203161735203, 0.0604037628905475, 0.0135031040639133, 0.00508384221318095, 0.01, 0.01, 0.136260236048519, 0.0836353757198433, 0.01, 0.0224971133344103, 0.01, 0.01, 0.01), ncompete = c(4L, 4L, 4L, 0L, 0L, 0L, 4L, 4L, 0L, 4L, 0L, 0L, 0L), nsurrogate = c(5L, 4L, 1L, 0L, 0L, 0L, 4L, 3L, 0L, 5L, 0L, 0L, 0L)), .Names = c('var', 'n', 'wt', 'dev', 'yval', 'complexity', 'ncompete', 'nsurrogate'), row.names = c(1L, 2L, 4L, 8L, 9L, 5L, 3L, 6L, 12L, 13L, 26L, 27L, 7L), class = 'data.frame'));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression12# #argv <- list(structure(c(1, 24.25, 56.5, 56.92771, 86.75, 117), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.')));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression13# #argv <- list(1.79769313486232e+308);is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression14# #argv <- list(c(1.1+0i, NA, 3+0i));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression15# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression16# #argv <- list(structure(c('***', '***', '*', '*'), legend = '0 ‘***’ 0.001 ‘**’ 0.01 ‘*’ 0.05 ‘.’ 0.1 ‘ ’ 1', class = 'noquote'));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression17# #argv <- list(structure(c(-0.0880891704401362, -0.508170309402877, -0.00510235947825228, 0.0737329622006759), .Names = c('(Intercept)', 'x1', 'z', 'x1:z')));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression18# #argv <- list(structure(c(-Inf, -Inf, -2.248e+263, -Inf, -3.777e+116, -1), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.')));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression19# #argv <- list(quote(print(.leap.seconds, tz = 'PST8PDT')));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression2# #argv <- list(structure(list(class = c('ordered', 'factor'), levels = character(0)), .Names = c('class', 'levels')));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression20# #argv <- list(c(-0.5, -0.47979797979798, -0.45959595959596, -0.439393939393939, -0.419191919191919, -0.398989898989899, -0.378787878787879, -0.358585858585859, -0.338383838383838, -0.318181818181818, -0.297979797979798, -0.277777777777778, -0.257575757575758, -0.237373737373737, -0.217171717171717, -0.196969696969697, -0.176767676767677, -0.156565656565657, -0.136363636363636, -0.116161616161616, -0.0959595959595959, -0.0757575757575757, -0.0555555555555555, -0.0353535353535353, -0.0151515151515151, 0.00505050505050508, 0.0252525252525253, 0.0454545454545455, 0.0656565656565657, 0.0858585858585859, 0.106060606060606, 0.126262626262626, 0.146464646464647, 0.166666666666667, 0.186868686868687, 0.207070707070707, 0.227272727272727, 0.247474747474748, 0.267676767676768, 0.287878787878788, 0.308080808080808, 0.328282828282828, 0.348484848484849, 0.368686868686869, 0.388888888888889, 0.409090909090909, 0.429292929292929, 0.44949494949495, 0.46969696969697, 0.48989898989899, 0.51010101010101, 0.53030303030303, 0.550505050505051, 0.570707070707071, 0.590909090909091, 0.611111111111111, 0.631313131313131, 0.651515151515152, 0.671717171717172, 0.691919191919192, 0.712121212121212, 0.732323232323232, 0.752525252525253, 0.772727272727273, 0.792929292929293, 0.813131313131313, 0.833333333333333, 0.853535353535354, 0.873737373737374, 0.893939393939394, 0.914141414141414, 0.934343434343434, 0.954545454545455, 0.974747474747475, 0.994949494949495, 1.01515151515152, 1.03535353535354, 1.05555555555556, 1.07575757575758, 1.0959595959596, 1.11616161616162, 1.13636363636364, 1.15656565656566, 1.17676767676768, 1.1969696969697, 1.21717171717172, 1.23737373737374, 1.25757575757576, 1.27777777777778, 1.2979797979798, 1.31818181818182, 1.33838383838384, 1.35858585858586, 1.37878787878788, 1.3989898989899, 1.41919191919192, 1.43939393939394, 1.45959595959596, 1.47979797979798, 1.5));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression21# #argv <- list(structure(list(dim = 1L, dimnames = list('a')), .Names = c('dim', 'dimnames')));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression22# #argv <- list(structure(c(NA, 6346.2), .Names = c('1', '2')));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression23# #argv <- list(3.97376540705816e-12);is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression25# #argv <- list(expression(quote(expression(b = pi^3))));do.call('is.expression', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression3# #argv <- list(c(TRUE, FALSE, TRUE, NA, FALSE, FALSE, TRUE));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression4# #argv <- list(structure(list(nationality = structure(c(1L, 2L, 2L, 3L, 3L, 1L), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(1L, 1L, 1L, 1L, 2L, 1L), .Label = c('no', 'yes'), class = 'factor'), title = structure(c(3L, 6L, 7L, 4L, 2L, 5L), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA, NA, NA, NA, NA, 1L), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('nationality', 'deceased', 'title', 'other.author'), class = 'data.frame', row.names = c(NA, -6L)));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression5# #argv <- list(structure(c('Min. :10.00 ', '1st Qu.:15.25 ', 'Median :20.50 ', 'Mean :21.67 ', '3rd Qu.:25.50 ', 'Max. :43.00 ', 'A:9 ', 'B:9 ', NA, NA, NA, NA), .Dim = c(6L, 2L), .Dimnames = list(c('', '', '', '', '', ''), c(' breaks', 'wool'))));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression6# #argv <- list(structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression7# #argv <- list(structure(list(), .Names = character(0), row.names = integer(0), class = 'data.frame'));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression8# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isexpression.testisexpression9# #argv <- list(structure(3.14159265358979, .Tsp = c(1, 1, 1), class = 'ts'));is.expression(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfactor.testIsFactor# #{is.factor(1)} [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfactor.testIsFactor# #{is.factor(c)} [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfactor.testIsFactor# #{x<-1;class(x)<-"factor";is.factor(x)} Error in class(x) <- "factor" : adding class "factor" to an invalid object ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfactor.testIsFactor# #{x<-1;class(x)<-"foo";is.factor(x)} [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfactor.testisfactor1# #argv <- structure(list(x = c(TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE)), .Names = 'x');do.call('is.factor', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(1) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(1:1) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(1:100) } [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [16] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [31] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [46] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [61] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [76] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [91] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(1L) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(as.raw(c(1L,2L,3L))) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(c(1,2,-Inf)) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(c(1,2,3)) } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(c(1,2,Inf)) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(c(1L,2L,3L)) } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(c(1L,2L,NA)) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(c(Inf,2,-Inf)) } [1] FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(c(Inf,NA,-Inf)) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(c(TRUE, FALSE)) } [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testIsFinite# #{ is.finite(c(TRUE, FALSE, NA)) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite1# #argv <- list(c(20.1635649375266, 0.00464806897188935, 7.66871331765456, 12.5627629785965, 11.5797681339384, 12.9719582729673, 25.2769526097163, -1.81739378653632, 0.81215865601413, -3.83170645669318, -0.246853801421158, 3.46135095276697, 2.4554639832607, -3.21187324485145, -3.0183971859156));is.finite(argv[[1]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite10# #argv <- list(structure(c(-32.6915744137254, -24.6945405669482, -24.6945405669482, -357.79068676373), .Dim = c(2L, 2L)));is.finite(argv[[1]]); [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite11# #argv <- list(3.18309886183776e-301);is.finite(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite12# #argv <- list(c(0.0599, 0.00599, 0.000599, 5.99e-05, 5.99e-06, 5.99e-07));is.finite(argv[[1]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite13# #argv <- list(structure(c(-0.560475646552213+0i, 0.7424437487+0.205661411508856i, 1.39139505579429-0.26763356813179i, 0.928710764113827-0.221714979045717i, -0.46926798541295+1.18846175213664i, 0.7424437487-0.205661411508856i, 0.460916205989202+0i, -0.452623703774585+0.170604003753717i, -0.094501186832143+0.54302538277632i, -0.331818442379127+0.612232958468282i, 1.39139505579429+0.26763356813179i, -0.452623703774585-0.170604003753717i, 0.400771450594052+0i, -0.927967220342259+0.479716843914174i, -0.790922791530657+0.043092176305418i, 0.928710764113827+0.221714979045717i, -0.094501186832143-0.54302538277632i, -0.927967220342259-0.479716843914174i, 0.701355901563686+0i, -0.600841318509537+0.213998439984336i, -0.46926798541295-1.18846175213664i, -0.331818442379127-0.612232958468282i, -0.790922791530657-0.043092176305418i, -0.600841318509537-0.213998439984336i, -0.625039267849257+0i), .Dim = c(5L, 5L)));is.finite(argv[[1]]); [,1] [,2] [,3] [,4] [,5] [1,] TRUE TRUE TRUE TRUE TRUE [2,] TRUE TRUE TRUE TRUE TRUE [3,] TRUE TRUE TRUE TRUE TRUE [4,] TRUE TRUE TRUE TRUE TRUE [5,] TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite14# #argv <- list(structure(2L, .Label = c('Northeast', 'South', 'North Central', 'West'), class = 'factor'));is.finite(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite15# #argv <- list(c(0.0099, 0.099, 0.99, 9.9, 99, 990, 9900, 99000, 990000, 9900000, 9.9e+07, 9.9e+08, 9.9e+09, 9.9e+10));is.finite(argv[[1]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite16# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));is.finite(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite17# #argv <- list(NULL);is.finite(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite18# #argv <- list(structure(1, .Tsp = c(1, 1, 1), class = 'ts'));is.finite(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite19# #argv <- list(structure(c(100, -1e-13, Inf, -Inf, NaN, 3.14159265358979, NA), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')));is.finite(argv[[1]]); 100 -1e-13 Inf -Inf NaN 3.14 NA TRUE TRUE FALSE FALSE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite2# #argv <- list(c(NA, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96, 97, 98, 99, 100));is.finite(argv[[1]]); [1] FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [13] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [25] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [37] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [49] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [61] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [73] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [85] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [97] TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite20# #argv <- list(structure(c(100L, 0L, NA, NA, NA, 3L, NA), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')));is.finite(argv[[1]]); 100 -1e-13 Inf -Inf NaN 3.14 NA TRUE TRUE FALSE FALSE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite21# #argv <- list(c(1.86606598307361, 339033474310168, 6.15968019059533e+28, 1.11911250438065e+43, 2.03324321833028e+57, 3.69406826275609e+71, 6.71151400229846e+85, 1.21937162496937e+100, 2.2153975381282e+114, 4.02501267984465e+128, 7.31278553581751e+142, 1.32861276588395e+157, 2.41387071044804e+171, 4.38560576593759e+185, 7.96792382084694e+199, 1.44764060891943e+214, 2.63012470966353e+228, 4.77850368783602e+242, 8.6817546752692e+256, 1.57733192575377e+271));is.finite(argv[[1]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [16] TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite22# #argv <- list(structure(1:7, .Dim = c(1L, 7L)));is.finite(argv[[1]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [1,] TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite23# #argv <- list(structure(c(-4, 0, 0, 0, 0, 0, 0, -406.725, 41.7955066364795, 0, 0, 0, 0, 0, -1550.79375, 381.717151319926, 49.8228991342168, 0, 0, 0, 0, -1277.325, 224.617432123818, -31.1858918860748, -282.060212912726, 0, 0, 0, -1042.675, 125.261805546114, -29.9849484767744, 164.425554254677, -170.353263600129, 0, 0, -469.696, 26.3795103523805, 4.19691803785862, -3.18974110831568, 0.0462484557378925, 1.46320172717486, 0, -7818, 18.2758880432689, 1.77525956575195, -1.45298766739792, -0.449176219307484, -0.281900648530911, -0.669305080560524), .Dim = c(7L, 7L), .Dimnames = list(c('1947', '1948', '1949', '1950', '1951', '1952', '1953'), c('(Intercept)', 'GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year'))));is.finite(argv[[1]]); (Intercept) GNP.deflator GNP Unemployed Armed.Forces Population Year 1947 TRUE TRUE TRUE TRUE TRUE TRUE TRUE 1948 TRUE TRUE TRUE TRUE TRUE TRUE TRUE 1949 TRUE TRUE TRUE TRUE TRUE TRUE TRUE 1950 TRUE TRUE TRUE TRUE TRUE TRUE TRUE 1951 TRUE TRUE TRUE TRUE TRUE TRUE TRUE 1952 TRUE TRUE TRUE TRUE TRUE TRUE TRUE 1953 TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite24# #argv <- list(c(13L, 13L));is.finite(argv[[1]]); [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite25# #argv <- list(structure(c(13991, 13995), class = 'Date'));is.finite(argv[[1]]); [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite3# #argv <- list(structure(485.051413351662, .Names = 'value'));is.finite(argv[[1]]); value TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite4# #argv <- list(151.670620533678);is.finite(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite5# #argv <- list(c(NA, 5, 9, 1, 2, 5, 6, 7, 8, 3, 8));is.finite(argv[[1]]); [1] FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite6# #argv <- list(structure(1.27861470300044, .Dim = c(1L, 1L), .Dimnames = list('(Intercept)', '(Intercept)')));is.finite(argv[[1]]); (Intercept) (Intercept) TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite7# #argv <- list(c(3.16233404821525, 0.257188565034331, -0.453229834209339, 0.242190153165057, -0.923637244637281, -0.792686406797337, -0.000583432444331871, -0.115409318984254, 0.305847927531439, 0.0246693430266492, 0.461347310132161, -0.236100949717949, 0.28892702011061, -0.134702428025256, -0.00354133265015019, -0.239319416508562, -0.657338306370259, 0.617201588652923, 0.864066808989359, 0.903680787204032, 0.524476724719486, 1.12851069606821, -0.0690532444696005, 0.111965689984579, -0.494558736384601, -0.26678456955063, -0.953423764504691, 0.0388401464034938, -0.280977489674148, -0.0317343673308523, 0.332270617799988, -0.0953997363217814));is.finite(argv[[1]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [16] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [31] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite8# #argv <- list(c(96L, 78L, 73L, 91L, 47L, 32L, 20L, 23L, 21L, 24L, 44L, 21L, 28L, 9L, 13L, 46L, 18L, 13L, 24L, 16L, 13L, 23L, 36L, 7L, 14L, 30L, NA, 14L, 18L, 20L));is.finite(argv[[1]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [13] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [25] TRUE TRUE FALSE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfinite.testisfinite9# #argv <- list(structure(c(0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.0220588235294118, 0.00735294117647059, 0.0147058823529412, 0.0110294117647059, 0.0257352941176471, 0.00735294117647059, 0.0294117647058824, 0.0147058823529412, 0.00735294117647059, 0.00735294117647059, 0.00367647058823529, 0.0110294117647059, 0.0110294117647059, 0.0147058823529412, 0.0110294117647059, 0.00735294117647059, 0.00367647058823529, 0.00735294117647059, 0.0110294117647059, 0.00367647058823529, 0.00367647058823529, 0.00735294117647059, 0.00367647058823529, 0.0110294117647059, 0.00367647058823529, 0.00735294117647059, 0.00735294117647059, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00735294117647059, 0.00735294117647059, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00735294117647059, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00735294117647059, 0.00735294117647059, 0.0147058823529412, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00735294117647059, 0.00367647058823529, 0.0183823529411765, 0.00735294117647059, 0.00367647058823529, 0.0110294117647059, 0.00735294117647059, 0.00367647058823529, 0.00367647058823529, 0.0220588235294118, 0.00735294117647059, 0.00367647058823529, 0.00735294117647059, 0.0183823529411765, 0.00735294117647059, 0.00735294117647059, 0.00735294117647059, 0.0147058823529412, 0.0147058823529412, 0.00367647058823529, 0.00367647058823529, 0.0110294117647059, 0.0147058823529412, 0.00735294117647059, 0.00735294117647059, 0.00735294117647059, 0.00367647058823529, 0.0183823529411765, 0.0147058823529412, 0.00367647058823529, 0.0110294117647059, 0.00367647058823529, 0.00367647058823529, 0.0147058823529412, 0.00735294117647059, 0.0110294117647059, 0.00735294117647059, 0.00367647058823529, 0.0294117647058824, 0.00367647058823529, 0.0183823529411765, 0.00367647058823529, 0.0110294117647059, 0.0147058823529412, 0.0147058823529412, 0.00367647058823529, 0.0110294117647059, 0.00367647058823529, 0.00735294117647059, 0.0220588235294118, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.0220588235294118, 0.00735294117647059, 0.00735294117647059, 0.00367647058823529, 0.00367647058823529, 0.00735294117647059, 0.0110294117647059, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529, 0.00367647058823529), class = 'table', .Dim = 126L, .Dimnames = structure(list(fe = c('1.6', '1.667', '1.7', '1.733', '1.75', '1.783', '1.8', '1.817', '1.833', '1.85', '1.867', '1.883', '1.917', '1.933', '1.95', '1.967', '1.983', '2', '2.017', '2.033', '2.067', '2.083', '2.1', '2.133', '2.15', '2.167', '2.183', '2.2', '2.217', '2.233', '2.25', '2.267', '2.283', '2.3', '2.317', '2.333', '2.35', '2.367', '2.383', '2.4', '2.417', '2.483', '2.617', '2.633', '2.8', '2.883', '2.9', '3.067', '3.317', '3.333', '3.367', '3.417', '3.45', '3.5', '3.567', '3.6', '3.683', '3.717', '3.733', '3.75', '3.767', '3.817', '3.833', '3.85', '3.883', '3.917', '3.95', '3.966', '3.967', '4', '4.033', '4.05', '4.067', '4.083', '4.1', '4.117', '4.133', '4.15', '4.167', '4.183', '4.2', '4.233', '4.25', '4.267', '4.283', '4.3', '4.317', '4.333', '4.35', '4.366', '4.367', '4.383', '4.4', '4.417', '4.433', '4.45', '4.467', '4.483', '4.5', '4.517', '4.533', '4.55', '4.567', '4.583', '4.6', '4.617', '4.633', '4.65', '4.667', '4.7', '4.716', '4.733', '4.75', '4.767', '4.783', '4.8', '4.817', '4.833', '4.85', '4.883', '4.9', '4.933', '5', '5.033', '5.067', '5.1')), .Names = 'fe')));is.finite(argv[[1]]); fe 1.6 1.667 1.7 1.733 1.75 1.783 1.8 1.817 1.833 1.85 1.867 1.883 1.917 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE 1.933 1.95 1.967 1.983 2 2.017 2.033 2.067 2.083 2.1 2.133 2.15 2.167 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE 2.183 2.2 2.217 2.233 2.25 2.267 2.283 2.3 2.317 2.333 2.35 2.367 2.383 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE 2.4 2.417 2.483 2.617 2.633 2.8 2.883 2.9 3.067 3.317 3.333 3.367 3.417 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE 3.45 3.5 3.567 3.6 3.683 3.717 3.733 3.75 3.767 3.817 3.833 3.85 3.883 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE 3.917 3.95 3.966 3.967 4 4.033 4.05 4.067 4.083 4.1 4.117 4.133 4.15 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE 4.167 4.183 4.2 4.233 4.25 4.267 4.283 4.3 4.317 4.333 4.35 4.366 4.367 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE 4.383 4.4 4.417 4.433 4.45 4.467 4.483 4.5 4.517 4.533 4.55 4.567 4.583 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE 4.6 4.617 4.633 4.65 4.667 4.7 4.716 4.733 4.75 4.767 4.783 4.8 4.817 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE 4.833 4.85 4.883 4.9 4.933 5 5.033 5.067 5.1 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction1# #argv <- list(function (x, y) { c(x, y)});is.function(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction10# #argv <- list(structure(c(FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = c(5L, 5L)));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction11# #argv <- list(c(0.2853725+0.3927816i, -0.07283992154231+0.224178134292i, -0.10883955678256+0.035364093700981i, -0.0449501817243521-0.0326582354266614i, 8.2299281e-09-2.69753665872767e-02i, 0.0105954299973322-0.0076980245688633i, 0.00604728675391113+0.00196488543076221i, 0.00095395849586903+0.00293598723445021i, -0.00088096824266454+0.00121254736140417i, -7.27670402517897e-04-4.44010655e-10i, -2.07656947543323e-04-2.85815671682054e-04i, 5.3003554565545e-05-1.6312776087427e-04i, 7.9199339795869e-05-2.57333559721505e-05i, 3.27089023280074e-05+2.37644512768026e-05i, -1.79660253e-11+1.96291758626278e-05i, -7.70998422901389e-06+5.60161993213361e-06i, -4.4004307139296e-06-1.42979165736404e-06i, -6.9416605906477e-07-2.13643143624753e-06i, 6.4105505412914e-07-8.82334435385704e-07i, 5.29504214700362e-07+6.46186824e-13i));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction12# #argv <- list(structure(c(9, 13, 13, 18, 23, 28, 31, 34, 45, 48, 161, 5, 5, 8, 8, 12, 16, 23, 27, 30, 33, 43, 45, 1, 1, 0, 1, 1, 0, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1), .Dim = c(23L, 2L), .Dimnames = list(NULL, c('time', 'status')), type = 'right', class = 'Surv'));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction13# #argv <- list(structure(list(), .Names = character(0), row.names = integer(0), class = 'data.frame'));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction14# #argv <- list(structure(list(x = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1), y = c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10), fac = structure(c(1L, 3L, 2L, 3L, 3L, 1L, 2L, 3L, 2L, 2L), .Label = c('A', 'B', 'C'), class = 'factor')), .Names = c('x', 'y', 'fac'), row.names = c(NA, -10L), class = 'data.frame'));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction15# #argv <- list(structure(function (x) standardGeneric('dim', .Primitive('dim')), generic = structure('dim', package = 'base'), package = 'base', group = list(), valueClass = character(0), signature = 'x', default = .Primitive('dim'), skeleton = quote(.Primitive('dim')(x)), class = structure('standardGeneric', package = 'methods')));is.function(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction16# #argv <- list(structure(function (x, na.rm = FALSE, dims = 1, ...) standardGeneric('rowMeans'), generic = structure('rowMeans', package = 'base'), package = 'base', group = list(), valueClass = character(0), signature = c('x', 'na.rm', 'dims'), default = structure(function (x, na.rm = FALSE, dims = 1, ...) base::rowMeans(x, na.rm = na.rm, dims = dims, ...), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), generic = structure('rowMeans', package = 'base'), class = structure('derivedDefaultMethod', package = 'methods')), skeleton = quote((function (x, na.rm = FALSE, dims = 1, ...) base::rowMeans(x, na.rm = na.rm, dims = dims, ...))(x, na.rm, dims, ...)), class = structure('standardGeneric', package = 'methods')));is.function(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction17# #argv <- list(structure(c(2L, 1L, 3L), .Label = c('1', '2', NA), class = c('ordered', 'factor')));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction18# #argv <- list(structure(list(usr = c(0.568, 1.432, -1.08, 1.08), xaxp = c(0.6, 1.4, 4), yaxp = c(-1, 1, 4)), .Names = c('usr', 'xaxp', 'yaxp')));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction19# #argv <- list(structure(list(double.eps = 2.22044604925031e-16, double.neg.eps = 1.11022302462516e-16, double.xmin = 2.2250738585072e-308, double.xmax = 1.79769313486232e+308, double.base = 2L, double.digits = 53L, double.rounding = 5L, double.guard = 0L, double.ulp.digits = -52L, double.neg.ulp.digits = -53L, double.exponent = 11L, double.min.exp = -1022L, double.max.exp = 1024L, integer.max = 2147483647L, sizeof.long = 8L, sizeof.longlong = 8L, sizeof.longdouble = 16L, sizeof.pointer = 8L), .Names = c('double.eps', 'double.neg.eps', 'double.xmin', 'double.xmax', 'double.base', 'double.digits', 'double.rounding', 'double.guard', 'double.ulp.digits', 'double.neg.ulp.digits', 'double.exponent', 'double.min.exp', 'double.max.exp', 'integer.max', 'sizeof.long', 'sizeof.longlong', 'sizeof.longdouble', 'sizeof.pointer')));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction2# #argv <- list(c('a', 'b', NA, NA, NA, 'f', 'g', 'h', 'i', 'j', 'k', 'l'));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction20# #argv <- list(structure(list(extra = c(0.7, -1.6, -0.2, -1.2, -0.1, 3.4, 3.7, 0.8, 0, 2, 1.9, 0.8, 1.1, 0.1, -0.1, 4.4, 5.5, 1.6, 4.6, 3.4), group = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('1', '2'), class = 'factor'), ID = structure(c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L), .Label = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10'), class = 'factor')), .Names = c('extra', 'group', 'ID'), row.names = c(NA, -20L), class = 'data.frame'));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction22# #argv <- list(function(e1, e2) { ok <- switch(.Generic, `<` = , `>` = , `<=` = , `>=` = , `==` = , `!=` = TRUE, FALSE); if (!ok) { warning(sprintf('\'%s\' is not meaningful for ordered factors', .Generic)); return(rep.int(NA, max(length(e1), if (!missing(e2)) length(e2)))) }; if (.Generic %in% c('==', '!=')) return(NextMethod(.Generic)); nas <- is.na(e1) | is.na(e2); ord1 <- FALSE; ord2 <- FALSE; if (nzchar(.Method[1L])) { l1 <- levels(e1); ord1 <- TRUE }; if (nzchar(.Method[2L])) { l2 <- levels(e2); ord2 <- TRUE }; if (all(nzchar(.Method)) && (length(l1) != length(l2) || !all(l2 == l1))) stop('level sets of factors are different'); if (ord1 && ord2) { e1 <- as.integer(e1); e2 <- as.integer(e2) } else if (!ord1) { e1 <- match(e1, l2); e2 <- as.integer(e2) } else if (!ord2) { e2 <- match(e2, l1); e1 <- as.integer(e1) }; value <- get(.Generic, mode = 'function')(e1, e2); value[nas] <- NA; value});do.call('is.function', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction23# #argv <- list(function(x, width = 0.9 * getOption('width'), indent = 0, exdent = 0, prefix = '', simplify = TRUE, initial = prefix) { if (!is.character(x)) x <- as.character(x); indentString <- paste(rep.int(' ', indent), collapse = ''); exdentString <- paste(rep.int(' ', exdent), collapse = ''); y <- list(); UB <- TRUE; if (all(Encoding(x) == 'UTF-8')) UB <- FALSE else { enc <- Encoding(x) %in% c('latin1', 'UTF-8'); if (length(enc)) x[enc] <- enc2native(x[enc]) }; z <- lapply(strsplit(x, '\n[ \t\n]*\n', perl = TRUE, useBytes = UB), strsplit, '[ \t\n]', perl = TRUE, useBytes = UB); for (i in seq_along(z)) { yi <- character(); for (j in seq_along(z[[i]])) { words <- z[[i]][[j]]; nc <- nchar(words, type = 'w'); if (anyNA(nc)) { nc0 <- nchar(words, type = 'b'); nc[is.na(nc)] <- nc0[is.na(nc)] }; if (any(nc == 0L)) { zLenInd <- which(nc == 0L); zLenInd <- zLenInd[!(zLenInd %in% (grep('[.?!][)\'\']{0,1}$', words, perl = TRUE, useBytes = TRUE) + 1L))]; if (length(zLenInd)) { words <- words[-zLenInd]; nc <- nc[-zLenInd] } }; if (!length(words)) { yi <- c(yi, '', initial); next }; currentIndex <- 0L; lowerBlockIndex <- 1L; upperBlockIndex <- integer(); lens <- cumsum(nc + 1L); first <- TRUE; maxLength <- width - nchar(initial, type = 'w') - indent; while (length(lens)) { k <- max(sum(lens <= maxLength), 1L); if (first) { first <- FALSE; maxLength <- width - nchar(prefix, type = 'w') - exdent; }; currentIndex <- currentIndex + k; if (nc[currentIndex] == 0L) upperBlockIndex <- c(upperBlockIndex, currentIndex - 1L) else upperBlockIndex <- c(upperBlockIndex, currentIndex); if (length(lens) > k) { if (nc[currentIndex + 1L] == 0L) { currentIndex <- currentIndex + 1L; k <- k + 1L; }; lowerBlockIndex <- c(lowerBlockIndex, currentIndex + 1L) }; if (length(lens) > k) lens <- lens[-seq_len(k)] - lens[k] else lens <- NULL }; nBlocks <- length(upperBlockIndex); s <- paste0(c(initial, rep.int(prefix, nBlocks - 1L)), c(indentString, rep.int(exdentString, nBlocks - 1L))); initial <- prefix; for (k in seq_len(nBlocks)) s[k] <- paste0(s[k], paste(words[lowerBlockIndex[k]:upperBlockIndex[k]], collapse = ' ')); yi <- c(yi, s, prefix) }; y <- if (length(yi)) c(y, list(yi[-length(yi)])) else c(y, '') }; if (simplify) y <- as.character(unlist(y)); y});do.call('is.function', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction24# #argv <- list(function(..., na.rm) { coerceTimeUnit <- function(x) { as.vector(switch(attr(x, 'units'), secs = x, mins = 60 * x, hours = 60 * 60 * x, days = 60 * 60 * 24 * x, weeks = 60 * 60 * 24 * 7 * x)) }; ok <- switch(.Generic, max = , min = , sum = , range = TRUE, FALSE); if (!ok) stop(gettextf('\'%s\' not defined for \'difftime\' objects', .Generic), domain = NA); x <- list(...); Nargs <- length(x); if (Nargs == 0) { .difftime(do.call(.Generic), 'secs') } else { units <- sapply(x, function(x) attr(x, 'units')); if (all(units == units[1L])) { args <- c(lapply(x, as.vector), na.rm = na.rm) } else { args <- c(lapply(x, coerceTimeUnit), na.rm = na.rm); units <- 'secs' }; .difftime(do.call(.Generic, args), units[[1L]]) }});do.call('is.function', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction25# #argv <- list(structure(list(platform = 'x86_64-unknown-linux-gnu', arch = 'x86_64', os = 'linux-gnu', system = 'x86_64, linux-gnu', status = '', major = '3', minor = '1.1', year = '2014', month = '07', day = '10', `svn rev` = '66115', language = 'R', version.string = 'R version 3.1.1 (2014-07-10)', nickname = 'Sock it to Me'), .Names = c('platform', 'arch', 'os', 'system', 'status', 'major', 'minor', 'year', 'month', 'day', 'svn rev', 'language', 'version.string', 'nickname'), class = 'simple.list'));do.call('is.function', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction26# #argv <- list(function(x, format = '', usetz = FALSE, ...) { if (!inherits(x, 'POSIXlt')) stop('wrong class'); if (format == '') { times <- unlist(unclass(x)[1L:3L]); secs <- x$sec; secs <- secs[!is.na(secs)]; np <- getOption('digits.secs'); if (is.null(np)) np <- 0L else np <- min(6L, np); if (np >= 1L) for (i in seq_len(np) - 1L) if (all(abs(secs - round(secs, i)) < 1e-06)) { np <- i; break }; format <- if (all(times[!is.na(times)] == 0)) '%Y-%m-%d' else if (np == 0L) '%Y-%m-%d %H:%M:%S' else paste0('%Y-%m-%d %H:%M:%OS', np) }; y <- .Internal(format.POSIXlt(x, format, usetz)); names(y) <- names(x$year); y});do.call('is.function', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction27# #argv <- list(function(name, cond = NULL) { i <- 1L; repeat { r <- .Internal(.getRestart(i)); if (is.null(r)) return(NULL) else if (name == r[[1L]] && (is.null(cond) || is.null(r$test) || r$test(cond))) return(r) else i <- i + 1L }});do.call('is.function', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction28# #argv <- list(function(x, width = 12, ...) { if (is.character(x)) return(format.default(x, ...)); if (is.null(width)) width = 12L; n <- length(x); rvec <- rep.int(NA_character_, n); for (i in seq_len(n)) { y <- x[[i]]; cl <- oldClass(y); if (m <- match('AsIs', cl, 0L)) oldClass(y) <- cl[-m]; rvec[i] <- toString(y, width = width, ...) }; dim(rvec) <- dim(x); dimnames(rvec) <- dimnames(x); format.default(rvec, justify = 'right')});do.call('is.function', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction29# #argv <- list(function(x, i, ...) structure(NextMethod('['), class = class(x)));do.call('is.function', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction3# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction31# #argv <- list(function(qr, y) { if (!is.qr(qr)) stop('first argument must be a QR decomposition'); n <- as.integer(nrow(qr$qr)); if (is.na(n)) stop('invalid nrow(qr$qr)'); p <- as.integer(ncol(qr$qr)); if (is.na(p)) stop('invalid ncol(qr$qr)'); k <- as.integer(qr$rank); if (is.na(k)) stop('invalid ncol(qr$rank)'); im <- is.matrix(y); if (!im) y <- as.matrix(y); ny <- as.integer(ncol(y)); if (is.na(ny)) stop('invalid ncol(y)'); if (p == 0L) return(if (im) matrix(0, p, ny) else numeric()); ix <- if (p > n) c(seq_len(n), rep(NA, p - n)) else seq_len(p); if (is.complex(qr$qr)) { coef <- matrix(NA_complex_, nrow = p, ncol = ny); coef[qr$pivot, ] <- .Internal(qr_coef_cmplx(qr, y))[ix, ]; return(if (im) coef else c(coef)) }; if (isTRUE(attr(qr, 'useLAPACK'))) { coef <- matrix(NA_real_, nrow = p, ncol = ny); coef[qr$pivot, ] <- .Internal(qr_coef_real(qr, y))[ix, ]; return(if (im) coef else c(coef)) }; if (k == 0L) return(if (im) matrix(NA, p, ny) else rep.int(NA, p)); storage.mode(y) <- 'double'; if (nrow(y) != n) stop('qr and y must have the same number of rows'); z <- .Fortran(.F_dqrcf, as.double(qr$qr), n, k, as.double(qr$qraux), y, ny, coef = matrix(0, nrow = k, ncol = ny), info = integer(1L), NAOK = TRUE)[c('coef', 'info')]; if (z$info) stop('exact singularity in qr.coef'); if (k < p) { coef <- matrix(NA_real_, nrow = p, ncol = ny); coef[qr$pivot[seq_len(k)], ] <- z$coef } else coef <- z$coef; if (!is.null(nam <- colnames(qr$qr))) if (k < p) rownames(coef)[qr$pivot] <- nam else rownames(coef) <- nam; if (im && !is.null(nam <- colnames(y))) colnames(coef) <- nam; if (im) coef else drop(coef)});do.call('is.function', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction32# #argv <- list(function(cpu = Inf, elapsed = Inf, transient = FALSE) .Internal(setTimeLimit(cpu, elapsed, transient)));do.call('is.function', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction4# #argv <- list(structure(c(1, 0.341108926893721, 7.03552967282433, 0.0827010685995216, 2.31431632448833, 2.09774421189194, 17.4719768806091, 0.00710660186854106, 0.341108926893721, 6.24415190746514, 0.0686360870302571, 2.93161486304804, 1, 20.6254633582673, 0.242447681896313, 6.78468413466471, 6.14977811045541, 51.2211071100253, 0.02083381966358, 1, 18.3054485390546, 0.201214572879361, 0.142135709250525, 0.0484837592557245, 1, 0.0117547750411693, 0.328946992211217, 0.298164361383444, 2.48339182593415, 0.00101010189694619, 0.0484837592557245, 0.887516960035576, 0.00975563891022635, 12.0917421858535, 4.12460120129202, 85.071810944714, 1, 27.984116332225, 25.3653821820638, 211.266639917518, 0.0859311976119033, 4.12460120129202, 75.5026750343739, 0.829929869015672, 0.432093050296869, 0.147390796704999, 3.04000347678479, 0.0357345569939779, 1, 0.906420695258988, 7.54951978505874, 0.00307071327862333, 0.147390796704999, 2.69805464421362, 0.0296571762053451, 0.476702542822467, 0.16260749282968, 3.35385488513828, 0.0394238096955273, 1.10324047677913, 1, 8.32893580712171, 0.00338773518156042, 0.16260749282968, 2.97660309205839, 0.0327189972167077, 0.0572345079685763, 0.0195232015944512, 0.402675079122419, 0.00473335496976909, 0.132458756115733, 0.120063357811564, 1, 0.000406742861274512, 0.0195232015944512, 0.357380962104814, 0.00392835267006514, 140.714228614202, 47.998879521268, 989.999130803802, 11.6372170735519, 325.65723636963, 295.182458606281, 2458.55574912007, 1, 47.998879521268, 878.641019008853, 9.65807404155984, 2.93161486304804, 1, 20.6254633582673, 0.242447681896313, 6.78468413466471, 6.14977811045541, 51.2211071100253, 0.02083381966358, 1, 18.3054485390546, 0.201214572879361, 0.160149851384054, 0.0546285439478035, 1.12673903151092, 0.0132445638455158, 0.370637415422497, 0.335953423776254, 2.79813450081517, 0.00113812123309249, 0.0546285439478035, 1, 0.0109920591374787, 14.5695951396408, 4.96981896335886, 102.50481892598, 1.20492108711069, 33.7186518728567, 30.5632838737905, 254.559629439639, 0.103540312043258, 4.96981896335886, 90.9747652821832, 1), .Dim = c(11L, 11L), .Dimnames = list(c('ATS', 'BEF', 'DEM', 'ESP', 'FIM', 'FRF', 'IEP', 'ITL', 'LUF', 'NLG', 'PTE'), c('ATS', 'BEF', 'DEM', 'ESP', 'FIM', 'FRF', 'IEP', 'ITL', 'LUF', 'NLG', 'PTE'))));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction5# #argv <- list(structure(c(1+0i, 5+0i, 9+0i, 13+0i, 17+0i, 21+0i, 2+0i, 6+0i, 10+0i, 14+0i, 18+0i, 22+0i, 3+0i, 7+0i, 11+0i, 15+0i, 19+0i, 23+0i, 4+0i, 8+0i, 12+0i, 16+0i, 20+0i, 24+0i), .Dim = c(6L, 4L)));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction6# #argv <- list(structure(list(Df = c(1L, 7L), `Sum Sq` = c(158.407612694902, 204.202165082876), `Mean Sq` = c(158.407612694902, 29.1717378689823), `F value` = c(5.43017400630538, NA), `Pr(>F)` = c(0.052592726218915, NA)), .Names = c('Df', 'Sum Sq', 'Mean Sq', 'F value', 'Pr(>F)'), row.names = c('depression', 'Residuals'), class = c('anova', 'data.frame'), heading = c('Analysis of Variance Table\n', 'Response: weight')));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction7# #argv <- list(structure(list(GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962, Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551)), .Names = c('GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year', 'Employed'), row.names = 1947:1962, class = 'data.frame'));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction8# #argv <- list(structure(c(112, 118, 132, 129, 121, 135, 148, 148, 136, 119, 104, 118, 115, 126, 141, 135, 125, 149, 170, 170, 158, 133, 114, 140, 145, 150, 178, 163, 172, 178, 199, 199, 184, 162, 146, 166, 171, 180, 193, 181, 183, 218, 230, 242, 209, 191, 172, 194, 196, 196, 236, 235, 229, 243, 264, 272, 237, 211, 180, 201, 204, 188, 235, 227, 234, 264, 302, 293, 259, 229, 203, 229, 242, 233, 267, 269, 270, 315, 364, 347, 312, 274, 237, 278, 284, 277, 317, 313, 318, 374, 413, 405, 355, 306, 271, 306, 315, 301, 356, 348, 355, 422, 465, 467, 404, 347, 305, 336, 340, 318, 362, 348, 363, 435, 491, 505, 404, 359, 310, 337, 360, 342, 406, 396, 420, 472, 548, 559, 463, 407, 362, 405, 417, 391, 419, 461, 472, 535, 622, 606, 508, 461, 390, 432), .Tsp = c(1949, 1960.91666666667, 12), class = 'ts'));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isfunction.testisfunction9# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.function(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite1# #argv <- list(structure(c(100L, 0L, NA, NA, NA, 3L, NA), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')));is.infinite(argv[[1]]); 100 -1e-13 Inf -Inf NaN 3.14 NA FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite10# #argv <- list(structure(c(100, -1e-13, Inf, -Inf, NaN, 3.14159265358979, NA), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')));is.infinite(argv[[1]]); 100 -1e-13 Inf -Inf NaN 3.14 NA FALSE FALSE TRUE TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite11# #argv <- list(structure(c(0.140840156507829, 0.04056135019562, 0.0029302031336855, 0.244192917875952, 0.613916838192149, 0.0888451715064135, 0.0786481028238466, 0.000549230092684491, 0.00048785961836479, 0.235214398525727, 0.000402612842061681, 0.00423992719924668, 0.0355604120039037, 0.00432748168352161, 0.170388213068447, 0.466682597016338), .Names = c('1947', '1948', '1949', '1950', '1951', '1952', '1953', '1954', '1955', '1956', '1957', '1958', '1959', '1960', '1961', '1962')));is.infinite(argv[[1]]); 1947 1948 1949 1950 1951 1952 1953 1954 1955 1956 1957 1958 1959 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 1960 1961 1962 FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite12# #argv <- list(4);is.infinite(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite13# #argv <- list(structure(1:24, .Dim = 2:4));is.infinite(argv[[1]]); , , 1 [,1] [,2] [,3] [1,] FALSE FALSE FALSE [2,] FALSE FALSE FALSE , , 2 [,1] [,2] [,3] [1,] FALSE FALSE FALSE [2,] FALSE FALSE FALSE , , 3 [,1] [,2] [,3] [1,] FALSE FALSE FALSE [2,] FALSE FALSE FALSE , , 4 [,1] [,2] [,3] [1,] FALSE FALSE FALSE [2,] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite14# #argv <- list(structure(c(1, 0.5, 0.5, 1), .Dim = c(2L, 2L), .Dimnames = list(c('A', 'B'), c('A', 'B'))));is.infinite(argv[[1]]); A B A FALSE FALSE B FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite15# #argv <- list(c(21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 21L, 36L, 51L, 66L, 81L, 96L, 111L, 126L, 141L, 156L, 171L, 178L, 185L, 192L, 199L, 206L, 213L, 220L, 227L, 234L, 241L, 248L, 250L, 252L, 254L, 256L, 258L, 260L, 262L, 264L, 266L, 268L, 270L, 267L, 264L, 261L, 258L, 255L, 242L, 229L, 216L, 203L, 190L, 177L, 164L, 151L, 138L, 125L, 112L, 111L, 110L, 109L, 108L, 107L, 106L, 105L, 104L, 103L, 102L, 101L, 100L, 99L, 102L, 105L, 108L, 111L, 114L, 117L, 120L, 123L, 126L, 129L, 132L, 141L, 150L, 159L, 168L, 177L, 186L, 195L, 204L, 213L, 222L, 231L, 240L, 257L, 274L, 291L, 308L, 325L, 342L, 359L, 376L, 393L, 384L, 375L, 366L, 357L, 348L, 339L, 330L, 321L, 312L, 303L, 294L, 285L, 286L, 287L, 288L, 289L, 290L, 291L, 292L, 293L, 294L, 295L, 296L, 282L, 268L, 254L, 240L, 226L, 212L, 198L, 184L, 170L, 156L, 142L, 128L, 114L, 100L, 86L, 72L, 58L, 44L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA));is.infinite(argv[[1]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [37] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [49] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [61] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [109] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [121] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [133] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [145] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [157] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [169] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite2# #argv <- list(c(Inf, -Inf));is.infinite(argv[[1]]); [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite3# #argv <- list(structure(logical(0), .Dim = c(0L, 0L)));is.infinite(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite4# #argv <- list(structure(c(0.00241725013897913, 2.73568372449633e-07, 0.00400531454105884, 0.0305181933571734, 0.022064930648429, 0.000416097494498381, 0.0186357510997526, 0.00896237344987589, 0.00202331168264955, 0.00279067096737535, 0.0447487811957221, 0.000577210896095096, 0.00782925975125774, 0.033211430744327, 0.0093483442273581, 0.00136284952207105, 0.0275004422708864, 0.0135979349769553, 0.000181644594904405, 0.00803803085466393, 0.00350275333198457, 0.014998898960339, 5.39459255498146e-05, 0.00123860219686858, 1.13323906102913e-05, 0.0297916373848854, 0.0312890114433758, 5.85350754663798e-05, 0.0131002435454964, 0.00277072267615578, 0.0222123285012571, 0.00194205331979335, 0.0103231522531299, 0.0261098279661105, 0.0358853728812373, 1.13323906102913e-05, 0.0486308859679786, 0.000674881587747117, 0.0218633172580077, 0.000558592420498928, 0.000802158707806158, 0.0581913205761545, 0.000436809276845313, 0.00631994234432259, 0.000141965876420771, 0.000262833357340149, 0.0055965687842748, 0.000654737007593888, 0.0140931986366498, 0.00241538552182261, 0.00414822230660342, 0.00884150659070285, 0.0647626092888162, 0.0935599413167129, 0.00117891119201738, 0.00742609802768654, 0.0306399064130622, 0.0274290617824389, 0.00217883778937331, 0.0108387379377857, 0.0242348837396833, 0.0168720396936779, 0.022211269097018, 0.0355286679037712, 0.00017126708391638, 0.00443642409999561, 0.0068913158904869, 0.0635882367317516, 0.0566932963429416, 0.00904861729235097, 0.00038919481466495), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71')));is.infinite(argv[[1]]); 1 2 3 4 5 6 7 8 9 10 11 12 13 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 14 15 16 17 18 19 20 21 22 23 24 25 26 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 27 28 29 30 31 32 33 34 35 36 37 38 39 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 40 41 42 43 44 45 46 47 48 49 50 51 52 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 53 54 55 56 57 58 59 60 61 62 63 64 65 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 66 67 68 69 70 71 FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite5# #argv <- list(structure(c(80, 80, 75, 62, 62, 62, 62, 62, 58, 58, 58, 58, 58, 58, 50, 50, 50, 50, 50, 56, 70, 27, 27, 25, 24, 22, 23, 24, 24, 23, 18, 18, 17, 18, 19, 18, 18, 19, 19, 20, 20, 20, 89, 88, 90, 87, 87, 87, 93, 93, 87, 80, 89, 88, 82, 93, 89, 86, 72, 79, 80, 82, 91, 42, 37, 37, 28, 18, 18, 19, 20, 15, 14, 14, 13, 11, 12, 8, 7, 8, 8, 9, 15, 15), .Dim = c(21L, 4L), .Dimnames = list(NULL, c('Air.Flow', 'Water.Temp', 'Acid.Conc.', 'stack.loss'))));is.infinite(argv[[1]]); Air.Flow Water.Temp Acid.Conc. stack.loss [1,] FALSE FALSE FALSE FALSE [2,] FALSE FALSE FALSE FALSE [3,] FALSE FALSE FALSE FALSE [4,] FALSE FALSE FALSE FALSE [5,] FALSE FALSE FALSE FALSE [6,] FALSE FALSE FALSE FALSE [7,] FALSE FALSE FALSE FALSE [8,] FALSE FALSE FALSE FALSE [9,] FALSE FALSE FALSE FALSE [10,] FALSE FALSE FALSE FALSE [11,] FALSE FALSE FALSE FALSE [12,] FALSE FALSE FALSE FALSE [13,] FALSE FALSE FALSE FALSE [14,] FALSE FALSE FALSE FALSE [15,] FALSE FALSE FALSE FALSE [16,] FALSE FALSE FALSE FALSE [17,] FALSE FALSE FALSE FALSE [18,] FALSE FALSE FALSE FALSE [19,] FALSE FALSE FALSE FALSE [20,] FALSE FALSE FALSE FALSE [21,] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite6# #argv <- list(structure(c(1.12411954394441, -0.567321126080105, 1.28594901629635, -0.519809468914999, -1.485548782458, -0.435305441405687, -0.281625943801696, -0.527525498975648, 2.60041695299567, NA), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')));is.infinite(argv[[1]]); 1 2 3 4 5 6 7 8 9 10 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite7# #argv <- list(NULL);is.infinite(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite8# #argv <- list(structure(c(0.00544194018731062, 0.00542949133552226, 1.20718999105839e-05, 0.00505497198006266, 0.827687885653788, 0.00315385274195005, 0.0023164952286401, 0.00117183915211372, 2.09167441982205, 0.00193959227691399, 0.00358084102808485, 3.39138861812986e-05, 0.00163051710052444, 0.00168735925488057, 0.0167253073891896, 0.237074502262169, 0.0118967636015583, 0.00307437031103621, 0.00114371252369823, 0.000860763872820255, 0.00028432076263802, 0.00329557354736053, 0.000123683950933913, 0.00026114238659798, 0.00471892942651347, 0.00317288091968884, 6.76955217513137e-05, 0.0119061189538054, 0.00233356124758579, 0.00672098496026968, 0.134965372025281, 0.00102115420103838, 0.00114816901125044), .Names = c('Craig Dunain', 'Ben Rha', 'Ben Lomond', 'Goatfell', 'Bens of Jura', 'Cairnpapple', 'Scolty', 'Traprain', 'Lairig Ghru', 'Dollar', 'Lomonds', 'Cairn Table', 'Eildon Two', 'Cairngorm', 'Seven Hills', 'Knock Hill', 'Black Hill', 'Creag Beag', 'Kildcon Hill', 'Meall Ant-Suidhe', 'Half Ben Nevis', 'Cow Hill', 'N Berwick Law', 'Creag Dubh', 'Burnswark', 'Largo Law', 'Criffel', 'Acmony', 'Ben Nevis', 'Knockfarrel', 'Two Breweries', 'Cockleroi', 'Moffat Chase')));is.infinite(argv[[1]]); Craig Dunain Ben Rha Ben Lomond Goatfell FALSE FALSE FALSE FALSE Bens of Jura Cairnpapple Scolty Traprain FALSE FALSE FALSE FALSE Lairig Ghru Dollar Lomonds Cairn Table FALSE FALSE FALSE FALSE Eildon Two Cairngorm Seven Hills Knock Hill FALSE FALSE FALSE FALSE Black Hill Creag Beag Kildcon Hill Meall Ant-Suidhe FALSE FALSE FALSE FALSE Half Ben Nevis Cow Hill N Berwick Law Creag Dubh FALSE FALSE FALSE FALSE Burnswark Largo Law Criffel Acmony FALSE FALSE FALSE FALSE Ben Nevis Knockfarrel Two Breweries Cockleroi FALSE FALSE FALSE FALSE Moffat Chase FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinfinite.testisinfinite9# #argv <- list(structure(c(0.648648743252693, 0.52170345712821, -0.338075767187078, 0.169770656775468, -1.86324282017776, 0.362268009067608, 0.136032794890515, 0.901814933704047, -0.671639624694386, 1.79387977353953, 0.714576709724596, -0.471811539980989, -0.857026690426369, 0.226899513968796, 0.568565310101759, -0.944564385994918, 0.693403222263985, 0.02231307737364, -0.276817414323803, -0.344452836733253, -0.844829717537689, -0.421779195680793, -0.154748062715674, 1.43960300137753, 0.256965508768852, -0.295370227475694, 0.507911869619344, -0.346156318366332, -0.187948961031579, -0.454073164294974, -0.0895014237058297, 1.91227371168715, 0.779246572061347, 0.606406152381391, -0.0628430973426908, 2.1063179091687, -1.32672093069913, -0.754254955100625, -0.59565543740158, -1.95946772292555, -0.495798772099865, -3.58086046245482, -0.721772682345538, -0.254468243441054, 2.41750264738881, -0.0647957309150968, 1.87354174039771, -0.552199273430865, 0.732944502427441, 0.703597322009966, 0.875011400025303, -0.916329805907907, -0.297942295133666, -0.239141969395332, -1.79620422664673, -1.34633804643361, -Inf, 1.84762640960041, -0.344523591926435, 1.12935189480329, -0.902874350916712, -0.187948961031579, 0.444184743731147, -0.595767030989317, -0.878351658910786, 0.131398128073247, -1.16349118303155, -0.612790192876235, -0.231519954928205, -0.944564385994918, 0.136032794890519, -0.250233723215235, -0.972829009134415, 0.576852333601859, 0.226899513968797, -0.316245505808486, 0.101419270213227, 2.16953626752671, -0.383691077846572, 0.547999893193889, 0.00183871707028874, -1.28758691932778, 0.0676445397107313, -0.809987759639438, -1.04896153736838, 0.156556073105978, 0.248659709506608, 1.27246860456928, 0.554771572109539, 1.2326801378144, 2.2926344791142, 1.00034303387372, -0.554771572109538), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93')));is.infinite(argv[[1]]); 1 2 3 4 5 6 7 8 9 10 11 12 13 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 14 15 16 17 18 19 20 21 22 23 24 25 26 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 27 28 29 30 31 32 33 34 35 36 37 38 39 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 40 41 42 43 44 45 46 47 48 49 50 51 52 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 53 54 55 56 57 58 59 60 61 62 63 64 65 FALSE FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 66 67 68 69 70 71 72 73 74 75 76 77 78 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 79 80 81 82 83 84 85 86 87 88 89 90 91 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 92 93 FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testIsInteger# #{ is.integer(as.factor(c(1,2,3))) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testIsInteger# #{ is.integer(seq(1,2)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testIsInteger# #{ is.integer(seq(1L,2L)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testisinteger1# #argv <- list(2.74035772634541);is.integer(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testisinteger11# #argv <- list(c(1L, 0L, NA, 1L));do.call('is.integer', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testisinteger2# #argv <- list(c(NA, 9, 3, 3));is.integer(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testisinteger3# #argv <- list(c(NA, 0L));is.integer(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testisinteger4# #argv <- list(c(NA, -4.19095158576965e-09));is.integer(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testisinteger5# #argv <- list(structure(list(`character(0)` = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'character(0)', row.names = character(0), class = 'data.frame'));is.integer(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testisinteger6# #argv <- list(c(-0.6, -0.6, -0.6, -0.6, -0.6, -0.6, -0.6, -0.6, -0.3, -0.3, -0.3, -0.3, -0.3, -0.3, -0.3, -0.3, 0.3, 0.3, 0.3, 0.3, 0.3, 0.3, 0.3, 0.3, 0.6, 0.6, 0.6, 0.6, 0.6, 0.6, 0.6, 0.6));is.integer(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testisinteger7# #argv <- list(c(NA, 1L));is.integer(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testisinteger8# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.integer(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isinteger.testisinteger9# #argv <- list(structure(c(1, 1, 1, 1, 1, 1), .Dim = 1:3));is.integer(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage1# #argv <- list(c(3.14159265358988, 3.14159265358988, 3.14159265358983, 3.14159265358982, 3.14159265358974, 3.14159265358989, 3.14159265358976, 3.14159265358993, 3.14159265358997, 3.14159265358984, 3.14159265358969, 3.14159265358989, 3.14159265358977, 3.14159265358964, 3.14159265358982, 3.14159265358969, 3.14159265358968, 3.1415926535898, 3.14159265358961, 3.14159265358967, 3.14159265358983, 3.14159265358997, 3.14159265358987, 3.14159265358995, 3.14159265358992, 3.14159265358996, 3.14159265358965, 3.14159265358964, 3.14159265358997, 3.14159265358968, 3.14159265358995, 3.14159265358961, 3.14159265358993, 3.14159265358985, 3.14159265358996, 3.14159265358964, 3.1415926535898, 3.1415926535896, 3.14159265358964, 3.14159265358994, 3.14159265358964, 3.14159265358962, 3.14159265358985, 3.14159265358962, 3.14159265358977, 3.14159265358973, 3.14159265358969, 3.14159265358987, 3.14159265358978, 3.14159265358965, 3.14159265358991, 3.14159265358997, 3.14159265358979, 3.1415926535897, 3.14159265358974, 3.14159265358977, 3.14159265358985, 3.14159265358982, 3.14159265358981, 3.14159265358984, 3.14159265358991, 3.14159265358989, 3.14159265358978, 3.14159265358967, 3.1415926535899, 3.14159265358998, 3.14159265358992, 3.14159265358972, 3.14159265358984, 3.14159265358974, 3.14159265358969, 3.14159265358984, 3.14159265358983, 3.14159265358995, 3.14159265358963, 3.14159265358996, 3.14159265358976, 3.14159265358973, 3.14159265358995, 3.14159265358965, 3.14159265358966, 3.1415926535898, 3.14159265358965, 3.14159265358992, 3.14159265358959, 3.14159265358988, 3.14159265358988, 3.14159265358974, 3.14159265358994, 3.14159265358996, 3.1415926535897, 3.14159265358973, 3.14159265358971, 3.14159265358986, 3.14159265358998, 3.14159265358984, 3.14159265358988, 3.1415926535896, 3.1415926535897, 3.14159265358985, 3.14159265358983));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage10# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage11# #argv <- list(numeric(0));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage12# #argv <- list(expression(sqrt(abs(`Standardized residuals`))));is.language(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage13# #argv <- list(structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage14# #argv <- list(c(NA, NA, 0, NA, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 0, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage15# #argv <- list(c(3L, 3L, NA, 3L, 4L, 3L, NA, 3L, 3L, 3L, 3L, 2L, 3L, 3L, 4L, 3L, 2L, 2L, 3L, 5L, 2L, 2L, 2L, 4L, 3L, 3L, 3L, 3L, 4L, 4L, 3L, 3L, 4L, 3L, 4L, 3L, 3L, 4L, 3L, 1L, 3L, 3L, 5L, 3L, NA, 2L, 4L, 1L, 3L, 3L, NA, 2L, 5L, 3L, 4L, 4L, 5L, 4L, 4L, 3L, 5L, 4L, 4L, NA, 3L, 5L, 5L, 5L, 5L, 4L, 5L, 4L, 4L, 5L));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage16# #argv <- list(structure(list(nationality = structure(c(1L, 2L, 2L, 3L, 3L, 1L), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(1L, 1L, 1L, 1L, 2L, 1L), .Label = c('no', 'yes'), class = 'factor'), title = structure(c(3L, 6L, 7L, 4L, 2L, 5L), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA, NA, NA, NA, NA, 1L), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('nationality', 'deceased', 'title', 'other.author'), class = 'data.frame', row.names = c(NA, -6L)));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage17# #argv <- list(structure(list(x = c(0.3, 3.6, 6.2, 3.8, 3.1, 4.1, 6), y = c(6.1, 6.2, 5.2, 2.3, 1.1, 0.8, 0.1)), .Names = c('x', 'y'), row.names = c(1L, 4L, 12L, 31L, 37L, 48L, 50L), class = 'data.frame'));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage18# #argv <- list(c('1', '2', NA));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage19# #argv <- list(structure(c(9, 13, 13, 18, 23, 28, 31, 34, 45, 48, 161, 5, 5, 8, 8, 12, 16, 23, 27, 30, 33, 43, 45, 1, 1, 0, 1, 1, 0, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1), .Dim = c(23L, 2L), .Dimnames = list(NULL, c('time', 'status')), type = 'right', class = 'Surv'));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage2# #argv <- list(structure(c(FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE), .Dim = 16:17));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage20# #argv <- list(c(0.923879532511287+0.38268343236509i, 0.707106781186548+0.707106781186547i, 0.38268343236509+0.923879532511287i, 0+1i, -0.38268343236509+0.923879532511287i, -0.707106781186547+0.707106781186548i, -0.923879532511287+0.38268343236509i, -1+0i, -0.923879532511287-0.38268343236509i, -0.707106781186548-0.707106781186547i, -0.38268343236509-0.923879532511287i, 0-1i, 0.38268343236509-0.923879532511287i, 0.707106781186547-0.707106781186548i, 0.923879532511287-0.38268343236509i, 1-0i));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage21# #argv <- list(integer(0));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage22# #argv <- list(structure(0:100, .Tsp = c(1, 101, 1), class = 'ts'));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage23# #argv <- list(c(0.568, 1.432, -1.08, 1.08));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage24# #argv <- list('«Latin-1 accented chars»: éè øØ å<Å æ<Æ');is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage3# #argv <- list(structure(c(-5.96781464124519, -6.49437440734601, -3.09795335180399, -6.0516983940436, 2.94181419227242, 1.32243907887975, -6.14000748997388, -1.17705131190311), .Dim = c(4L, 2L), .Dimnames = list(c('Murder', 'Assault', 'UrbanPop', 'Rape'), c('PC1', 'PC2'))));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage4# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage6# #argv <- list(1.79769313486232e+308);is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage7# #argv <- list(c('2001-01-01', NA, NA, '2004-10-26'));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage8# #argv <- list(c(0+0i, 0.00809016994374947-0.00587785252292473i, 0.0161803398874989-0.0117557050458495i, 0.0242705098312484-0.0176335575687742i, 0.0323606797749979-0.0235114100916989i, 0.0404508497187474-0.0293892626146237i, 0.0485410196624968-0.0352671151375484i, 0.0566311896062463-0.0411449676604731i, 0.0647213595499958-0.0470228201833979i, 0.0728115294937453-0.0529006727063226i, 0.0809016994374947-0.0587785252292473i, 0.0889918693812442-0.0646563777521721i, 0.0970820393249937-0.0705342302750968i, 0.105172209268743-0.076412082798022i, 0.113262379212493-0.082289935320946i, 0.121352549156242-0.088167787843871i, 0.129442719099992-0.094045640366796i, 0.137532889043741-0.09992349288972i, 0.14562305898749-0.105801345412645i, 0.15371322893124-0.11167919793557i, 0.16180339887499-0.117557050458495i, 0.169893568818739-0.123434902981419i, 0.177983738762488-0.129312755504344i, 0.186073908706238-0.135190608027269i, 0.194164078649987-0.141068460550194i, 0.202254248593737-0.146946313073118i, 0.210344418537486-0.152824165596043i, 0.218434588481236-0.158702018118968i, 0.226524758424985-0.164579870641893i, 0.234614928368735-0.170457723164817i, 0.242705098312484-0.176335575687742i, 0.250795268256234-0.182213428210667i, 0.258885438199983-0.188091280733591i, 0.266975608143733-0.193969133256516i, 0.275065778087482-0.199846985779441i, 0.283155948031232-0.205724838302366i, 0.291246117974981-0.21160269082529i, 0.29933628791873-0.217480543348215i, 0.30742645786248-0.22335839587114i, 0.315516627806229-0.229236248394065i, 0.323606797749979-0.235114100916989i, 0.331696967693728-0.240991953439914i, 0.339787137637478-0.246869805962839i, 0.347877307581227-0.252747658485764i, 0.355967477524977-0.258625511008688i, 0.364057647468726-0.264503363531613i, 0.372147817412476-0.270381216054538i, 0.380237987356225-0.276259068577462i, 0.388328157299975-0.282136921100387i, 0.396418327243724-0.288014773623312i, 0.404508497187474-0.293892626146237i, 0.412598667131223-0.299770478669161i, 0.420688837074973-0.305648331192086i, 0.428779007018722-0.311526183715011i, 0.436869176962472-0.317404036237936i, 0.444959346906221-0.32328188876086i, 0.453049516849971-0.329159741283785i, 0.46113968679372-0.33503759380671i, 0.469229856737469-0.340915446329634i, 0.477320026681219-0.346793298852559i, 0.485410196624968-0.352671151375484i, 0.493500366568718-0.358549003898409i, 0.501590536512467-0.364426856421333i, 0.509680706456217-0.370304708944258i, 0.517770876399966-0.376182561467183i, 0.525861046343716-0.382060413990108i, 0.533951216287465-0.387938266513032i, 0.542041386231215-0.393816119035957i, 0.550131556174964-0.399693971558882i, 0.558221726118714-0.405571824081807i, 0.566311896062463-0.411449676604731i, 0.574402066006213-0.417327529127656i, 0.582492235949962-0.423205381650581i, 0.590582405893712-0.429083234173506i, 0.598672575837461-0.43496108669643i, 0.60676274578121-0.440838939219355i, 0.61485291572496-0.44671679174228i, 0.62294308566871-0.452594644265205i, 0.631033255612459-0.458472496788129i, 0.639123425556208-0.464350349311054i, 0.647213595499958-0.470228201833979i, 0.655303765443707-0.476106054356903i, 0.663393935387457-0.481983906879828i, 0.671484105331206-0.487861759402753i, 0.679574275274956-0.493739611925678i, 0.687664445218705-0.499617464448602i, 0.695754615162455-0.505495316971527i, 0.703844785106204-0.511373169494452i, 0.711934955049954-0.517251022017377i, 0.720025124993703-0.523128874540301i, 0.728115294937453-0.529006727063226i, 0.736205464881202-0.534884579586151i, 0.744295634824952-0.540762432109075i, 0.752385804768701-0.546640284632i, 0.76047597471245-0.552518137154925i, 0.7685661446562-0.55839598967785i, 0.77665631459995-0.564273842200774i, 0.784746484543699-0.570151694723699i, 0.792836654487448-0.576029547246624i, 0.800926824431198-0.581907399769549i, 0.809016994374947-0.587785252292473i));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islanguage.testislanguage9# #argv <- list(structure(c(-0.148741651280925, -0.200659450546418, -0.0705810742857073, -0.356547323513813, -0.214670164989233, -0.161150909262745, -0.0362121726544447, -0.259637310505756, -0.142667503568732, -0.113509274827518, -0.0362121726544447, -0.221848749616356, -0.0809219076239261, -0.0969100130080564, 0, -0.113509274827518, -0.0362121726544447, 0, 0.0934216851622351, 0, 0.0644579892269184, 0.113943352306837, 0.161368002234975, 0.0969100130080564, 0.100370545117563, 0.139879086401236, 0.269512944217916, 0.193124598354462, 0.184691430817599, 0.201397124320452, 0.262451089730429, 0.269512944217916, 0.184691430817599, 0.315970345456918, 0.369215857410143, 0.352182518111362, 0.334453751150931, 0.385606273598312, 0.431363764158987, 0.352182518111362, 0.445604203273598, 0.534026106056135, 0.56702636615906, 0.556302500767287, 0.556302500767287, 0.635483746814912, 0.635483746814912, 0.607455023214668, 0.686636269262293, 0.702430536445525, 0.702430536445525, 0.644438589467839, 0.746634198937579, 0.76715586608218, 0.817565369559781, 0.725094521081469, 0.780317312140151, 0.8055008581584, 0.840733234611807, 0.76715586608218, 0.840733234611807, 0.888740960682893, 0.893761762057943, 0.786751422145561, 0.888740960682893, 0.949877704036875, 0.91803033678488, 0.835056101720116, 0.979548374704095, 1.0111473607758, 0.979548374704095, 0.94101424370557, 1.07481644064517, 1.08134730780413, 1.08457627793433, 0.949877704036875, 1.14736710779379, 1.11260500153457, 1.17172645365323, 0.999565488225982, 1.20951501454263, 1.16643011384328, 1.20466251174822, 1.06483221973857), .Tsp = c(1960, 1980.75, 4), class = 'ts'));is.language(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist1# #argv <- list(structure(function (e1, e2) standardGeneric('/', .Primitive('/')), generic = structure('/', package = 'base'), package = 'base', group = list('Arith'), valueClass = character(0), signature = c('e1', 'e2'), default = .Primitive('/'), skeleton = quote(.Primitive('/')(e1, e2)), class = structure('standardGeneric', package = 'methods')));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist10# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist11# #argv <- list(structure(list(a_string = c('foo', 'bar'), a_bool = FALSE, a_struct = structure(list(a = 1, b = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), c = 'foo'), .Names = c('a', 'b', 'c')), a_cell = structure(list(1, 'foo', structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'bar'), .Dim = c(2L, 2L)), a_complex_scalar = 0+1i, a_list = list(1, structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'foo'), a_complex_matrix = structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)), a_range = c(1, 2, 3, 4, 5), a_scalar = 1, a_complex_3_d_array = structure(c(1+1i, 3+1i, 2+1i, 4+1i, 5-1i, 7-1i, 6-1i, 8-1i), .Dim = c(2L, 2L, 2L)), a_3_d_array = structure(c(1, 3, 2, 4, 5, 7, 6, 8), .Dim = c(2L, 2L, 2L)), a_matrix = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), a_bool_matrix = structure(c(TRUE, FALSE, FALSE, TRUE), .Dim = c(2L, 2L))), .Names = c('a_string', 'a_bool', 'a_struct', 'a_cell', 'a_complex_scalar', 'a_list', 'a_complex_matrix', 'a_range', 'a_scalar', 'a_complex_3_d_array', 'a_3_d_array', 'a_matrix', 'a_bool_matrix')));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist12# #argv <- list(5e-14);is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist13# #argv <- list(structure(c(NA, 6346.2), .Names = c('1', '2')));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist14# #argv <- list(c(1.1+0i, NA, 3+0i));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist15# #argv <- list(structure(list(Ozone = c(NA, NA, NA, NA, NA, NA, 29L, NA, 71L, 39L, NA, NA, 23L, NA, NA, 21L, 37L, 20L, 12L, 13L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA), Solar.R = c(286L, 287L, 242L, 186L, 220L, 264L, 127L, 273L, 291L, 323L, 259L, 250L, 148L, 332L, 322L, 191L, 284L, 37L, 120L, 137L, 150L, 59L, 91L, 250L, 135L, 127L, 47L, 98L, 31L, 138L), Wind = c(8.6, 9.7, 16.1, 9.2, 8.6, 14.3, 9.7, 6.9, 13.8, 11.5, 10.9, 9.2, 8, 13.8, 11.5, 14.9, 20.7, 9.2, 11.5, 10.3, 6.3, 1.7, 4.6, 6.3, 8, 8, 10.3, 11.5, 14.9, 8), Temp = c(78L, 74L, 67L, 84L, 85L, 79L, 82L, 87L, 90L, 87L, 93L, 92L, 82L, 80L, 79L, 77L, 72L, 65L, 73L, 76L, 77L, 76L, 76L, 76L, 75L, 78L, 73L, 80L, 77L, 83L), Month = c(6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L), Day = 1:30), .Names = c('Ozone', 'Solar.R', 'Wind', 'Temp', 'Month', 'Day'), row.names = 32:61, class = 'data.frame'));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist16# #argv <- list(structure(c(1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4), .Tsp = c(1945, 1974.75, 4), class = 'ts'));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist17# #argv <- list(structure(c('***', '***', '*', '*'), legend = '0 ‘***’ 0.001 ‘**’ 0.01 ‘*’ 0.05 ‘.’ 0.1 ‘ ’ 1', class = 'noquote'));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist18# #argv <- list(structure(list(`/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/lookup.xport.Rd` = structure(c('read.xport', ''), .Dim = 1:2, .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.S.Rd` = structure(character(0), .Dim = c(0L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.arff.Rd` = structure(c('connection', 'write.arff', '', ''), .Dim = c(2L, 2L), .Dimnames = list( NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.dbf.Rd` = structure(c('make.names', 'write.dbf', '', ''), .Dim = c(2L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.dta.Rd` = structure(c('write.dta', 'attributes', 'Date', 'factor', '', '', '', ''), .Dim = c(4L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.epiinfo.Rd` = structure(c('Date', 'DateTimeClasses', '', ''), .Dim = c(2L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.mtp.Rd` = structure(character(0), .Dim = c(0L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.octave.Rd` = structure(character(0), .Dim = c(0L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.spss.Rd` = structure(c('sub', 'iconv', 'iconvlist', '', '', ''), .Dim = c(3L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.ssd.Rd` = structure(c('read.xport', ''), .Dim = 1:2, .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.systat.Rd` = structure(character(0), .Dim = c(0L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.xport.Rd` = structure(c('lookup.xport', ''), .Dim = 1:2, .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/write.arff.Rd` = structure(c('make.names', 'read.arff', '', ''), .Dim = c(2L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/write.dbf.Rd` = structure(c('read.dbf', ''), .Dim = 1:2, .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/write.dta.Rd` = structure(c('drop', 'read.dta', 'attributes', 'DateTimeClasses', 'abbreviate', '', '', '', '', ''), .Dim = c(5L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor'))), `/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/write.foreign.Rd` = structure(character(0), .Dim = c(0L, 2L), .Dimnames = list(NULL, c('Target', 'Anchor')))), .Names = c('/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/lookup.xport.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.S.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.arff.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.dbf.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.dta.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.epiinfo.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.mtp.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.octave.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.spss.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.ssd.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.systat.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/read.xport.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/write.arff.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/write.dbf.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/write.dta.Rd', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/man/write.foreign.Rd')));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist19# #argv <- list(3.14159265358979e+20);is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist2# #argv <- list(structure(c(2671, 6.026e+77, 3.161e+152, 3.501e+299, 2.409e+227, 1.529e+302), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.')));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist20# #argv <- list(structure(list(srcfile = c(NA, '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R'), frow = c(NA, 88L, 89L, 89L, 90L, 90L, 90L, 88L, 88L, 92L, 92L, 92L, 92L, 92L, 94L, 94L, 100L, 103L, 108L, 108L, 128L, 131L, 138L, 142L, 160L, 160L), lrow = c(NA, 91L, 89L, 89L, 90L, 90L, 90L, 91L, 91L, 93L, 93L, 93L, 93L, 93L, 95L, 95L, 100L, 104L, 108L, 108L, 132L, 131L, 138L, 144L, 160L, 160L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 26L)));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist21# #argv <- list(structure(list(srcfile = c('/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/R_systat.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/R_systat.R'), frow = 21:22, lrow = 21:22), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist22# #argv <- list(structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, NA, NA, NA, NA, NA), .Label = c('[0,2)', '[2,4)', '[4,6)', '[6,8)'), class = 'factor'));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist23# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10), .Dim = c(10L, 2L), .Dimnames = list(NULL, c('x', 'y'))));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist24# #argv <- list(structure(list(loc = c(0.0804034870161223, 10.3548347412639), cov = structure(c(3.01119301965569, 6.14320559215603, 6.14320559215603, 14.7924762275451), .Dim = c(2L, 2L)), d2 = 2, wt = c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0), sqdist = c(0.439364946869246, 0.0143172566761092, 0.783644692619938, 0.766252947443554, 0.346865912102713, 1.41583192825661, 0.168485512965902, 0.354299830956879, 0.0943280426627965, 1.05001058449122, 1.02875556201707, 0.229332323173361, 0.873263925064789, 2.00000009960498, 0.449304354954282, 0.155023307933165, 0.118273979375253, 0.361693898800799, 0.21462398586105, 0.155558909016629, 0.471723661454506, 0.719528696331092, 0.0738164380664225, 1.46001193111051, 0.140785322548143, 0.127761195166703, 0.048012401156175, 0.811750426884519, 0.425827709817574, 0.163016638545231, 0.557810866640707, 0.277350147637843, 0.0781399119055092, 1.29559183995835, 0.718376405567138, 1.37650242941478, 0.175087780508154, 0.233808973148729, 0.693473805463067, 0.189096604125073, 1.96893781800017, 0.4759756980592, 1.69665760380474, 0.277965749373647, 0.920525436884815, 0.57525234053591, 1.59389578665009, 0.175715364671313, 0.972045794851437, 1.75514684962809, 0.0597413185507202, 0.174340343040626, 0.143421553552865, 0.997322770596838, 1.94096736957465, 2.00000001159796, 0.367000821772989, 0.682474530588235, 1.20976163307984, 1.27031685239035, 1.79775635513363, 0.0857761902860323, 0.435578932929501, 0.214370604878221, 0.494714247412686, 1.78784623754399, 1.24216674083069, 1.87749485326709, 0.0533296334123023, 1.45588362584438, 2.00000000631459, 0.208857144738039, 0.119251291573058, 0.365303924649962, 0.690656674239668, 0.0396958405786268, 0.258262120876164, 1.57360254057537, 0.307548421049514, 0.628417063100241, 1.00647098749202, 0.297624360530352, 0.400289147351669, 1.98298426250944, 0.129127182829694, 0.0794695319493149, 0.991481735944321, 0.444068154119836, 0.206790162395106, 0.574310829851377, 0.181887577583334, 0.433872021297517, 0.802994892604009, 0.293053770941001, 1.7002969001965, 0.77984639982848, 1.36127407487932, 0.761935213110323, 0.597915313430067, 0.237134831067472), prob = NULL, tol = 1e-07, eps = 9.96049758228423e-08, it = 898L, maxit = 5000, ierr = 0L, conv = TRUE), .Names = c('loc', 'cov', 'd2', 'wt', 'sqdist', 'prob', 'tol', 'eps', 'it', 'maxit', 'ierr', 'conv'), class = 'ellipsoid'));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist25# #argv <- list(structure(c(NA, 1, 1, 2), .Names = c('', 'M.user', 'Temp', 'Soft')));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist26# #argv <- list(structure(list(y = c(-0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861), x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE), z = 1:10), .Names = c('y', 'x', 'z'), terms = quote(y ~ x * z), row.names = c(NA, 10L), class = 'data.frame'));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist27# #argv <- list(structure(c(1920, 1920, 1920, 1920, 1920, 1920, 1921, 1921, 1921, 1921), .Tsp = c(1920.5, 1921.25, 12), class = 'ts'));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist29# #argv <- list(structure(1, .Dim = 1L));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist3# #argv <- list('• ');is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist30# #argv <- list(structure(list(Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551), GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962), .Names = c('Employed', 'GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year'), terms = quote(Employed ~ GNP.deflator + GNP + Unemployed + Armed.Forces + Population + Year), row.names = 1947:1962, class = 'data.frame'));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist31# #argv <- list(structure(list(onefile = TRUE, family = 'Helvetica', title = 'R Graphics Output', fonts = NULL, encoding = 'default', bg = 'transparent', fg = 'black', width = 0, height = 0, horizontal = TRUE, pointsize = 12, paper = 'default', pagecentre = TRUE, print.it = FALSE, command = 'default', colormodel = 'srgb', useKerning = TRUE, fillOddEven = FALSE), .Names = c('onefile', 'family', 'title', 'fonts', 'encoding', 'bg', 'fg', 'width', 'height', 'horizontal', 'pointsize', 'paper', 'pagecentre', 'print.it', 'command', 'colormodel', 'useKerning', 'fillOddEven')));do.call('is.list', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist4# #argv <- list(13186.6170826564);is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist5# #argv <- list(structure(list(object = c(0.568, 1.432, -1.08, 1.08), max.level = NA, vec.len = 4, digits.d = 3, nchar.max = 128, give.attr = TRUE, give.head = TRUE, width = 80L, envir = NULL, strict.width = 'no', formatNum = function (x, ...) format(x, trim = TRUE, drop0trailing = TRUE, ...), list.len = 99, give.length = TRUE, nest.lev = 1, indent.str = ' ..'), .Names = c('object', 'max.level', 'vec.len', 'digits.d', 'nchar.max', 'give.attr', 'give.head', 'width', 'envir', 'strict.width', 'formatNum', 'list.len', 'give.length', 'nest.lev', 'indent.str')));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist6# #argv <- list(structure(c(2L, 1L, 3L), .Label = c('1', '2', NA), class = 'factor'));is.list(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist7# #argv <- list(structure(list(y = c(1.08728092481538, 0.0420572471552261, 0.787502161306819, 0.512717751544676, 3.35376639535311, 0.204341510750309, -0.334930602487435, 0.80049208412789, -0.416177803375218, -0.777970346246018, 0.934996808181635, -0.678786709127108, 1.52621589791412, 0.5895781228122, -0.744496121210548, -1.99065153885627, 1.51286447692396, -0.750182409847851), A = c(0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1), U = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('a', 'b', 'c'), class = 'factor'), V = structure(c(1L, 1L, 2L, 2L, 3L, 3L, 1L, 1L, 2L, 2L, 3L, 3L, 1L, 1L, 2L, 2L, 3L, 3L), .Label = c('a', 'b', 'c'), class = 'factor')), .Names = c('y', 'A', 'U', 'V'), terms = quote(y ~ A:U + A:V - 1), row.names = c(NA, 18L), class = 'data.frame'));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist8# #argv <- list(structure(list(title = structure(1L, .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(2L, .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('title', 'other.author'), row.names = 1L, class = 'data.frame'));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islist.testislist9# #argv <- list(structure(list(srcfile = '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', frow = 612L, lrow = 612L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L)));is.list(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor1# #argv <- list(list(structure(list(structure('R Core', class = 'AsIs')), row.names = c(NA, -1L), class = 'data.frame'), structure(list(structure(NA_character_, class = 'AsIs')), row.names = c(NA, -1L), class = 'data.frame'), structure(list(structure(NA_character_, class = 'AsIs')), row.names = c(NA, -1L), class = 'data.frame'), structure(list(structure('An Introduction to R', class = 'AsIs')), row.names = c(NA, -1L), class = 'data.frame'), structure(list(structure('Venables & Smith', class = 'AsIs')), row.names = c(NA, -1L), class = 'data.frame')), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor10# #argv <- list(list(structure(c(0, 1, 1, 2, 2, 4, NA), .Names = c('ddiMatrix', 'diagonalMatrix', 'dMatrix', 'sparseMatrix', 'Matrix', 'mMatrix', 'ANY')), structure(c(0, 1, 1, 1, 2, 2, 2, 3, 4, NA), .Names = c('dgCMatrix', 'CsparseMatrix', 'dsparseMatrix', 'generalMatrix', 'dMatrix', 'sparseMatrix', 'compMatrix', 'Matrix', 'mMatrix', 'ANY'))), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor11# #argv <- list(list(structure(0, .Dim = c(1L, 1L)), structure(-4.9497224423095e-07, .Dim = c(1L, 1L)), structure(0, .Dim = c(1L, 1L)), structure(-7.44931694456399e-07, .Dim = c(1L, 1L))), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor12#Output.IgnoreErrorMessage# #argv <- list(structure(list(event = c('Min. : 1.00 ', '1st Qu.: 9.00 ', 'Median :18.00 ', 'Mean :14.74 ', '3rd Qu.:20.00 ', 'Max. :23.00 ', NA), mag = c('Min. :5.000 ', '1st Qu.:5.300 ', 'Median :6.100 ', 'Mean :6.084 ', '3rd Qu.:6.600 ', 'Max. :7.700 ', NA), station = c('117 : 5 ', '1028 : 4 ', '113 : 4 ', '112 : 3 ', '135 : 3 ', '(Other):147 ', 'NAs : 16 '), dist = c('Min. : 0.50 ', '1st Qu.: 11.32 ', 'Median : 23.40 ', 'Mean : 45.60 ', '3rd Qu.: 47.55 ', 'Max. :370.00 ', NA), accel = c('Min. :0.00300 ', '1st Qu.:0.04425 ', 'Median :0.11300 ', 'Mean :0.15422 ', '3rd Qu.:0.21925 ', 'Max. :0.81000 ', NA)), .Names = c('event', 'mag', 'station', 'dist', 'accel')), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor13# #argv <- list(structure(list(`1` = 1.97626258336499e-323), .Names = '1'), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor14# #argv <- list(structure(list(name = structure(c('McNeil', 'Ripley', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'AsIs'), title = structure(c('Interactive Data Analysis', 'Spatial Statistics', 'Stochastic Simulation', 'LISP-STAT', 'Exploratory Data Analysis', 'Modern Applied Statistics ...'), class = 'AsIs'), other.author = structure(c(NA, NA, NA, NA, NA, 'Ripley'), class = 'AsIs'), nationality = structure(c('Australia', 'UK', 'UK', 'US', 'US', 'Australia'), class = 'AsIs'), deceased = structure(c('no', 'no', 'no', 'no', 'yes', 'no'), class = 'AsIs')), .Names = c('name', 'title', 'other.author', 'nationality', 'deceased'), row.names = c('1', '2', '3', '4', '5', '6')), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor15# #argv <- list(structure(list(`1` = 8.91763605923317e+38), .Names = '1'), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor16# #argv <- list(structure(list(V1 = c(0.908207789994776, 0.62911404389888, 0.205974574899301), V2 = c(0.125555095961317, 0.86969084572047, 0.482080115471035), V3 = c(0.553036311641335, 0.7323137386702, 0.477619622135535), V4 = c(0.332394674187526, 0.0842469143681228, 0.339072937844321), V5 = c(0.325352151878178, 0.245488513959572, 0.239629415096715)), .Names = c('V1', 'V2', 'V3', 'V4', 'V5'), row.names = c(4L, 9L, 11L)), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor17# #argv <- list(structure(list(V1 = c(0.497699242085218, 0.991906094830483), V2 = c(0.668466738192365, 0.107943625887856), V3 = c(0.0994661601725966, 0.518634263193235), V4 = c(0.892198335845023, 0.389989543473348), V5 = c(0.79730882588774, 0.410084082046524)), .Names = c('V1', 'V2', 'V3', 'V4', 'V5'), row.names = c(16L, 18L)), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor18# #argv <- list(list(structure(list(structure('rm', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('remove', Rd_tag = 'VERB')), Rd_tag = '\\alias')), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor19# #argv <- list(list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render'))), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor2# #argv <- list(list(c(TRUE, FALSE, FALSE, FALSE, FALSE), c(TRUE, TRUE, TRUE, TRUE, NA)), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor20# #argv <- list(list(c(0.92317305817397+0i, 0.160449395256071+0.220125597679977i, 0.40353715410585+2.39063261466203i, -3.64092275386503+3.51619480964107i, -0.30877433127864+1.37503901638266i, -0.5590368753986+2.95994484328048i, 2.07117052177259-1.58552086053907i, 5.12796916272868+5.50114308371867i, 0.71791019962021-4.36295436036464i, 3.6182846955548+0.01693946731429i, 5.86560669896785+3.41674024963709i, 7.14153164455803+0i, 5.86560669896785-3.41674024963709i, 3.6182846955548-0.01693946731429i, 0.71791019962021+4.36295436036464i, 5.12796916272868-5.50114308371867i, 2.07117052177259+1.58552086053907i, -0.5590368753986-2.95994484328048i, -0.30877433127864-1.37503901638266i, -3.64092275386503-3.51619480964107i, 0.40353715410585-2.39063261466203i, 0.160449395256071-0.220125597679976i), c(0.994686860835215+0i, -0.711636086238366+0.034977366507257i, -3.47255638259391-3.00654729467177i, -1.61617641806619-2.52564108817258i, -1.83729841635945+1.24025696654912i, -0.05940773912914+1.99807537840182i, 2.14861624215501+1.14547234755584i, -0.18935885218927+5.11711397439959i, 3.55025883223277-3.01463113510177i, 0.37587194655463-4.62160286369829i, -0.57999032040714+3.57394816552023i, -3.22078701201057+0i, -0.57999032040714-3.57394816552023i, 0.37587194655463+4.62160286369829i, 3.55025883223277+3.01463113510177i, -0.18935885218927-5.11711397439959i, 2.14861624215501-1.14547234755584i, -0.05940773912914-1.99807537840182i, -1.83729841635945-1.24025696654912i, -1.61617641806619+2.52564108817258i, -3.47255638259391+3.00654729467177i, -0.711636086238366-0.034977366507256i), c(-0.376031201145236+0i, 0.36561036190112-2.94822783523588i, 2.53378536984825+1.14599403212998i, -0.59345500414631-1.46249091231517i, -5.47371957596241-2.40983118775265i, 0.994698295196402+0.827012883372647i, 4.88614691865207-0.66440097322583i, -1.22869446246947-1.85036568311679i, 4.54719422944744-1.7507307644741i, -1.25805718969215-0.46461775748286i, -6.6950163960079-1.32606545879492i, -1.8510470181104-0i, -6.6950163960079+1.32606545879492i, -1.25805718969215+0.46461775748286i, 4.54719422944744+1.7507307644741i, -1.22869446246947+1.85036568311679i, 4.88614691865207+0.66440097322583i, 0.994698295196402-0.827012883372647i, -5.47371957596241+2.40983118775265i, -0.59345500414631+1.46249091231517i, 2.53378536984825-1.14599403212998i, 0.36561036190112+2.94822783523588i), c(1.86949363581639+0i, 3.2510927680528+3.7297126359622i, 5.77117909703734-0.58113122596059i, -2.73489323319193-2.03739778844743i, 1.59256247378073-3.23882870600546i, -2.21652163259476+3.70287191787544i, -6.80966667821261-4.74346958471693i, -0.48551953206469-3.42445496113818i, -4.95350216815663-1.60107509096991i, -0.651322462114205+0.588393022429161i, 3.32067078328635+3.75999833207777i, -1.35013798358527+0i, 3.32067078328635-3.75999833207777i, -0.651322462114205-0.588393022429161i, -4.95350216815663+1.60107509096991i, -0.48551953206469+3.42445496113818i, -6.80966667821261+4.74346958471693i, -2.21652163259476-3.70287191787544i, 1.59256247378073+3.23882870600546i, -2.73489323319193+2.03739778844743i, 5.77117909703734+0.58113122596059i, 3.2510927680528-3.7297126359622i), c(-3.90806827793786+0i, -4.10078155861753-4.25996878161911i, -0.63461032994351-2.08074582601136i, -0.10593736514835-3.82022652091785i, 6.14817602783479+2.33657685886581i, 0.64431546852762-1.776774088028i, 3.43771282488202-3.00904523977379i, -3.6812061457129+3.53944567666635i, 3.07722382691467+4.5373840425762i, 3.3679046040028+7.20820407858926i, 7.47003475089893-0.4463480891006i, 13.9322715624418-0i, 7.47003475089893+0.4463480891006i, 3.3679046040028-7.20820407858926i, 3.07722382691467-4.5373840425762i, -3.6812061457129-3.53944567666635i, 3.43771282488202+3.00904523977379i, 0.64431546852762+1.776774088028i, 6.14817602783479-2.33657685886581i, -0.10593736514835+3.82022652091785i, -0.63461032994351+2.08074582601136i, -4.10078155861753+4.25996878161911i)), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor21# #argv <- list(structure(list(), .Names = character(0)), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor22# #argv <- list(structure(list(a = 'a', b = 2, c = 3.14159265358979+2i), .Names = c('a', 'b', 'c')), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor23# #argv <- list(list(structure(list(surname = structure(2L, .Label = c('McNeil', 'R Core', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(NA_integer_, .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(NA_integer_, .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = 1L, class = 'data.frame'), structure(list(title = structure(1L, .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(2L, .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('title', 'other.author'), row.names = 1L, class = 'data.frame')), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor25# #argv <- list(list(structure(list(structure(c('', '+ M.user', '+ Temp', '+ M.user:Temp'), class = 'AsIs')), row.names = c(NA, -4L), class = 'data.frame'), structure(list(c(NA, -1, -1, -1)), row.names = c(NA, -4L), class = 'data.frame'), structure(list(c(NA, 20.5814660332393, 3.80016287449608, 2.78794934284365)), row.names = c(NA, -4L), class = 'data.frame'), structure(list(c(11, 10, 9, 8)), row.names = c(NA, -4L), class = 'data.frame'), structure(list(c(32.825622681839, 12.2441566485997, 8.44399377410362, 5.65604443125997)), row.names = c(NA, -4L), class = 'data.frame'), structure(list(c(92.5235803967766, 73.9421143635373, 72.1419514890413, 71.3540021461976)), row.names = c(NA, -4L), class = 'data.frame')), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor26# #argv <- list(structure(list(`2005` = structure(c(31L, 28L, 31L, 30L, 31L, 30L, 31L, 31L, 30L, 31L, 30L, 31L), .Dim = 12L, .Dimnames = structure(list(c('01', '02', '03', '04', '05', '06', '07', '08', '09', '10', '11', '12')), .Names = ''), class = 'table'), `2006` = structure(c(31L, 28L, 31L, 30L, 31L, 30L, 31L, 31L, 30L, 31L, 30L, 31L), .Dim = 12L, .Dimnames = structure(list(c('01', '02', '03', '04', '05', '06', '07', '08', '09', '10', '11', '12')), .Names = ''), class = 'table'), `2007` = structure(c(31L, 28L, 31L, 30L, 31L, 30L, 31L, 31L, 30L, 31L, 30L, 31L), .Dim = 12L, .Dimnames = structure(list(c('01', '02', '03', '04', '05', '06', '07', '08', '09', '10', '11', '12')), .Names = ''), class = 'table'), `2008` = structure(c(31L, 29L, 31L, 30L, 31L, 30L, 31L, 31L, 30L, 31L, 30L, 31L), .Dim = 12L, .Dimnames = structure(list(c('01', '02', '03', '04', '05', '06', '07', '08', '09', '10', '11', '12')), .Names = ''), class = 'table'), `2009` = structure(1L, .Dim = 1L, .Dimnames = structure(list('01'), .Names = ''), class = 'table')), .Names = c('2005', '2006', '2007', '2008', '2009')), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor27# #argv <- list(structure('mtext(\'«Latin-1 accented chars»: éè øØ å<Å æ<Æ\', side = 3)\n', Rd_tag = 'RCODE'), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor28# #argv <- list(structure(list(V1 = structure(c('head', '1', '3', '6'), class = 'AsIs'), V2 = structure(c('NA', ' 2', ' 4', ' 7'), class = 'AsIs'), V3 = structure(c('NA', 'NA', ' 5', ' 8'), class = 'AsIs'), V4 = structure(c('NA', 'NA', 'NA', ' 9'), class = 'AsIs')), .Names = c('V1', 'V2', 'V3', 'V4'), row.names = c('1', '2', '3', '4')), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor29# #argv <- list(structure(list(`1 sec` = 345600, `2 secs` = 172800, `5 secs` = 69120, `10 secs` = 34560, `15 secs` = 23040, `30 secs` = 11520, `1 min` = 5760, `2 mins` = 2880, `5 mins` = 1152, `10 mins` = 576, `15 mins` = 384, `30 mins` = 192, `1 hour` = 96, `3 hours` = 32, `6 hours` = 16, `12 hours` = 8, `1 DSTday` = 4, `2 DSTdays` = 2, `1 week` = 0.571428571428571, halfmonth = 0.262833675564682, `1 month` = 0.131416837782341, `3 months` = 0.0438056125941136, `6 months` = 0.0219028062970568, `1 year` = 0.0109514031485284, `2 years` = 0.0054757015742642, `5 years` = 0.00219028062970568, `10 years` = 0.00109514031485284, `20 years` = 0.00054757015742642, `50 years` = 0.000219028062970568, `100 years` = 0.000109514031485284, `200 years` = 5.4757015742642e-05, `500 years` = 2.19028062970568e-05, `1000 years` = 1.09514031485284e-05), .Names = c('1 sec', '2 secs', '5 secs', '10 secs', '15 secs', '30 secs', '1 min', '2 mins', '5 mins', '10 mins', '15 mins', '30 mins', '1 hour', '3 hours', '6 hours', '12 hours', '1 DSTday', '2 DSTdays', '1 week', 'halfmonth', '1 month', '3 months', '6 months', '1 year', '2 years', '5 years', '10 years', '20 years', '50 years', '100 years', '200 years', '500 years', '1000 years')), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor3# #argv <- list(structure(list(a = 6:10), .Names = 'a', row.names = 6:10), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor4# #argv <- list(structure(list(k = 0.413311097189709, g1 = 72.8306629700373, g2 = 181.793153976139), .Names = c('k', 'g1', 'g2')), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor5# #argv <- list(list(structure(list(structure('text', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('text.default', Rd_tag = 'VERB')), Rd_tag = '\\alias')), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor6# #argv <- list(list(structure(list(surname = structure(c(4L, 5L, 3L, 2L, 2L, 1L, 6L), .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables', 'R Core'), class = 'factor'), nationality = structure(c(3L, 1L, 3L, 2L, 2L, 1L, NA), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(2L, 1L, 1L, 1L, 1L, 1L, NA), .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = c('1', '2', '3', '4', '4.1', '5', '7'), class = 'data.frame'), structure(list(title = structure(c(2L, 5L, 4L, 6L, 7L, 3L, 1L), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA, 1L, NA, NA, NA, NA, 2L), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('title', 'other.author'), row.names = c(NA, 7L), class = 'data.frame')), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor7# #argv <- list(list(c(' The binary arithmetic operators are generic functions: methods can', ' be written for them individually or via the ‘Ops’ group generic', ' function. (See ‘Ops’ for how dispatch is computed.)')), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor8# #argv <- list(list(structure(list(structure(1:4, .Label = c('0', '1', '2', '3'), class = 'factor')), row.names = c(NA, -4L), class = 'data.frame')), FALSE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islistfactor.testislistfactor9# #argv <- list(structure(list(`1` = c(2, 1, 4, 3), `2` = c(3, 1.5, 5, 4, 1.5), `3` = c(6.5, 1.5, 9, 8, 1.5, 6.5, 4, 4, 4), `4` = c(7, 1.5, 10, 9, 1.5, 7, 4, 4, 4, 7)), .Dim = 4L, .Dimnames = list(c('1', '2', '3', '4'))), TRUE); .Internal(islistfactor(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isloaded.testisloaded1# #argv <- list('PDF', '', 'External'); .Internal(is.loaded(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isloaded.testisloaded2# #argv <- list('supsmu', '', ''); .Internal(is.loaded(argv[[1]], argv[[2]], argv[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islogical.testislogical1# #argv <- list(structure(c(TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(22L, 13L), .Dimnames = list(c('r39', 'r17', 'r39', 'r14', 'r39', 'r8', 'r25', 'r9', 'r17', 'r27', 'r17', 'r14', 'r39', 'r27', 'r9', 'r25', 'r8', 'r17', 'r9', 'r8', 'r25', 'r5'), c('c4', 'c1', 'c13', 'c13', 'c1', 'c20', 'c20', 'c13', 'c20', 'c8', 'c8', 'c8', 'c13'))));is.logical(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islogical.testislogical2# #argv <- list(structure(list(`character(0)` = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'character(0)', row.names = character(0), class = 'data.frame'));is.logical(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islogical.testislogical3# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.logical(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islogical.testislogical4# #argv <- list(structure(c(1, 4.16333634234434e-17, 5.55111512312578e-17, -1.38777878078145e-17, 2.77555756156289e-17, 4.16333634234434e-17, 1, -1.11022302462516e-16, -2.77555756156289e-17, -5.55111512312578e-17, 5.55111512312578e-17, -1.11022302462516e-16, 1, 5.55111512312578e-17, 0, -1.38777878078145e-17, -2.77555756156289e-17, 5.55111512312578e-17, 1, -1.11022302462516e-16, 2.77555756156289e-17, -5.55111512312578e-17, 0, -1.11022302462516e-16, 1), .Dim = c(5L, 5L)));is.logical(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islogical.testislogical5# #argv <- list(structure(c(1, 0, 0, 0, NA, 6, 0, 0, 0, 14, 3, 0, 15, 0, 0, 8), .Dim = c(4L, 4L)));is.logical(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_islogical.testislogical7# #argv <- list(c(FALSE, TRUE, FALSE));do.call('is.logical', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix1# #argv <- list(c(-3.44, 62.44));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix10# #argv <- list(structure(numeric(0), .Dim = c(25L, 0L)));is.matrix(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix11# #argv <- list(structure(list(srcfile = c('/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/arff.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/arff.R'), frow = c(86L, 86L), lrow = c(88L, 88L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2, class = 'data.frame'));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix12# #argv <- list(structure(c(-15.8396536770559, 0.267020886067525, -10.0516337591148, 7.62751967585832), .Dim = c(2L, 2L), .Dimnames = list(c('1', '3'), c('(Intercept)', 'TempLow'))));is.matrix(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix13# #argv <- list(structure(list(srcfile = c(NA, '/home/lzhao/hg/r-instrumented/library/stats/R/stats', '/home/lzhao/hg/r-instrumented/library/stats/R/stats'), frow = c(NA, 16987L, 16991L), lrow = c(NA, 16987L, 16991L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 3L), class = 'data.frame'));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix14# #argv <- list(structure(list(V1 = c(NA, 2, NA, 4, 5), V2 = c(NA, NA, 3, 4, 5)), .Names = c('V1', 'V2'), class = 'data.frame', row.names = c(NA, -5L)));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix15# #argv <- list(structure(c(0, 0, 0, 0, 0, 56.989995924654, 56.989995924654, 94.3649041101607, 94.3649041101607, 94.3649041101607, 94.3649041101607, 94.3649041101607, 94.3649041101607, 109.608811230383, 109.608811230383, 109.608811230383, 107.478028232287, 107.478028232287, 107.478028232287, 107.478028232287, 94.6057793667664, 94.6057793667664, 94.6057793667664, 94.6057793667664, 94.6057793667664, 94.6057793667664, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 76.6771074226725, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 57.5975949121373, 39.6403646307366, 39.6403646307366, 39.6403646307366, 39.6403646307366, 39.6403646307366, 10.7055301785859, 0, 1.00000000551046, 1.00000000551046, 1.00000000551046, 1.00000000551046, 1.00000000551046, 0.914597467778369, 0.914597467778369, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.764820801027804, 0.599195286063472, 0.599195286063472, 0.599195286063472, 0.446659102876937, 0.446659102876937, 0.446659102876937, 0.446659102876937, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.319471715663991, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.21965732107982, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.144322069921372, 0.0889140940358009, 0.0889140940358009, 0.0889140940358009, 0.0889140940358009, 0.0889140940358009, 0.0202635232425103, 2.60032456603692e-08, 0, 0, 0, 0, 0, 0.165626203544259, 0.165626203544259, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.341691261149167, 0.503396799290371, 0.503396799290371, 0.503396799290371, 0.638987326722699, 0.638987326722699, 0.638987326722699, 0.638987326722699, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.746106779008021, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.827421615259225, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.887496120452751, 0.931061257482989, 0.931061257482989, 0.931061257482989, 0.931061257482989, 0.931061257482989, 0.984387422945875, 0.999999996451695), .Dim = c(52L, 3L)));is.matrix(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix16# #argv <- list(structure(list(Df = c(NA, 1), Deviance = c(12.2441566485997, 32.825622681839), AIC = c(73.9421143635373, 92.5235803967766)), .Names = c('Df', 'Deviance', 'AIC'), row.names = c('', '- M.user'), class = c('anova', 'data.frame'), heading = c('Single term deletions', '\nModel:', 'cbind(X, M) ~ M.user')));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix17# #argv <- list(structure(list(V1 = 1L, V2 = structure(1L, .Label = c('A', 'D', 'E'), class = 'factor'), V3 = 6), .Names = c('V1', 'V2', 'V3'), class = 'data.frame', row.names = c(NA, -1L)));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix18# #argv <- list(structure(logical(0), .Dim = c(10L, 0L)));is.matrix(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix19# #argv <- list(c(-1.12778377684043, -12820.0784261145, -21650982809.6744, -473300382255715392, -6.08456909882282e+25, -3.04622557026196e+34, -4.60125024792566e+43, -1.76183826972506e+53, -1.5069799345972e+63, -2.61556777274611e+73, -8.54170618068872e+83, -4.9383857330861e+94, -4.80716085942859e+105, -7.55412056676629e+116, -1.84898368353639e+128, -6.83535188151783e+139, -3.71562599613334e+151, -2.90089508183654e+163, -3.18582547396557e+175, -4.83110332887119e+187, -9.94902790498679e+199, -2.74100158340596e+212, -9.96611412047338e+224, -4.72336572671053e+237, -2.88514442494869e+250, -2.24780296109123e+263, -2.21240023126594e+276, -2.72671165723473e+289, -4.17369555651928e+302, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix2# #argv <- list(structure(list(surname = structure(2L, .Label = c('McNeil', 'R Core', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(NA_integer_, .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(NA_integer_, .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = 1L, class = 'data.frame'));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix20# #argv <- list(structure(c(-15.7116658409483, 0.267197739695975, -7.51681521806951, 7.8485143735526), .Dim = c(2L, 2L), .Dimnames = list(c('1', '3'), c('(Intercept)', 'M.userY'))));is.matrix(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix21# #argv <- list(structure(c(NA, NA, NA, NA), .Dim = c(1L, 4L), .Dimnames = list('x', c('Estimate', 'Std. Error', 't value', 'Pr(>|t|)'))));is.matrix(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix23# #argv <- list(0.0597289453377495);do.call('is.matrix', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix3# #argv <- list(structure(list(visible = c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), from = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), .Label = 'registered S3method for summary', class = 'factor')), .Names = c('visible', 'from'), row.names = c('summary.aspell', 'summary.ecdf', 'summary.loess', 'summary.nls', 'summary.packageStatus', 'summary.PDF_Dictionary', 'summary.PDF_Stream', 'summary.ppr', 'summary.prcomp', 'summary.princomp', 'summary.stl', 'summary.tukeysmooth'), class = 'data.frame'));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix4# #argv <- list(structure(c(0, 87, 82, 75, 63, 50, 43, 32, 35, 60, 54, 55, 36, 39, 0, 0, 69, 57, 57, 51, 45, 37, 46, 39, 36, 24, 32, 23, 25, 32, 0, 32, 59, 74, 75, 60, 71, 61, 71, 57, 71, 68, 79, 73, 76, 71, 67, 75, 79, 62, 63, 57, 60, 49, 48, 52, 57, 62, 61, 66, 71, 62, 61, 57, 72, 83, 71, 78, 79, 71, 62, 74, 76, 64, 62, 57, 80, 73, 69, 69, 71, 64, 69, 62, 63, 46, 56, 44, 44, 52, 38, 46, 36, 49, 35, 44, 59, 65, 65, 56, 66, 53, 61, 52, 51, 48, 54, 49, 49, 61, 0, 0, 68, 44, 40, 27, 28, 25, 24, 24), .Tsp = c(1945, 1974.75, 4), class = 'ts'));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix5# #argv <- list(structure(list(srcfile = c('/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R'), frow = c(112L, 114L, 115L, 116L, 127L, 130L, 130L, 130L, 133L, 133L, 133L, 136L, 136L, 136L, 140L, 140L, 140L, 143L, 143L, 143L, 147L, 147L, 147L, 147L, 150L, 150L, 150L, 155L, 161L), lrow = c(156L, 114L, 115L, 116L, 127L, 130L, 130L, 130L, 133L, 133L, 133L, 136L, 136L, 136L, 140L, 140L, 140L, 143L, 143L, 143L, 147L, 147L, 147L, 147L, 150L, 150L, 150L, 155L, 178L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 29L), class = 'data.frame'));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix6# #argv <- list(structure(list(a_string = c('foo', 'bar'), a_bool = FALSE, a_struct = structure(list(a = 1, b = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), c = 'foo'), .Names = c('a', 'b', 'c')), a_cell = structure(list(1, 'foo', structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'bar'), .Dim = c(2L, 2L)), a_complex_scalar = 0+1i, a_list = list(1, structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'foo'), a_complex_matrix = structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)), a_range = c(1, 2, 3, 4, 5), a_scalar = 1, a_complex_3_d_array = structure(c(1+1i, 3+1i, 2+1i, 4+1i, 5-1i, 7-1i, 6-1i, 8-1i), .Dim = c(2L, 2L, 2L)), a_3_d_array = structure(c(1, 3, 2, 4, 5, 7, 6, 8), .Dim = c(2L, 2L, 2L)), a_matrix = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), a_bool_matrix = structure(c(TRUE, FALSE, FALSE, TRUE), .Dim = c(2L, 2L))), .Names = c('a_string', 'a_bool', 'a_struct', 'a_cell', 'a_complex_scalar', 'a_list', 'a_complex_matrix', 'a_range', 'a_scalar', 'a_complex_3_d_array', 'a_3_d_array', 'a_matrix', 'a_bool_matrix')));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix7# #argv <- list(c(1.2e+100, 1.3e+100));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix8# #argv <- list(structure(c(1.46658790096676e-05, -0.00015671726259936, -4.04552045434325e-05, 0.00255024941225984, -0.00162786181391528, 8.23090637551149e-05, -0.00015671726259936, 3.72287793770631e-05, 0.000886372801540247, -0.0567316142279179, 0.0349990628241952, -0.00175223081612341, -4.04552045434325e-05, 0.000886372801540247, 2.56091878967357e-05, -0.000729189497559513, -0.000975857105361189, 4.86109322531125e-05, 0.00255024941225984, -0.0567316142279179, -0.000729189497559513, 0.000230331183246113, 0.0612339887096517, -0.00297447704687248, -0.00162786181391528, 0.0349990628241952, -0.000975857105361189, 0.0612339887096517, -1.91064691608123e-05, -0.000246257006748074, 8.23090637551149e-05, -0.00175223081612341, 4.86109322531125e-05, -0.00297447704687248, -0.000246257006748074, 2.51870808007926e-05), .Dim = c(6L, 6L), .Dimnames = list(c('v1', 'v2', 'v3', 'v4', 'v5', 'v6'), c('v1', 'v2', 'v3', 'v4', 'v5', 'v6'))));is.matrix(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrix9# #argv <- list(structure(list(Topic = c('myTst-package', 'foo-class', 'myTst', 'show,foo-method', 'show,foo-method', 'show-methods'), File = c('myTst-package', 'foo-class', 'myTst-package', 'foo-class', 'show-methods', 'show-methods')), .Names = c('Topic', 'File'), row.names = c(3L, 1L, 4L, 2L, 6L, 5L), class = 'data.frame'));is.matrix(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ismatrix.testismatrixGenericDispatch# #{ is.matrix.cls <- function(x) 42; is.matrix(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #is.na(data.frame(col1=1:5, col2=c(NA, 1, NA, 2, NA))) col1 col2 [1,] FALSE TRUE [2,] FALSE FALSE [3,] FALSE TRUE [4,] FALSE FALSE [5,] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #is.na(is.na) [1] FALSE Warning message: In is.na(is.na) : is.na() applied to non-(list or vector) of type 'builtin' ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #is.na(list(NULL)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #is.na(list(c(NA,NA))) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #is.na(list(function() 42, NA))) Error: unexpected ')' in "is.na(list(function() 42, NA)))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #is.na(list(list(1))) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #is.na(list(list(NA))) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #is.na(list(quote(a+3), NA))) Error: unexpected ')' in "is.na(list(quote(a+3), NA)))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #is.na(quote(x())) [1] FALSE Warning message: In is.na(quote(x())) : is.na() applied to non-(list or vector) of type 'language' ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #v <- c(a=1,b=1234,c='ff',d='gg'); dim(v) <- c(foo=2,bar=2); dimnames(v) <- list(a=c('foo', 'bar'), n=c('f','g')); is.na(v) n a f g foo FALSE FALSE bar FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na(1[10]) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na(NA) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na(NaN) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na(c(1,2,3,4)) } [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na(c(1,2,NA,4)) } [1] FALSE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na(c(1[10],2[10],3)) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na(c(NA)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na(list(1[10],1L[10],list(),integer())) } [1] TRUE TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na(list(expression(1+3))) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na(list(expression(NA))) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testIsNA# #{ is.na.cls <- function(x) 42; is.na(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna1# #argv <- list(8.21977282218514e-09);is.na(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna10# #argv <- list(structure(TRUE, .Names = NA_character_));is.na(argv[[1]]); FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna11# #argv <- list('•');is.na(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna12# #argv <- list(c(1L, 2L, 3L, 4L, 5L, 6L, 7L, NA, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, NA, 16L, NA, NA, 17L, 18L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 19L, 20L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 21L, 22L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 23L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 24L, 25L, NA, NA, NA, NA, NA, 26L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 27L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 28L, NA, NA, NA, NA, NA, NA, NA));is.na(argv[[1]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE TRUE FALSE TRUE TRUE FALSE FALSE TRUE TRUE [25] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [37] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [49] TRUE TRUE TRUE TRUE FALSE FALSE TRUE TRUE TRUE TRUE TRUE TRUE [61] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [73] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE FALSE FALSE TRUE TRUE [85] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [97] TRUE TRUE FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [109] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [121] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [133] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [145] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [157] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [169] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [181] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [193] TRUE TRUE FALSE FALSE TRUE TRUE TRUE TRUE TRUE FALSE TRUE TRUE [205] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [217] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [229] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [241] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [253] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [265] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [277] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [289] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [301] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [313] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [325] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [337] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [349] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [361] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [373] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [385] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [397] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [409] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [421] TRUE TRUE TRUE TRUE TRUE FALSE TRUE TRUE TRUE TRUE TRUE TRUE [433] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [445] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [457] FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna13# #argv <- list(structure(list(VAR1 = c(1, 2, 3, 4, 5), VAR3 = c(1, 1, 1, 1, NA)), .Names = c('VAR1', 'VAR3'), class = 'data.frame', row.names = c(NA, -5L)));is.na(argv[[1]]); VAR1 VAR3 [1,] FALSE FALSE [2,] FALSE FALSE [3,] FALSE FALSE [4,] FALSE FALSE [5,] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna14# #argv <- list(structure(c(2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L), .Label = c('High', 'Low'), class = 'factor'));is.na(argv[[1]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna15# #argv <- list(structure('graphics', .Names = 'plot'));is.na(argv[[1]]); plot FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna16# #argv <- list(structure(c(1.47191076131574, 0.586694550701453, NA, 0.258706725324317), .Names = c('(Intercept)', 'x1', 'x2', 'x3')));is.na(argv[[1]]); (Intercept) x1 x2 x3 FALSE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna17# #argv <- list(structure(0.0129709025545593, .Names = 'value'));is.na(argv[[1]]); value FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna18# #argv <- list(c(1.15623864987889e-07, 2.29156215117184e-06, 2.23566813947706e-05, 0.000143191143888661, 0.000677580461489631, 0.00252801907454942, 0.00775156037133752, 0.0201095764491411, 0.0451105149252681, 0.0890234210350955, 0.15678837112652, 0.249535722442692, 0.362988194603088, 0.487807940725587, 0.611969188999548, 0.724126192770213, 0.816469100858263, 0.885981556331846, 0.933947517503216, 0.964353470219262, 0.982092072679401, 0.991629921792979));is.na(argv[[1]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna19# #argv <- list(c(-0.560475646552213+0i, 0.7424437487+0.205661411508856i, 1.39139505579429-0.26763356813179i, 0.928710764113827-0.221714979045717i, -0.46926798541295+1.18846175213664i, 0.7424437487-0.205661411508856i, 0.460916205989202+0i, -0.452623703774585+0.170604003753717i, -0.094501186832143+0.54302538277632i, -0.331818442379127+0.612232958468282i, 1.39139505579429+0.26763356813179i, -0.452623703774585-0.170604003753717i, 0.400771450594052+0i, -0.927967220342259+0.479716843914174i, -0.790922791530657+0.043092176305418i, 0.928710764113827+0.221714979045717i, -0.094501186832143-0.54302538277632i, -0.927967220342259-0.479716843914174i, 0.701355901563686+0i, -0.600841318509537+0.213998439984336i, -0.46926798541295-1.18846175213664i, -0.331818442379127-0.612232958468282i, -0.790922791530657-0.043092176305418i, -0.600841318509537-0.213998439984336i, -0.625039267849257+0i));is.na(argv[[1]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna2# #argv <- list(structure(c(1, 2, 3, 0, 10, NA), .Dim = c(3L, 2L)));is.na(argv[[1]]); [,1] [,2] [1,] FALSE FALSE [2,] FALSE FALSE [3,] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna20# #argv <- list(structure(list(conc = c(NA, 1.4, NA, NA, NA, NA, NA, NA, 2.2, NA, NA, 0.6)), .Names = 'conc', row.names = 407:418, class = 'data.frame'));is.na(argv[[1]]); conc 407 TRUE 408 FALSE 409 TRUE 410 TRUE 411 TRUE 412 TRUE 413 TRUE 414 TRUE 415 FALSE 416 TRUE 417 TRUE 418 FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna21# #argv <- list(structure(c(-0.435358622483264, -0.0335050551134034, 0.133034650300067, -0.159998333048696, 0.195871393282558, 0.350272600548034, 0.39175188095922, 0.80136172049434, 0.278604939810076, 0.226807608071186, -0.705366153102363, -0.673376038650154, 1.0575405448001, -0.361896730525493, -0.183063001472974, 0.770224627641576, -0.723327517911943, 0.641508754101234, -0.497966152633253, -0.565883899194175, -0.163154615929682, -1.04605311744929, 0.345822472294285, -0.120642075306238, -0.310915191264717, -0.421459810417331, 0.127313193315093, 0.0460216192070582, -0.571263568938105, -0.255068194977355, 0.466680400648398, -0.577405253130228, 0.427189001707599, -0.117526978398191, 0.338157182237428, 0.106063414615583, 0.0652166343937516, 0.113976880905178, -0.508973211491926, -0.0281367896906678, 0.0255810420505139, -0.0895312259800421, 0.343273059276787, 0.25878029892501, 0.178005594248437, 0.616202813145647, -0.223306051799002, -0.822237650949987, 0.181243736532592, 1.03805050988759, -0.535064558180362, 0.629967292956912, -0.206091625685159, -0.0982523326578774, 0.414371639034748, -0.332128640110978, 0.0280866409684434, -0.53195331347224, -0.0381291521565174, -0.0522348719327905, 0.221019543981438, -0.306904771316101, 0.553064781030607, -0.15705513179628, 0.740342712486913, -0.307570821127478, -0.952143530102099, -0.691835269560791, -0.27190785111766, -0.196035414096589, -0.970405281846342, -0.177170015488179, -0.885843727603163, 0.429176556994819, 0.310459328495626, -0.258604904263182, -1.18516758379134, -0.690975294813695, 0.965849167652318, 0.44535708731974, -0.0846102375086248, -0.32082832908822, 0.528416539604261, 0.620184198607294, 0.317666232431379, 0.283097649168652, 0.223675435302281, -0.697584545802335, 1.0301502006605, 0.452533534739715, 0.264750609900989, 0.267980537616643, 0.0973596082099813, 0.161838610289358, 0.612946027273891, 0.816578471249094, -1.15340096289088, -1.01680545446605, 0.422976667855578, -0.23961110455947, 0.0316786188682291, -0.797164261874229, 0.184311996008136, 0.0876867376986658, 0.312240812855443, 0.0432826980205777, -0.00317515675173313, -0.296692321406956, 0.598755930788477, 0.298681977334167, 0.258864357137695, 0.126248580888692, 0.318393890044881, 0.316636862337678), .Tsp = c(1, 114, 1), class = 'ts'));is.na(argv[[1]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [37] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [49] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [61] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [109] FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna22# #argv <- list(c(-Inf, 2.17292368994844e-311, 4.34584737989688e-311, 8.69169475979376e-311, 1.73833895195875e-310, 3.4766779039175e-310, 6.953355807835e-310, 1.390671161567e-309, 2.781342323134e-309, 5.562684646268e-309, 1.1125369292536e-308, 2.2250738585072e-308, 4.4501477170144e-308, 8.90029543402881e-308, 1.78005908680576e-307, 2.2250738585072e-303, 2.2250738585072e-298, 1.79769313486232e+298, 1.79769313486232e+303, 2.24711641857789e+307, 4.49423283715579e+307, 8.98846567431158e+307, 1.79769313486232e+308, Inf, Inf, NaN, NA));is.na(argv[[1]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna23# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1L, mon = 0L, year = 105L, wday = 6L, yday = 0L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'));is.na(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna24# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));is.na(argv[[1]]); c0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna25# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1L, mon = 0L, year = 60L, wday = 5L, yday = 0L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'));is.na(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna26# #argv <- list(structure(list(conc = c(NA, NA, NA, NA, NA, NA, NA, 1.4, NA, NA, NA, NA, NA, NA, NA, 3)), .Names = 'conc', row.names = c(NA, 16L), class = 'data.frame'));is.na(argv[[1]]); conc 1 TRUE 2 TRUE 3 TRUE 4 TRUE 5 TRUE 6 TRUE 7 TRUE 8 FALSE 9 TRUE 10 TRUE 11 TRUE 12 TRUE 13 TRUE 14 TRUE 15 TRUE 16 FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna27# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));is.na(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna28# #argv <- list(structure(list(conc = c(NA, 3.6)), .Names = 'conc', row.names = 419:420, class = 'data.frame'));is.na(argv[[1]]); conc 419 TRUE 420 FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna29# #argv <- list(NULL);is.na(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna3# #argv <- list(structure(c(17L, 18L, 18L, 18L), .Dim = 4L, .Dimnames = structure(list(N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = 'N')));is.na(argv[[1]]); N 0.0cwt 0.2cwt 0.4cwt 0.6cwt FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna30# #argv <- list(structure(list(sec = NA_real_, min = NA_integer_, hour = NA_integer_, mday = NA_integer_, mon = NA_integer_, year = NA_integer_, wday = NA_integer_, yday = NA_integer_, isdst = -1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'));is.na(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna31# #argv <- list(structure(c('R (>= 2.10.0), methods, DBI (>= 0.2-5)', 'methods, DBI (>= 0.2-3)', NA), .Names = c('Depends', 'Imports', 'LinkingTo')));is.na(argv[[1]]); Depends Imports LinkingTo FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna32# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 12L, mon = 2L, year = 112L, wday = 1L, yday = 71L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'));is.na(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna33# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = c(8L, 5L)));is.na(argv[[1]]); [,1] [,2] [,3] [,4] [,5] [1,] FALSE FALSE FALSE FALSE FALSE [2,] FALSE FALSE FALSE FALSE FALSE [3,] FALSE FALSE FALSE FALSE FALSE [4,] FALSE FALSE FALSE FALSE FALSE [5,] FALSE FALSE FALSE FALSE FALSE [6,] FALSE FALSE FALSE FALSE FALSE [7,] FALSE FALSE FALSE FALSE FALSE [8,] FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna34# #argv <- list(structure(c('Min. : 1.00 ', '1st Qu.: 9.00 ', 'Median :18.00 ', 'Mean :14.74 ', '3rd Qu.:20.00 ', 'Max. :23.00 ', NA, 'Min. :5.000 ', '1st Qu.:5.300 ', 'Median :6.100 ', 'Mean :6.084 ', '3rd Qu.:6.600 ', 'Max. :7.700 ', NA, '117 : 5 ', '1028 : 4 ', '113 : 4 ', '112 : 3 ', '135 : 3 ', '(Other):147 ', 'NAs : 16 ', 'Min. : 0.50 ', '1st Qu.: 11.32 ', 'Median : 23.40 ', 'Mean : 45.60 ', '3rd Qu.: 47.55 ', 'Max. :370.00 ', NA, 'Min. :0.00300 ', '1st Qu.:0.04425 ', 'Median :0.11300 ', 'Mean :0.15422 ', '3rd Qu.:0.21925 ', 'Max. :0.81000 ', NA), .Dim = c(7L, 5L), .Dimnames = list(c('', '', '', '', '', '', ''), c(' event', ' mag', ' station', ' dist', ' accel')), class = 'table'));is.na(argv[[1]]); event mag station dist accel FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna35# #argv <- list(NA_complex_);is.na(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna36# #argv <- list(complex(0));is.na(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna37# #argv <- list(structure(list(sec = 40, min = 24L, hour = 11L, mday = 15L, mon = 11L, year = 100L, wday = 5L, yday = 349L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt')));is.na(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna38# #argv <- list(structure(c(2L, 6L, 2L, 5L, 4L, 2L, 5L, 4L), .Dim = 8L, .Dimnames = structure(list(statef = c('act', 'nsw', 'nt', 'qld', 'sa', 'tas', 'vic', 'wa')), .Names = 'statef'), class = 'table'));is.na(argv[[1]]); statef act nsw nt qld sa tas vic wa FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna39# #argv <- list(structure(c(2, 0, 0, 0, 2, 0, 0, 0, 1, 0, 0, 0), .Dim = 3:4, .Dimnames = structure(list(x1 = c('a', 'b', 'c'), x2 = c('a', 'b', 'c', NA)), .Names = c('x1', 'x2')), class = c('xtabs', 'table')));is.na(argv[[1]]); x2 x1 a b c a FALSE FALSE FALSE FALSE b FALSE FALSE FALSE FALSE c FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna4# #argv <- list(structure(0:100, .Tsp = c(1, 101, 1), class = 'ts'));is.na(argv[[1]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [37] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [49] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [61] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna40# #argv <- list(structure(list(1L, 3L), class = structure('L', package = '.GlobalEnv')));is.na(argv[[1]]); [1] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna41# #argv <- list(c('«Latin-1 accented chars»: éè øØ å<Å æ<Æ é éè', 'éè'));is.na(argv[[1]]); [1] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna42# #argv <- list(c(-Inf, -Inf, -Inf, 0, 1, 2, Inf, Inf));is.na(argv[[1]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna43# #argv <- list(structure(c(-3.001e+155, -1.067e+107, -1.976e+62, -9.961e+152, -2.059e+23, 0.5104), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.'), class = c('summaryDefault', 'table')));is.na(argv[[1]]); Min. 1st Qu. Median Mean 3rd Qu. Max. FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna44# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 1L, mon = 0L, year = 70L, wday = 4L, yday = 0L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = 'GMT'));is.na(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna45# #argv <- list(119:120);is.na(argv[[1]]); [1] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna46# #argv <- list(integer(0));is.na(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna6# #argv <- list(list(list(1)));is.na(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna7# #argv <- list(structure(list(sec = 0, min = 0L, hour = 0L, mday = 9L, mon = 9L, year = 103L, wday = 4L, yday = 281L, isdst = 1L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt')));is.na(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isna.testisna8# #argv <- list(structure(c(23L, 24L, 47L, 48L, 71L, 72L, 95L, 96L, 119L, 120L), .Dim = c(2L, 5L), .Dimnames = list(NULL, c('V5', 'V6', 'V7', 'V8', 'V9'))));is.na(argv[[1]]); V5 V6 V7 V8 V9 [1,] FALSE FALSE FALSE FALSE FALSE [2,] FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnaPOSIXlt.testisnaPOSIXlt1# #argv <- structure(list(x = structure(list(sec = 0, min = 0L, hour = 0L, mday = 11L, mon = 7L, year = 3L, wday = 2L, yday = 222L, isdst = 0L, zone = 'EST', gmtoff = NA_integer_), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst', 'zone', 'gmtoff'), class = c('POSIXlt', 'POSIXt'), tzone = c('EST5EDT', 'EST', 'EDT'))), .Names = 'x');do.call('is.na.POSIXlt', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnaassign_default.testIsNAAssign# #{ x <- c(0:4); is.na(x) <- c(2, 4); x } [1] 0 NA 2 NA 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnaassign_default.testIsNAAssign# #{ x<-factor(c("a", "b", "a")); is.na(x)<-1; x } [1] b a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnaassign_default.testIsNAAssign# #{ x<-factor(c("a", "b", "a")); is.na(x)<-2; x } [1] a a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnaassign_default.testIsNAAssign# #{ x<-factor(c("a", "b", "a")); is.na(x)<-c(1, 3); x } [1] b Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnaassign_default.testisnaassign_default1# #argv <- structure(list(x = 9L, value = TRUE), .Names = c('x', 'value'));do.call('is.na<-.default', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnaassign_default.testisnaassign_default2# #argv <- structure(list(x = structure(c('A', '3', 'C'), class = 'AsIs'), value = 2), .Names = c('x', 'value'));do.call('is.na<-.default', argv) [1] "A" NA "C" ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnan.testisnan1# #argv <- list(NA);is.nan(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnan.testisnan10# #argv <- list(structure(c(1, 1, 1, 1, 1, 1), .Dim = 1:3));is.nan(argv[[1]]); , , 1 [,1] [,2] [1,] FALSE FALSE , , 2 [,1] [,2] [1,] FALSE FALSE , , 3 [,1] [,2] [1,] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnan.testisnan2# #argv <- list(structure(1:7, .Names = c('a1', 'a2', 'a3', 'a4', 'a5', 'a6', 'a7')));is.nan(argv[[1]]); a1 a2 a3 a4 a5 a6 a7 FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnan.testisnan3# #argv <- list(1:3);is.nan(argv[[1]]); [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnan.testisnan4# #argv <- list(structure(NaN, .Dim = c(1L, 1L)));is.nan(argv[[1]]); [,1] [1,] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnan.testisnan5# #argv <- list(3.14159265358979);is.nan(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnan.testisnan6# #argv <- list(NULL);is.nan(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnan.testisnan7# #argv <- list(structure(1:3, .Dim = c(3L, 1L)));is.nan(argv[[1]]); [,1] [1,] FALSE [2,] FALSE [3,] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnan.testisnan9# #argv <- list(c(-Inf, 2.17292368994844e-311, 4.34584737989688e-311, 8.69169475979376e-311, 1.73833895195875e-310, 3.4766779039175e-310, 6.953355807835e-310, 1.390671161567e-309, 2.781342323134e-309, 5.562684646268e-309, 1.1125369292536e-308, 2.2250738585072e-308, 4.4501477170144e-308, 8.90029543402881e-308, 1.78005908680576e-307, 2.2250738585072e-303, 2.2250738585072e-298, 1.79769313486232e+298, 1.79769313486232e+303, 2.24711641857789e+307, 4.49423283715579e+307, 8.98846567431158e+307, 1.79769313486232e+308, Inf, Inf, NaN, NA));is.nan(argv[[1]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnan.testisnanGenericDispatch# #{ is.nan.cls <- function(x) 42; is.nan(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull1# #argv <- list(c('a', 'b', 'c'));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull10# #argv <- list(structure(list(coefficients = numeric(0), residuals = structure(c(-68.7898369431611, -71.7713382904347, -44.0000000000001, -56.5455568546283, -29.303772984227), .Dim = c(5L, 1L), .Dimnames = list(c('2', '3', '4', '5', '6'), NULL)), fitted.values = structure(c(0, 0, 0, 0, 0), .Dim = c(5L, 1L), .Dimnames = list(c('2', '3', '4', '5', '6'), NULL)), weights = NULL, rank = 0L, df.residual = 5L), .Names = c('coefficients', 'residuals', 'fitted.values', 'weights', 'rank', 'df.residual'), class = c('aov', 'lm')));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull11# #argv <- list(complex(0));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull12# #argv <- list(1.74126257032961e-18);is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull13# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull14# #argv <- list(NA_complex_);do.call('is.null', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull15# #argv <- list(complex(real = 3, imaginary = -Inf));do.call('is.null', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull16# #argv <- list(function(file = ifelse(onefile, 'Rplots.pdf', 'Rplot%03d.pdf'), width, height, onefile, family, title, fonts, version, paper, encoding, bg, fg, pointsize, pagecentre, colormodel, useDingbats, useKerning, fillOddEven, compress) { invisible() });do.call('is.null', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull2# #argv <- list(structure(c(NA, NA, 159.125, 204, 221.25, 245.125, 319.75, 451.5, 561.125, 619.25, 615.625, 548, 462.125, 381.125, 316.625, 264, 228.375, 210.75, 188.375, 199, 207.125, 191, 166.875, 72, -9.25, -33.125, -36.75, 36.25, 103, 131.625, NA, NA), .Tsp = c(1951, 1958.75, 4), class = 'ts'));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull3# #argv <- list(structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('L', 'M', 'H'), class = 'factor'));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull4# #argv <- list(c('(2,5.5]', '(5.5,10]', NA));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull5# #argv <- list(structure(list(z = c(-2.71928906935559, -2.42170276502517, -2.09964379178171, -1.74953243478614, -1.36765437050161, -0.950481896729501, -0.49514368442691, 0, 0.534774072422106, 1.1067130528647, 1.71078417306203, 2.33938293418822, 2.98268239609615), par.vals = structure(c(0.707463571249756, 0.714694094477037, 0.725412821685713, 0.74111612512182, 0.763750498997247, 0.795678221483334, 0.839503022768249, 0.897728639347183, 0.972289000300049, 1.06404105741634, 1.1722925771844, 1.29437141627989, 1.42522018859931, -3.11497037357416, -3.12714840246737, -3.14532049441438, -3.17220876767473, -3.21154655520113, -3.26827705075488, -3.34869944608425, -3.46054428079529, -3.61294451442018, -3.81614134368036, -4.08060875057211, -4.41549521607872, -4.82702626542922, -0.0255577133668773, -0.0384397882414428, -0.0575047563177536, -0.085367554260897, -0.125387593962273, -0.181561305237101, -0.258149413255891, -0.359008117508679, -0.486728760637899, -0.641785962540215, -0.821841695092364, -1.02123122113516, -1.23065013245083, 7.95100998228548, 7.54634587182367, 7.14890399737901, 6.76196968783309, 6.39005226899545, 6.03912521056563, 5.71679838524513, 5.43240185128028, 5.19696909896364, 5.02301800418124, 4.92391121830517, 4.91279665045699, 5.00177553632184, -9.53200922191114, -8.69335766510962, -7.8547061083081, -7.01605455150657, -6.17740299470505, -5.33875143790352, -4.500099881102, -3.66144832430047, -2.82279676749895, -1.98414521069743, -1.1454936538959, -0.306842097094378, 0.531809459707146), .Dim = c(13L, 5L), .Dimnames = list( NULL, c('(Intercept)', 'PS', 'AI', 'VS', 'PS:AI')))), .Names = c('z', 'par.vals'), row.names = c(NA, 13L), class = 'data.frame'));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull6# #argv <- list(structure(c(-4, -3, -2, -1, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96), .Tsp = c(1, 101, 1), class = 'ts'));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull7# #argv <- list(numeric(0));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnull.testisnull8# #argv <- list(structure(c(2, 3, 4, 5, 6, 7, 8, 9, 10, 11), .Tsp = c(1920.5, 1921.25, 12), class = 'ts'));is.null(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric1# #argv <- list(structure(c(4.17, 5.58, 5.18, 6.11, 4.5, 4.61, 5.17, 4.53, 5.33, 5.14, 4.81, 4.17, 4.41, 3.59, 5.87, 3.83, 6.03, 4.89, 4.32, 4.69, 17.3889, 31.1364, 26.8324, 37.3321, 20.25, 21.2521, 26.7289, 20.5209, 28.4089, 26.4196, 23.1361, 17.3889, 19.4481, 12.8881, 34.4569, 14.6689, 36.3609, 23.9121, 18.6624, 21.9961), .Dim = c(20L, 2L), .Dimnames = list(NULL, c('w', 'w2'))));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric10# #argv <- list(structure(c(1L, 2L, NA, 3L), .Label = c('aa', 'bb', 'dd')));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric11# #argv <- list(structure(c(1120, 1160, 963, 1210, 1160, 1160, 813, 1230, 1370, 1140, 995, 935, 1110, 994, 1020, 960, 1180, 799, 958, 1140, 1100, 1210, 1150, 1250, 1260, 1220, 1030, 1100, 774, 840, 874, 694, 940, 833, 701, 916, 692, 1020, 1050, 969, 831, 726, 456, 824, 702, 1120, 1100, 832, 764, 821, 768, 845, 864, 862, 698, 845, 744, 796, 1040, 759, 781, 865, 845, 944, 984, 897, 822, 1010, 771, 676, 649, 846, 812, 742, 801, 1040, 860, 874, 848, 890, 744, 749, 838, 1050, 918, 986, 797, 923, 975, 815, 1020, 906, 901, 1170, 912, 746, 919, 718, 714, 740), .Tsp = c(1871, 1970, 1), class = 'ts'));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric12# #argv <- list(c(-0.667819876370237, 0.170711734013213, 0.552921941721332, -0.253162069270378, -0.00786394222146348, 0.0246733498130512, 0.0730305465518564, -1.36919169254062, 0.0881443844426084, -0.0834190388782434));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric13# #argv <- list(structure(c(39.7, 27.7, 43.5, 89.7, 70.2, 63.5, 36.5, 15.2, 35.3, 45.2, 1.2, 49.5, 63.1, 34, 17, 17.6, 67.8, 45.1, 50.9, 64.9, 59.8, 73, 37.6, 60.7, 60.8, 69.3, 71.2, 64.5, 75.9, 7.7, 72.6, 18.7, 78.2, 55.1, 58.1, 62, 53.3, 85.9, 67.5, 16.7, 46.6, 84.9, 19.4, 38.4, 5, 22, 17, 5, 16, 6, 12, 31, 9, 16, 37, 15, 13, 17, 15, 35, 14, 6, 22, 7, 22, 19, 15, 19, 16, 22, 12, 14, 9, 29, 18, 25, 12, 14, 14, 21, 12, 3, 14, 22, 16, 7, 26, 26, 5, 29, 15, 2, 7, 3, 7, 20, 7, 13, 53, 8, 13, 8, 12, 32, 8, 9, 12, 3, 10, 9, 7, 12, 10, 5, 1, 6, 9, 11, 2, 7, 6, 3, 8, 12, 7, 2, 7, 13, 29, 6, 28, 12, 93.4, 58.33, 5.16, 100, 92.85, 2.56, 33.77, 2.15, 90.57, 91.38, 42.34, 6.1, 96.83, 3.3, 9.96, 16.92, 97.16, 84.84, 15.14, 98.22, 5.23, 2.84, 4.97, 4.43, 7.72, 2.82, 2.4, 98.61, 99.06, 13.79, 24.2, 8.65, 98.96, 4.52, 5.23, 8.52, 97.67, 99.71, 2.27, 11.22, 50.43, 99.68, 12.11, 5.62, 20.2, 19.3, 20.6, 18.3, 23.6, 18, 20.3, 10.8, 26.6, 24.4, 18, 22.5, 18.1, 20, 22.2, 23, 24.9, 22.2, 16.7, 20.2, 18, 20, 20, 22.7, 16.3, 18.7, 21, 24.5, 17.8, 20.5, 21.2, 19.5, 19.4, 22.4, 23.8, 16.5, 21, 15.1, 19.1, 18.9, 18.2, 19.8, 20.2, 20.3), .Dim = c(44L, 5L), .Dimnames = list(c('Franches-Mnt', 'Rive Gauche', 'Neuveville', 'Herens', 'Broye', 'Paysd\'enhaut', 'Moutier', 'La Vallee', 'Porrentruy', 'Sarine', 'V. De Geneve', 'Yverdon', 'Sion', 'Grandson', 'Courtelary', 'Neuchatel', 'Glane', 'Delemont', 'Nyone', 'Monthey', 'Morges', 'Lavaux', 'Val de Ruz', 'Avenches', 'Rolle', 'Cossonay', 'Oron', 'Veveyse', 'St Maurice', 'La Chauxdfnd', 'Echallens', 'ValdeTravers', 'Martigwy', 'Moudon', 'Payerne', 'Aigle', 'Gruyere', 'Conthey', 'Aubonne', 'Le Locle', 'Rive Droite', 'Entremont', 'Lausanne', 'Boudry'), c('Agriculture', 'Examination', 'Education', 'Catholic', 'Infant.Mortality'))));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric14# #argv <- list(structure(c(1386439154.20645, 1386469154.20645, 1386499154.20645, 1386529154.20645, 1386559154.20645, 1386589154.20645, 1386619154.20645, 1386649154.20645, 1386679154.20645, 1386709154.20645, 1386739154.20645, 1386769154.20645, 1386799154.20645, 1386829154.20645, 1386859154.20645, 1386889154.20645, 1386919154.20645, 1386949154.20645, 1386979154.20645, 1387009154.20645, 1387039154.20645, 1387069154.20645, 1387099154.20645, 1387129154.20645, 1387159154.20645, 1387189154.20645, 1387219154.20645, 1387249154.20645, 1387279154.20645, 1387309154.20645, 1387339154.20645, 1387369154.20645, 1387399154.20645, 1387429154.20645), class = c('POSIXct', 'POSIXt')));is.numeric(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric14# #is.numeric(structure(1L, class = c('POSIXct', 'POSIXt'))) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric15# #argv <- list(c('2001-01-01', NA, NA, '2004-10-26'));is.numeric(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric16# #argv <- list(c(1, 0.987688340595138, 0.951056516295154, 0.891006524188368, 0.809016994374947, 0.707106781186547, 0.587785252292473, 0.453990499739547, 0.309016994374947, 0.156434465040231, -1.83697019872103e-16, -0.156434465040231, -0.309016994374948, -0.453990499739547, -0.587785252292473, -0.707106781186548, -0.809016994374948, -0.891006524188368, -0.951056516295154, -0.987688340595138, -1, -0.987688340595138, -0.951056516295154, -0.891006524188368, -0.809016994374947, -0.707106781186547, -0.587785252292473, -0.453990499739547, -0.309016994374947, -0.156434465040231, 6.12323399573677e-17, 0.156434465040231, 0.309016994374947, 0.453990499739547, 0.587785252292473, 0.707106781186548, 0.809016994374947, 0.891006524188368, 0.951056516295154, 0.987688340595138, 1, 0.987688340595138, 0.951056516295154, 0.891006524188368, 0.809016994374947, 0.707106781186548, 0.587785252292473, 0.453990499739547, 0.309016994374947, 0.156434465040231, 6.12323399573677e-17, -0.15643446504023, -0.309016994374947, -0.453990499739548, -0.587785252292473, -0.707106781186547, -0.809016994374947, -0.891006524188368, -0.951056516295154, -0.987688340595138, -1, -0.987688340595138, -0.951056516295154, -0.891006524188368, -0.809016994374948, -0.707106781186547, -0.587785252292473, -0.453990499739548, -0.309016994374948, -0.15643446504023, -1.83697019872103e-16, 0.15643446504023, 0.309016994374947, 0.453990499739547, 0.587785252292473, 0.707106781186547, 0.809016994374947, 0.891006524188368, 0.951056516295154, 0.987688340595138, 1, 0.987688340595138, 0.951056516295154, 0.891006524188368, 0.809016994374948, 0.707106781186547, 0.587785252292473, 0.453990499739548, 0.309016994374948, 0.15643446504023, 3.06161699786838e-16, -0.15643446504023, -0.309016994374947, -0.453990499739547, -0.587785252292473, -0.707106781186547, -0.809016994374947, -0.891006524188368, -0.951056516295153, -0.987688340595138, -1));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric17# #argv <- list(structure(c(0.696706709347165, 0.362357754476673, -0.0291995223012888, 0.696706709347165, 0.696706709347165, -0.0291995223012888, 0.696706709347165, -0.0291995223012888, 0.362357754476673, 0.696706709347165, -0.0291995223012888, 0.362357754476673, -0.416146836547142, 0.362357754476673, 0.696706709347165, 0.696706709347165, 0.362357754476673, -0.416146836547142, -0.0291995223012888, -0.416146836547142, 0.696706709347165, -0.416146836547142, 0.362357754476673, -0.0291995223012888, 0.717356090899523, 0.932039085967226, 0.999573603041505, 0.717356090899523, 0.717356090899523, 0.999573603041505, 0.717356090899523, 0.999573603041505, 0.932039085967226, 0.717356090899523, 0.999573603041505, 0.932039085967226, 0.909297426825682, 0.932039085967226, 0.717356090899523, 0.717356090899523, 0.932039085967226, 0.909297426825682, 0.999573603041505, 0.909297426825682, 0.717356090899523, 0.909297426825682, 0.932039085967226, 0.999573603041505, -0.0291995223012888, -0.737393715541246, -0.998294775794753, -0.0291995223012888, -0.0291995223012888, -0.998294775794753, -0.0291995223012888, -0.998294775794753, -0.737393715541246, -0.0291995223012888, -0.998294775794753, -0.737393715541246, -0.653643620863612, -0.737393715541246, -0.0291995223012888, -0.0291995223012888, -0.737393715541246, -0.653643620863612, -0.998294775794753, -0.653643620863612, -0.0291995223012888, -0.653643620863612, -0.737393715541246, -0.998294775794753, 0.999573603041505, 0.67546318055115, -0.0583741434275801, 0.999573603041505, 0.999573603041505, -0.0583741434275801, 0.999573603041505, -0.0583741434275801, 0.67546318055115, 0.999573603041505, -0.0583741434275801, 0.67546318055115, -0.756802495307928, 0.67546318055115, 0.999573603041505, 0.999573603041505, 0.67546318055115, -0.756802495307928, -0.0583741434275801, -0.756802495307928, 0.999573603041505, -0.756802495307928, 0.67546318055115, -0.0583741434275801), .Dim = c(24L, 4L), .Dimnames = list(NULL, c('A', 'B', 'C', 'D'))));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric18# #argv <- list(c(1, 1, NA, 2));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric19# #argv <- list(structure(c(79.5323303457107, 6, 86.1989970123773, 6, 69.7732394366197, 5, 98.0323303457106, 6, 108.032330345711, 6, 89.1989970123773, 6, 114.198997012377, 6, 116.698997012377, 6, 110.365663679044, 6, 124.365663679044, 6, 126.365663679044, 6, 118.032330345711, 6), .Dim = c(6L, 4L), .Dimnames = structure(list(V = c('Golden.rain', 'rep ', 'Marvellous ', 'rep ', 'Victory ', 'rep '), N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = c('V', 'N'))));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric2# #argv <- list(structure(c(12784, 12874, 12965, 13057, 13149, 13239, 13330, 13422, 13514, 13604, 13695, 13787, 13879, 13970, 14061, 14153, 14245, 14335), class = 'Date'));is.numeric(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric20# #argv <- list(structure(numeric(0), .Dim = c(3L, 0L)));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric21# #argv <- list(structure(16146, class = 'Date'));is.numeric(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric22# #argv <- list(structure(c(-3.001e+155, -1.067e+107, -1.976e+62, -9.961e+152, -2.059e+23, 0.5104), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.'), class = c('summaryDefault', 'table')));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric24# #argv <- list(structure(16352, class = 'Date'));do.call('is.numeric', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric3# #argv <- list(c(1.4615016373309e+48, 5.70899077082384e+45, 2.23007451985306e+43, 8.71122859317602e+40, 3.40282366920938e+38, 1.32922799578492e+36, 5.19229685853483e+33, 2.02824096036517e+31, 7.92281625142643e+28, 3.09485009821345e+26, 1.20892581961463e+24, 4.72236648286965e+21, 18446744073709551616, 72057594037927936, 281474976710656, 1099511627776, 4294967296, 16777216, 65536, 256, 1, 0.00390625, 1.52587890625e-05, 5.96046447753906e-08, 2.3283064365387e-10, 9.09494701772928e-13, 3.5527136788005e-15, 1.38777878078145e-17, 5.42101086242752e-20, 2.11758236813575e-22, 8.27180612553028e-25));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric4# #argv <- list(integer(0));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric5# #argv <- list(c(16.4, 11.4, 7.8, 14, 10.9, 16.8, 16.6, 5.9, 21));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric6# #argv <- list(c(0, 0, 0, 1, 0, 0, 0, 0, 1, 0, NA, NA, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 0, 1, 1, 0, 1, NA, 1, 0, 1, 0, NA, 1, 1, 0, 1, 0, 0, 0, 0, 0, 1, 0, 1, NA, 0, 1, 0, 0, 0, 0, NA, 1, 1));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric7# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));is.numeric(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric8# #argv <- list(structure(c(1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('1', '2', '3', '4'), class = 'factor'));is.numeric(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumeric9# #argv <- list(structure(list(a_string = c('foo', 'bar'), a_bool = FALSE, a_struct = structure(list(a = 1, b = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), c = 'foo'), .Names = c('a', 'b', 'c')), a_cell = structure(list(1, 'foo', structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'bar'), .Dim = c(2L, 2L)), a_complex_scalar = 0+1i, a_list = list(1, structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'foo'), a_complex_matrix = structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)), a_range = c(1, 2, 3, 4, 5), a_scalar = 1, a_complex_3_d_array = structure(c(1+1i, 3+1i, 2+1i, 4+1i, 5-1i, 7-1i, 6-1i, 8-1i), .Dim = c(2L, 2L, 2L)), a_3_d_array = structure(c(1, 3, 2, 4, 5, 7, 6, 8), .Dim = c(2L, 2L, 2L)), a_matrix = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), a_bool_matrix = structure(c(TRUE, FALSE, FALSE, TRUE), .Dim = c(2L, 2L))), .Names = c('a_string', 'a_bool', 'a_struct', 'a_cell', 'a_complex_scalar', 'a_list', 'a_complex_matrix', 'a_range', 'a_scalar', 'a_complex_3_d_array', 'a_3_d_array', 'a_matrix', 'a_bool_matrix')));is.numeric(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isnumeric.testisnumericGenericDispatch# #{ is.numeric.cls <- function(x) 42; is.numeric(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testIsObject# #{ f<-function() 42; class(f)<-"foo"; is.object(f) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testIsObject# #{ is.object(1) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testIsObject# #{ is.object(1:3) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testIsObject# #{ is.object(1L) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testIsObject# #{ is.object(NA) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testIsObject# #{ is.object(NULL) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testIsObject# #{ is.object(c(1,2,3)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject1# #argv <- list(c(45.0314849918875, 57.5361690778799, 61.7043971065441, 61.7043971065441, 128.39604556517, 45.0314849918875, 36.6950289345592, 45.0314849918875, 228.43351825311, 36.6950289345592, 74.2090811925365, 45.0314849918875, 32.5268009058951, 78.3773092212007, 111.723133450514, 20.0221168199027, 32.5268009058951, 40.8632569632234, 20.0221168199027, 24.1903448485668, 45.0314849918875, 11.6856607625744, 20.0221168199027, 28.3585728772309, 45.0314849918875, 36.6950289345592, 49.1997130205517, 36.6950289345592, 78.3773092212007, 45.0314849918875, 145.068957679827, 32.5268009058951, 161.741869794484));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject10# #argv <- list(structure(c(-0.562441486309934, -0.588967592535822, 0.0277608937997097, 0.568074124752969, 3.89980510825846, -0.428174866497729, -0.343990813420242, -0.260996370058754, -2.31774610938305, 0.314764947225063, -0.455124436264437, -0.0444006414474544, -0.27748974692001, -0.303134023269405, -0.670168347915028, 2.92643313367, -0.749546667806845, -0.410394401887929, -0.203261263063707, 0.1847365997012, 0.128559671155683, 0.313558179929332, -0.0668425264405297, -0.106427678524531, -0.523747793519006, -0.402585404761851, 0.0642079595716389, -0.779859286629166, 0.356484381211739, -0.625053119472271, 1.31547628490512, -0.21959878152752, -0.102402088986461), .Names = c('Craig Dunain', 'Ben Rha', 'Ben Lomond', 'Goatfell', 'Bens of Jura', 'Cairnpapple', 'Scolty', 'Traprain', 'Lairig Ghru', 'Dollar', 'Lomonds', 'Cairn Table', 'Eildon Two', 'Cairngorm', 'Seven Hills', 'Knock Hill', 'Black Hill', 'Creag Beag', 'Kildcon Hill', 'Meall Ant-Suidhe', 'Half Ben Nevis', 'Cow Hill', 'N Berwick Law', 'Creag Dubh', 'Burnswark', 'Largo Law', 'Criffel', 'Acmony', 'Ben Nevis', 'Knockfarrel', 'Two Breweries', 'Cockleroi', 'Moffat Chase')));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject11# #argv <- list(integer(0));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject12# #argv <- list(c(25, 50, 100, 250, 500, 1e+05));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject13# #argv <- list(numeric(0));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject14# #argv <- list(c(TRUE, FALSE));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject16# #argv <- list(1:3);do.call('is.object', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject2# #argv <- list(structure(c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 35L, 36L, 37L, 38L, 39L, 40L, 41L, 42L, 43L, 44L, 45L, 46L, 47L, 48L, 49L, 50L, 51L, 52L, 53L, 54L, 55L, 56L, 57L, 58L, 59L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 35L, 36L, 37L, 38L, 39L, 40L, 41L, 42L, 43L, 44L, 45L, 46L, 47L, 48L, 49L, 50L, 51L, 52L, 53L, 54L, 55L, 56L, 57L, 58L, 59L), .Label = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59'), class = 'factor'));is.object(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject3# #argv <- list(c(-2.97525100835805, -2.82075793382799, -2.66593061478436, -2.51078653265898, -2.35534314690423, -2.19961777085284, -2.04362765822923, -1.88739011884942, -1.73092311663886, -1.57424503752904, -1.41737428587374, -1.26032952797003, -1.10312969205829, -0.945793720579289, -0.788340724666015, -0.630790076924443, -0.473161172617641, -0.315473462875692, -0.157746535777026, -4.9960036108132e-16, 0.157746535777027, 0.315473462875696, 0.473161172617647, 0.630790076924451, 0.788340724666025, 0.9457937205793, 1.1031296920583, 1.26032952797003, 1.41737428587374, 1.57424503752905, 1.73092311663887, 1.88739011884943, 2.04362765822924, 2.19961777085286, 2.35534314690424, 2.510786532659, 2.66593061478437, 2.82075793382801, 2.97525100835807));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject4# #argv <- list(structure(c(-0.266501885293689, -3.8931863588937, -0.272681427089914, 0.685830427280619, 0.146697567632144, -0.178509228122189, -0.827954133483467, -0.00847153748452917, -0.439077730128206, -0.100627762490786, 1.90697806298419, 0.534191446603769, 0.118116488305486, 0.266107216595585, 1.09677961111435, 0.294604712451767, 1.26527267402907, -1.37468346842381, -0.501152044022612, 0.277514706049866, 0.080458897112638, 0.0436443543043109, -0.480973816036986, 1.25647294144768, 0.371150285558408), .Dim = 25L, .Dimnames = list( c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'))));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject5# #argv <- list(c(0.3814, 1.0281, 0.3814, 0.1202, -0.3385, 0.6757, 0.6757, -0.5422, -1.0914, 1.0281, -0.3385, 0.3814, 0.3814, -1.0914, -0.7326, 0.6757, 1.5128, 0.6757, 1.0281, 0.6757, 1.0281, -1.0914, -0.7326, 0.1202, -0.3385, 0.3814, 0.6757, 1.5128, 0.1202, -0.7326, 1.5128, -1.0914, 0.6757, 2.4608, 0.3814, 0.6757, -0.8176, 1.0281, 0.1202, 2.4404, -0.5422, 0.1202, -0.1182, 0.3814, -0.5422, -0.5422, 0.6757, -0.3385, -1.6508, 0.6757, -0.7326, -0.1182, -1.0914, 0.3814, 0.3814, -0.1182, 0.3814, 0.1202, 0.6757, 0.6757, 0.1202, -0.5422, 1.5128, 0.3814, -1.2692, 1.0281, 0.6757, 0.1202, -0.5422, 0.3814, -0.3385, 1.0281, -0.1182, 0.1202, 1.5128, 2.4608, 0.6757, -1.0914, -0.9144, -0.3385, 0.1202, 0.1202, 0.1202, 0.3814, -0.13, -0.5422, 0.1202, -0.1182, 0.3814, 1.0281, 0.6757, 1.0281, -1.2692, 0.1202, 0.3814, 1.5128, -0.1182, 0.3814, 1.0281, 0.3814, 0.1202, -0.3385, 0.6757, 0.6757, -0.5422, -1.0914, 1.0281, -0.3385, 0.3814, 0.3814, -1.0914, -0.7326, 0.6757, 1.5128, 0.6757, 1.0281, 0.6757, 1.0281, -1.0914, -0.7326, 0.1202, -0.3385, 0.3814, 0.6757, 1.5128, 0.1202, -0.7326, 1.5128, -1.0914, 0.6757, 2.4608, 0.3814, 0.6757, -0.8176, 1.0281, 0.1202, 2.4404, -0.5422, 0.1202, -0.1182, 0.3814, -0.5422, -0.5422, 0.6757, -0.3385, -1.6508, 0.6757, -0.7326, -0.1182, -1.0914, 0.3814, 0.3814, -0.1182, 0.3814, 0.1202, 0.6757, 0.6757, 0.1202, -0.5422, 1.5128, 0.3814, -1.2692, 1.0281, 0.6757, 0.1202, -0.5422, 0.3814, -0.3385, 1.0281, -0.1182, 0.1202, 1.5128, 2.4608, 0.6757, -1.0914, -0.9144, -0.3385, 0.1202, 0.1202, 0.1202, 0.3814, -0.13, -0.5422, 0.1202, -0.1182, 0.3814, 1.0281, 0.6757, 1.0281, -1.2692, 0.1202, 0.3814, 1.5128, -0.1182, 0.3814, 1.0281, 0.3814, 0.1202, -0.3385, 0.6757, 0.6757, -0.5422, -1.0914, 1.0281, -0.3385, 0.3814, 0.3814, -1.0914, -0.7326, 0.6757, 1.5128, 0.6757, 1.0281, 0.6757, 1.0281, -1.0914, -0.7326, 0.1202, -0.3385, 0.3814, 0.6757, 1.5128, 0.1202, -0.7326, 1.5128, -1.0914, 0.6757, 2.4608, 0.3814, 0.6757, -0.8176, 1.0281, 0.1202, 2.4404, -0.5422, 0.1202, -0.1182, 0.3814, -0.5422, -0.5422, 0.6757, -0.3385, -1.6508, 0.6757, -0.7326, -0.1182, -1.0914, 0.3814, 0.3814, -0.1182, 0.3814, 0.1202, 0.6757, 0.6757, 0.1202, -0.5422, 1.5128, 0.3814, -1.2692, 1.0281, 0.6757, 0.1202, -0.5422, 0.3814, -0.3385, 1.0281, -0.1182, 0.1202, 1.5128, 2.4608, 0.6757, -1.0914, -0.9144, -0.3385, 0.1202, 0.1202, 0.1202, 0.3814, -0.13, -0.5422, 0.1202, -0.1182, 0.3814, 1.0281, 0.6757, 1.0281, -1.2692, 0.1202, 0.3814, 1.5128, -0.1182, NA, NA, NA));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject6# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.object(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject7# #argv <- list(structure(c(-0.00544194018731062, -0.00542949133552226, -1.20718999105839e-05, -0.00505497198006266, -0.827687885653788, -0.00315385274195005, -0.0023164952286401, -0.00117183915211372, -2.09167441982205, -0.00193959227691399, -0.00358084102808485, -3.39138861812986e-05, -0.00163051710052444, -0.00168735925488057, -0.0167253073891896, -0.237074502262169, -0.0118967636015583, -0.00307437031103621, -0.00114371252369823, -0.000860763872820255, -0.00028432076263802, -0.00329557354736053, -0.000123683950933913, -0.00026114238659798, -0.00471892942651347, -0.00317288091968884, -6.76955217513137e-05, -0.0119061189538054, -0.00233356124758579, -0.00672098496026968, -0.134965372025281, -0.00102115420103838, -0.00114816901125044), .Names = c('Craig Dunain', 'Ben Rha', 'Ben Lomond', 'Goatfell', 'Bens of Jura', 'Cairnpapple', 'Scolty', 'Traprain', 'Lairig Ghru', 'Dollar', 'Lomonds', 'Cairn Table', 'Eildon Two', 'Cairngorm', 'Seven Hills', 'Knock Hill', 'Black Hill', 'Creag Beag', 'Kildcon Hill', 'Meall Ant-Suidhe', 'Half Ben Nevis', 'Cow Hill', 'N Berwick Law', 'Creag Dubh', 'Burnswark', 'Largo Law', 'Criffel', 'Acmony', 'Ben Nevis', 'Knockfarrel', 'Two Breweries', 'Cockleroi', 'Moffat Chase')));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject8# #argv <- list(c(FALSE, FALSE));is.object(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isobject.testisobject9# #argv <- list(structure(2L, .Label = c('McNeil', 'R Core', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'));is.object(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isordered.testisordered1# #argv <- structure(list(x = structure(c(1L, 3L), .Label = c('b', 'c', 'a'), class = c('ordered', 'factor'))), .Names = 'x');do.call('is.ordered', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist1# #argv <- list(list(NULL, c('time', 'status')));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist10# #argv <- list(structure(list(height = c(58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72), weight = c(115, 117, 120, 123, 126, 129, 132, 135, 139, 142, 146, 150, 154, 159, 164)), .Names = c('height', 'weight'), row.names = c(NA, -15L), class = 'data.frame'));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist11# #argv <- list(structure(list(a_string = c('foo', 'bar'), a_bool = FALSE, a_struct = structure(list(a = 1, b = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), c = 'foo'), .Names = c('a', 'b', 'c')), a_cell = structure(list(1, 'foo', structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'bar'), .Dim = c(2L, 2L)), a_complex_scalar = 0+1i, a_list = list(1, structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), 'foo'), a_complex_matrix = structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)), a_range = c(1, 2, 3, 4, 5), a_scalar = 1, a_complex_3_d_array = structure(c(1+1i, 3+1i, 2+1i, 4+1i, 5-1i, 7-1i, 6-1i, 8-1i), .Dim = c(2L, 2L, 2L)), a_3_d_array = structure(c(1, 3, 2, 4, 5, 7, 6, 8), .Dim = c(2L, 2L, 2L)), a_matrix = structure(c(1, 3, 2, 4), .Dim = c(2L, 2L)), a_bool_matrix = structure(c(TRUE, FALSE, FALSE, TRUE), .Dim = c(2L, 2L))), .Names = c('a_string', 'a_bool', 'a_struct', 'a_cell', 'a_complex_scalar', 'a_list', 'a_complex_matrix', 'a_range', 'a_scalar', 'a_complex_3_d_array', 'a_3_d_array', 'a_matrix', 'a_bool_matrix')));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist12# #argv <- list(structure(list(f = structure(c(1L, 1L, 1L), .Label = c('1', '2'), class = 'factor'), u = structure(12:14, unit = 'kg', class = 'avector')), .Names = c('f', 'u'), row.names = 2:4, class = 'data.frame'));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist13# #argv <- list(structure(list(a = c(1L, 2L, 3L, NA), b = c(NA, 3.14159265358979, 3.14159265358979, 3.14159265358979), c = c(TRUE, NA, FALSE, TRUE), d = structure(c(1L, 2L, NA, 3L), .Label = c('aa', 'bb', 'dd'), class = 'factor'), e = structure(c('a1', NA, NA, 'a4'), class = 'AsIs'), f = structure(c(11323, NA, NA, 12717), class = 'Date')), .Names = c('a', 'b', 'c', 'd', 'e', 'f'), row.names = c(NA, -4L), class = 'data.frame'));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist14# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist16# #argv <- list(NULL);do.call('is.pairlist', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist2# #argv <- list(structure(list(y = structure(c(8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536, 9.79424), .Tsp = c(1962.25, 1971.75, 4), class = 'ts'), lag.quarterly.revenue = c(8.79636, 8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536), price.index = c(4.70997, 4.70217, 4.68944, 4.68558, 4.64019, 4.62553, 4.61991, 4.61654, 4.61407, 4.60766, 4.60227, 4.5896, 4.57592, 4.58661, 4.57997, 4.57176, 4.56104, 4.54906, 4.53957, 4.51018, 4.50352, 4.4936, 4.46505, 4.44924, 4.43966, 4.42025, 4.4106, 4.41151, 4.3981, 4.38513, 4.3732, 4.3277, 4.32023, 4.30909, 4.30909, 4.30552, 4.29627, 4.27839, 4.27789), income.level = c(5.8211, 5.82558, 5.83112, 5.84046, 5.85036, 5.86464, 5.87769, 5.89763, 5.92574, 5.94232, 5.95365, 5.9612, 5.97805, 6.00377, 6.02829, 6.03475, 6.03906, 6.05046, 6.05563, 6.06093, 6.07103, 6.08018, 6.08858, 6.10199, 6.11207, 6.11596, 6.12129, 6.122, 6.13119, 6.14705, 6.15336, 6.15627, 6.16274, 6.17369, 6.16135, 6.18231, 6.18768, 6.19377, 6.2003), market.potential = c(12.9699, 12.9733, 12.9774, 12.9806, 12.9831, 12.9854, 12.99, 12.9943, 12.9992, 13.0033, 13.0099, 13.0159, 13.0212, 13.0265, 13.0351, 13.0429, 13.0497, 13.0551, 13.0634, 13.0693, 13.0737, 13.077, 13.0849, 13.0918, 13.095, 13.0984, 13.1089, 13.1169, 13.1222, 13.1266, 13.1356, 13.1415, 13.1444, 13.1459, 13.152, 13.1593, 13.1579, 13.1625, 13.1664)), .Names = c('y', 'lag.quarterly.revenue', 'price.index', 'income.level', 'market.potential'), row.names = c('1962.25', '1962.5', '1962.75', '1963', '1963.25', '1963.5', '1963.75', '1964', '1964.25', '1964.5', '1964.75', '1965', '1965.25', '1965.5', '1965.75', '1966', '1966.25', '1966.5', '1966.75', '1967', '1967.25', '1967.5', '1967.75', '1968', '1968.25', '1968.5', '1968.75', '1969', '1969.25', '1969.5', '1969.75', '1970', '1970.25', '1970.5', '1970.75', '1971', '1971.25', '1971.5', '1971.75'), class = 'data.frame'));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist3# #argv <- list(structure(list(), .Names = character(0), row.names = integer(0), class = 'data.frame'));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist4# #argv <- list(structure(list(double.eps = 2.22044604925031e-16, double.neg.eps = 1.11022302462516e-16, double.xmin = 2.2250738585072e-308, double.xmax = 1.79769313486232e+308, double.base = 2L, double.digits = 53L, double.rounding = 5L, double.guard = 0L, double.ulp.digits = -52L, double.neg.ulp.digits = -53L, double.exponent = 11L, double.min.exp = -1022L, double.max.exp = 1024L, integer.max = 2147483647L, sizeof.long = 8L, sizeof.longlong = 8L, sizeof.longdouble = 16L, sizeof.pointer = 8L), .Names = c('double.eps', 'double.neg.eps', 'double.xmin', 'double.xmax', 'double.base', 'double.digits', 'double.rounding', 'double.guard', 'double.ulp.digits', 'double.neg.ulp.digits', 'double.exponent', 'double.min.exp', 'double.max.exp', 'integer.max', 'sizeof.long', 'sizeof.longlong', 'sizeof.longdouble', 'sizeof.pointer')));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist5# #argv <- list(structure(list(widths = structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0.880387330793302, 0.872694837975491, 0.862482627238653, 0.85694743348285, 0.844691564126209, 0.837992157219203, 0.826065549537932, 0.821813943091766, 0.801815430713592, 0.777814415451275, 0.862246453969427, 0.852609391860845, 0.852456189097792, 0.852184980555031, 0.847433895388854, 0.847321709738264, 0.843043642624801, 0.839180526055581, 0.838791375904974, 0.832684615585117, 0.829332878628487, 0.818738807141856, 0.817393740696655, 0.795187378905238, 0.771817782697421, 0.644452148607831, 0.532190150080465, 0.330404926016424), .Dim = c(28L, 3L), .Dimnames = list(c('10', '9', '2', '4', '8', '7', '6', '3', '1', '5', '22', '19', '11', '13', '18', '15', '16', '23', '24', '12', '14', '20', '21', '17', '25', '27', '28', '26'), c('cluster', 'neighbor', 'sil_width'))), clus.avg.widths = c(0.838270528963027, 0.778192810753059), avg.width = 0.799649138685191), .Names = c('widths', 'clus.avg.widths', 'avg.width')));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist6# #argv <- list(structure(list(loc = c(0.0804034870161223, 10.3548347412639), cov = structure(c(3.01119301965569, 6.14320559215603, 6.14320559215603, 14.7924762275451), .Dim = c(2L, 2L)), d2 = 2, wt = c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0), sqdist = c(0.439364946869246, 0.0143172566761092, 0.783644692619938, 0.766252947443554, 0.346865912102713, 1.41583192825661, 0.168485512965902, 0.354299830956879, 0.0943280426627965, 1.05001058449122, 1.02875556201707, 0.229332323173361, 0.873263925064789, 2.00000009960498, 0.449304354954282, 0.155023307933165, 0.118273979375253, 0.361693898800799, 0.21462398586105, 0.155558909016629, 0.471723661454506, 0.719528696331092, 0.0738164380664225, 1.46001193111051, 0.140785322548143, 0.127761195166703, 0.048012401156175, 0.811750426884519, 0.425827709817574, 0.163016638545231, 0.557810866640707, 0.277350147637843, 0.0781399119055092, 1.29559183995835, 0.718376405567138, 1.37650242941478, 0.175087780508154, 0.233808973148729, 0.693473805463067, 0.189096604125073, 1.96893781800017, 0.4759756980592, 1.69665760380474, 0.277965749373647, 0.920525436884815, 0.57525234053591, 1.59389578665009, 0.175715364671313, 0.972045794851437, 1.75514684962809, 0.0597413185507202, 0.174340343040626, 0.143421553552865, 0.997322770596838, 1.94096736957465, 2.00000001159796, 0.367000821772989, 0.682474530588235, 1.20976163307984, 1.27031685239035, 1.79775635513363, 0.0857761902860323, 0.435578932929501, 0.214370604878221, 0.494714247412686, 1.78784623754399, 1.24216674083069, 1.87749485326709, 0.0533296334123023, 1.45588362584438, 2.00000000631459, 0.208857144738039, 0.119251291573058, 0.365303924649962, 0.690656674239668, 0.0396958405786268, 0.258262120876164, 1.57360254057537, 0.307548421049514, 0.628417063100241, 1.00647098749202, 0.297624360530352, 0.400289147351669, 1.98298426250944, 0.129127182829694, 0.0794695319493149, 0.991481735944321, 0.444068154119836, 0.206790162395106, 0.574310829851377, 0.181887577583334, 0.433872021297517, 0.802994892604009, 0.293053770941001, 1.7002969001965, 0.77984639982848, 1.36127407487932, 0.761935213110323, 0.597915313430067, 0.237134831067472), prob = NULL, tol = 1e-07, eps = 9.96049758228423e-08, it = 898L, maxit = 5000, ierr = 0L, conv = TRUE), .Names = c('loc', 'cov', 'd2', 'wt', 'sqdist', 'prob', 'tol', 'eps', 'it', 'maxit', 'ierr', 'conv'), class = 'ellipsoid'));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist7# #argv <- list(structure(list(sec = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), min = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), hour = c(20L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 20L, 20L, 20L, 20L, 19L, 19L, 19L, 20L, 20L, 20L, 19L, 20L, 19L, 19L, 19L, 20L), mday = c(30L, 31L, 31L, 31L, 31L, 31L, 31L, 31L, 31L, 30L, 30L, 30L, 30L, 31L, 31L, 31L, 30L, 30L, 30L, 31L, 30L, 31L, 31L, 31L, 30L), mon = c(5L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 5L, 5L, 5L, 5L, 11L, 11L, 11L, 5L, 5L, 5L, 11L, 5L, 11L, 11L, 11L, 5L), year = c(72L, 72L, 73L, 74L, 75L, 76L, 77L, 78L, 79L, 81L, 82L, 83L, 85L, 87L, 89L, 90L, 92L, 93L, 94L, 95L, 97L, 98L, 105L, 108L, 112L), wday = c(5L, 0L, 1L, 2L, 3L, 5L, 6L, 0L, 1L, 2L, 3L, 4L, 0L, 4L, 0L, 1L, 2L, 3L, 4L, 0L, 1L, 4L, 6L, 3L, 6L), yday = c(181L, 365L, 364L, 364L, 364L, 365L, 364L, 364L, 364L, 180L, 180L, 180L, 180L, 364L, 364L, 364L, 181L, 180L, 180L, 364L, 180L, 364L, 364L, 365L, 181L), isdst = c(1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 1L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), tzone = c('', 'EST', 'EDT')));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist8# #argv <- list(structure(list(usr = c(0.568, 1.432, -1.08, 1.08), xaxp = c(0.6, 1.4, 4), yaxp = c(-1, 1, 4)), .Names = c('usr', 'xaxp', 'yaxp')));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_ispairlist.testispairlist9# #argv <- list(structure(list(x = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1), y = c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10), fac = structure(c(1L, 3L, 2L, 3L, 3L, 1L, 2L, 3L, 2L, 2L), .Label = c('A', 'B', 'C'), class = 'factor')), .Names = c('x', 'y', 'fac'), row.names = c(NA, -10L), class = 'data.frame'));is.pairlist(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_israw.testisraw1# #argv <- list(structure(list(`character(0)` = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'character(0)', row.names = character(0), class = 'data.frame'));is.raw(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_israw.testisraw2# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.raw(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_israw.testisraw3# #argv <- list(c(0.367649186507741, -0.792514168501158, 0.0770550181313438, 0.193209990320579, 0.556026088821232, -1.90995675991293, 1.21007077813812, -1.22764970620883));is.raw(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_israw.testisraw4# #argv <- list(structure(c(1, 1, 1, 1, 1, 1), .Dim = 1:3));is.raw(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_israw.testisraw5# #argv <- list(raw(0));is.raw(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testIsRecursive# #{ !is.recursive(function() {}) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testIsRecursive# #{ !is.recursive(list()) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testIsRecursive# #{ !is.recursive(tools:::C_parseRd$address) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testIsRecursive# #{ is.recursive(1) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testIsRecursive# #{ is.recursive(1:3) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testIsRecursive# #{ is.recursive(1L) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testIsRecursive# #{ is.recursive(NA) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testIsRecursive# #{ is.recursive(NULL) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testIsRecursive# #{ is.recursive(TRUE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testIsRecursive# #{ is.recursive(c(1,2,3)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive1# #argv <- list(c(1, 5.75, 10.5, 15.25, 20));is.recursive(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive10# #argv <- list(logical(0));is.recursive(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive11# #argv <- list(structure(list(Df = c(1L, 7L), `Sum Sq` = c(158.407612694902, 204.202165082876), `Mean Sq` = c(158.407612694902, 29.1717378689823), `F value` = c(5.43017400630538, NA), `Pr(>F)` = c(0.052592726218915, NA)), .Names = c('Df', 'Sum Sq', 'Mean Sq', 'F value', 'Pr(>F)'), row.names = c('depression', 'Residuals'), class = c('anova', 'data.frame'), heading = c('Analysis of Variance Table\n', 'Response: weight')));is.recursive(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive13# #argv <- list(expression(quote(expression(4, 1.12837916709551))));do.call('is.recursive', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive2# #argv <- list(structure(c(1+0i, 5+0i, 9+0i, 13+0i, 17+0i, 21+0i, 2+0i, 6+0i, 10+0i, 14+0i, 18+0i, 22+0i, 3+0i, 7+0i, 11+0i, 15+0i, 19+0i, 23+0i, 4+0i, 8+0i, 12+0i, 16+0i, 20+0i, 24+0i), .Dim = c(6L, 4L)));is.recursive(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive3# #argv <- list(structure(list(var = structure(c(2L, 5L, 1L, 1L, 4L, 5L, 5L, 1L, 3L, 1L, 1L, 2L, 1L, 6L, 1L, 1L, 1L), .Label = c('', 'hs.grad', 'illiteracy', 'murder', 'population', 'region'), class = 'factor'), n = c(50L, 10L, 7L, 3L, 40L, 32L, 13L, 3L, 10L, 6L, 4L, 19L, 4L, 15L, 11L, 4L, 8L), wt = c(50, 10, 7, 3, 40, 32, 13, 3, 10, 6, 4, 19, 4, 15, 11, 4, 8), dev = c(18501092, 668812.4, 269049.714285714, 40824, 9908099.1, 5718045.5, 2592172, 97824.6666666667, 1337366.4, 249796.833333333, 155810.75, 2105534.63157895, 276864.75, 1264031.6, 209138.181818182, 224618.75, 2526229.5), yval = c(4435.8, 3639.6, 3515.57142857143, 3929, 4634.85, 4532.875, 4317, 3772.33333333333, 4480.4, 4231.16666666667, 4854.25, 4680.57894736842, 4346.75, 4769.6, 4627.72727272727, 5159.75, 5042.75), complexity = c(0.42830879928601, 0.0194009459395308, 0.01, 0.01, 0.089931129470628, 0.0588430078006851, 0.0588430078006851, 0.01, 0.050362368700543, 0.01, 0.01, 0.0376981247853036, 0.01, 0.0376981247853036, 0.00682341562063013, 0.01, 0.01), ncompete = c(4L, 3L, 0L, 0L, 4L, 4L, 4L, 0L, 4L, 0L, 0L, 4L, 0L, 4L, 0L, 0L, 0L), nsurrogate = c(3L, 0L, 0L, 0L, 2L, 4L, 0L, 0L, 4L, 0L, 0L, 2L, 0L, 3L, 0L, 0L, 0L)), .Names = c('var', 'n', 'wt', 'dev', 'yval', 'complexity', 'ncompete', 'nsurrogate'), row.names = c(1L, 2L, 4L, 5L, 3L, 6L, 12L, 24L, 25L, 50L, 51L, 13L, 26L, 27L, 54L, 55L, 7L), class = 'data.frame'));is.recursive(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive4# #argv <- list(structure(c(0, 0.693147180559945, 1.09861228866811, 1.38629436111989, 1.6094379124341, 1.79175946922805, 1.94591014905531, 2.07944154167984, 2.19722457733622, 2.30258509299405, 2.39789527279837, 2.484906649788, 2.56494935746154, 2.63905732961526, 2.70805020110221, 2.77258872223978, 2.83321334405622, 2.89037175789616, 2.94443897916644, 2.99573227355399, 3.04452243772342, 3.09104245335832, 3.13549421592915, 3.17805383034795, 3.2188758248682, 3.25809653802148, 3.29583686600433, 3.3322045101752, 3.36729582998647, 3.40119738166216, 3.43398720448515, 3.46573590279973, 3.49650756146648, 3.52636052461616, 3.55534806148941, 3.58351893845611, 3.61091791264422, 3.63758615972639, 3.66356164612965, 3.68887945411394, 3.71357206670431, 3.73766961828337, 3.76120011569356, 3.78418963391826, 3.80666248977032, 3.8286413964891, 3.85014760171006, 3.87120101090789, 3.89182029811063, 3.91202300542815, 3.93182563272433, 3.95124371858143, 3.97029191355212, 3.98898404656427, 4.00733318523247, 4.02535169073515, 4.04305126783455, 4.06044301054642, 4.07753744390572, 4.0943445622221, 4.11087386417331, 4.12713438504509, 4.14313472639153, 4.15888308335967, 4.17438726989564, 4.18965474202643, 4.20469261939097, 4.21950770517611, 4.23410650459726, 4.24849524204936, 4.26267987704132, 4.27666611901606, 4.29045944114839, 4.30406509320417, 4.31748811353631, 4.33073334028633, 4.34380542185368, 4.35670882668959, 4.36944785246702, 4.38202663467388, 4.39444915467244, 4.40671924726425, 4.4188406077966, 4.43081679884331, 4.44265125649032, 4.45434729625351, 4.46590811865458, 4.47733681447821, 4.48863636973214, 4.49980967033027, 4.51085950651685, 4.52178857704904, 4.53259949315326, 4.54329478227, 4.55387689160054, 4.56434819146784, 4.57471097850338, 4.58496747867057, 4.59511985013459, 4.60517018598809), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100')));is.recursive(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive5# #argv <- list(c(4.2946094590101+0i, -3.25699475013756-2.24807847868298i, -7.95013358893225-2.01799537233252i, -3.67333331331688+0.2922506370947i, 10.1942090590333+0.2633318847587i, -3.52243716497356+3.01559327870726i, 0.840489557961749+0.760755891710788i, 0.34614657901946+3.92303947429563i, 1.25203951718932-0.04113309513059i, 1.25203951718932+0.04113309513059i, 0.34614657901946-3.92303947429563i, 0.840489557961749-0.760755891710788i, -3.52243716497356-3.01559327870726i, 10.1942090590333-0.2633318847587i, -3.67333331331688-0.2922506370947i, -7.95013358893225+2.01799537233252i, -3.25699475013756+2.24807847868298i));is.recursive(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive6# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('age', 'eet', 'g2', 'grade', 'gleason', 'ploidy')));is.recursive(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive7# #argv <- list(structure(list(var = structure(c(2L, 1L, 1L), .Label = c('', 'Start'), class = 'factor'), n = c(81L, 62L, 19L), wt = c(81, 62, 19), dev = c(24.3, 8.57647058823529, 14.175), yval = c(1, 1, 2), complexity = c(0.0637254901960785, 0, 1e-15), ncompete = c(2L, 0L, 0L), nsurrogate = c(0L, 0L, 0L), yval2 = structure(c(1, 1, 2, 64, 56, 8, 17, 6, 11, 0.7, 0.852610030706244, 0.310704960835509, 0.3, 0.147389969293756, 0.689295039164491, 0.999999999999999, 0.718382352941176, 0.281617647058824), .Dim = c(3L, 6L), .Dimnames = list(NULL, c('', '', '', '', '', 'nodeprob')))), .Names = c('var', 'n', 'wt', 'dev', 'yval', 'complexity', 'ncompete', 'nsurrogate', 'yval2'), row.names = c(NA, 3L), class = 'data.frame'));is.recursive(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive8# #argv <- list(1e+09);is.recursive(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isrecursive.testisrecursive9# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.recursive(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_issymbol.testissymbol1# #argv <- list(0.05);is.symbol(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_issymbol.testissymbol2# #argv <- list(structure(c(1, 1, 1, 1, 1, 1), .Dim = 1:3));is.symbol(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_issymbol.testissymbol3# #argv <- list(numeric(0));is.symbol(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_issymbol.testissymbol4# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));is.symbol(argv[[1]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testIsUnsorted# #{ is.unsorted(c(1+1i,2+1i,2+1i), strictly=FALSE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testIsUnsorted# #{ is.unsorted(c(1+1i,2+1i,2+1i), strictly=TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testIsUnsorted# #{ is.unsorted(c(1,2,2), strictly=NA) } Error in is.unsorted(c(1, 2, 2), strictly = NA) : invalid 'strictly' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testIsUnsorted# #{ is.unsorted(c(1,2,2,3), strictly=TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testIsUnsorted# #{ is.unsorted(c(1,2,3,4)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testIsUnsorted# #{ is.unsorted(c(1,2,6,4)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted1# #argv <- list(c(1L, 2L, 4L), FALSE); .Internal(is.unsorted(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted11# #argv <- structure(list(x = c('A', 'B', 'C', 'D', 'E', 'F', 'G', 'H', 'I', 'J', 'K', 'L', 'M', 'N', 'O', 'P', 'Q', 'R', 'S', 'T', 'U', 'V', 'W', 'X', 'Y', 'Z')), .Names = 'x');do.call('is.unsorted', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted12# #argv <- structure(list(x = c(NA, 1, 2, 3, 2), na.rm = TRUE), .Names = c('x', 'na.rm'));do.call('is.unsorted', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted13# #argv <- structure(list(x = c(1L, 2L, 3L, 5L, 5L, 6L, 6L, 7L, 7L, 7L, 7L, 7L, 8L, 8L, 9L, 9L, 10L, 12L, 12L, 12L, 12L, 13L, 15L, 20L, 28L)), .Names = 'x');do.call('is.unsorted', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted14#Ignored.ImplementationError# #argv <- structure(list(x = structure(list(x = 3:4, y = 1:2), .Names = c('x', 'y'), row.names = c(NA, -2L), class = 'data.frame')), .Names = 'x');do.call('is.unsorted', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted15# #argv <- structure(list(x = structure(list(x = c(2L, 1L)), .Names = 'x', row.names = c(NA, -2L), class = 'data.frame')), .Names = 'x');do.call('is.unsorted', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted2# #argv <- list(c(10.7041467781967, 11.5754756379084, 12.524991240374, 13.5975143137056, 14.4688431734172, 15.4183587758829, 16.4908818492144, 17.7566218541999, 19.1425780866377, 20.5285343190754, 22.0685075746448, 23.9825281292691, 26.4455166737415, 29.7592803351446, 34.4380365011698, 41.4254228764895, 44.7391865378926, 49.4179427039178, 56.4053290792375), FALSE); .Internal(is.unsorted(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted3# #argv <- list(c(-19, -12.21, -7.07, -6.14, -4.56, -4.09, -3.8, -2.22, -1.97, -1.95, -1.83, -1.82, -1.77, -1.56, -1.48, -1.42, -1.19, -1.12, -1.09, -1.04, -0.96, -0.89, -0.87, -0.87, -0.78, -0.77, -0.77, -0.74, -0.71, -0.63, -0.61, -0.59, -0.54, -0.51, -0.5, -0.5, -0.44, -0.4, -0.4, -0.37, -0.33, -0.28, -0.21, -0.2, -0.16, -0.16, -0.12, -0.1, -0.05, -0.01, -0.01, 0.04, 0.11, 0.13, 0.14, 0.15, 0.15, 0.25, 0.25, 0.26, 0.34, 0.42, 0.44, 0.46, 0.48, 0.48, 0.49, 0.49, 0.51, 0.57, 0.58, 0.64, 0.66, 0.7, 0.74, 0.8, 0.83, 0.94, 0.94, 1.02, 1.09, 1.12, 1.15, 1.18, 1.19, 1.63, 1.86, 1.92, 2.11, 2.17, 2.21, 2.22, 2.25, 2.64, 2.75, 4.18, 4.6, 5.74, 22.42, 44.32), FALSE); .Internal(is.unsorted(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted4# #argv <- list(c('A', 'B', 'C', 'D', 'E', 'F', 'G', 'H', 'I', 'J', 'K', 'L', 'M', 'N', 'O', 'P', 'Q', 'R', 'S', 'T', 'U', 'V', 'W', 'X', 'Y', 'Z'), FALSE); .Internal(is.unsorted(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted5# #argv <- list(c(8, 6, 9, 4, 3, 7, 1, 5, 2), TRUE); .Internal(is.unsorted(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted6# #argv <- list(c(1, 2, 3, 2), FALSE); .Internal(is.unsorted(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted7#Ignored.ImplementationError# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')), FALSE); .Internal(is.unsorted(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted8# #argv <- list(c(2L, 1L, 0L, 3L), FALSE); .Internal(is.unsorted(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isunsorted.testisunsorted9# #argv <- list(c(1L, 3L, 2L, 4L), TRUE); .Internal(is.unsorted(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #is.vector(1L, 'numeric'); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ is.vector(1) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ is.vector(1:3) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ is.vector(NULL) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ x<-c(1); attr(x, "foo")<-"foo"; is.vector(x) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ x<-c(1,3); is.vector(x, "d"); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ x<-c(1,3); is.vector(x, "double"); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ x<-c(1,3); is.vector(x, "integer"); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ x<-c(1:3); is.vector(x, "double"); } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ x<-c(1:3); is.vector(x, "integer"); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ x<-list(1); attr(x, "foo")<-"foo"; is.vector(x) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{ x<-list(1,3); } ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{is.vector(c(1,2), TRUE);} Error in is.vector(c(1, 2), TRUE) : invalid 'mode' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{is.vector(c(1,2), c("sss", "dddd"));} Error in is.vector(c(1, 2), c("sss", "dddd")) : invalid 'mode' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{is.vector(c(TRUE,FALSE),"logical");} [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{is.vector(c(TRUE,FALSE),"numeric");} [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{x<-1;class(x)<-"a";is.vector(x);} [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testIsVector# #{x<-1;names(x)<-"a";is.vector(x);} [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector1# #argv <- list(list(structure(0, class = c('POSIXct', 'POSIXt'), tzone = 'GMT'), 1262304000), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector10# #argv <- list(structure(list(`1` = c(0, 0, 0, 0, 0, 0, 2.96439387504748e-323, 0, 0, 0, 0, 0)), .Names = '1'), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector11# #argv <- list(list(structure(list(srcfile = c('/home/lzhao/hg/r-instrumented/library/methods/R/methods', '/home/lzhao/hg/r-instrumented/library/methods/R/methods'), frow = c(6030L, 6032L), lrow = c(6031L, 6063L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2, class = 'data.frame'), structure(list(srcfile = '/home/lzhao/hg/r-instrumented/library/methods/R/methods', frow = 6036L, lrow = 6055L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L), class = 'data.frame')), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector12# #argv <- list(structure(list(B = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L), .Label = c('I', 'II', 'III', 'IV', 'V', 'VI'), class = 'factor'), V = structure(c(3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L), .Label = c('Golden.rain', 'Marvellous', 'Victory'), class = 'factor'), N = structure(c(2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt'), class = 'factor')), .Names = c('B', 'V', 'N'), class = 'data.frame', row.names = 2:72), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector13# #argv <- list(list('‘FUN’ is found by a call to ‘match.fun’ and typically is specified as a function or a symbol (e.g. a backquoted name) or a character string specifying a function to be searched for from the environment of the call to ‘lapply’.'), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector14# #argv <- list(list(c(35, 232, 232, 355, 1041, 1510, 1525, 1548, 1560, 1560, 1563, 1641, 1648, 1652, 1654, 1654, 1690, 1690, 1710, 1710, 1710, 1710, 1779, 1779, 1779, 1779, 1787, 1804, 1812, 1836, 1854, 1864, 1899, 1919, 1920, 1958, 1963, 2007, 2011, 2024, 2024, 2024, 2028, 2061, 2061, 2061, 2062, 2062, 2075, 2085, 2103, 2156, 2227, 2264, 2339, 2339, 2361, 2361, 2387, 2387, 2388, 2426, 2431, 2460, 2493, 2493, 2542, 2559, 2559, 2570, 2676, 2738, 2782, 2984, 3067, 3144, 3154, 3199, 3228, 3297, 3328, 3328, 3330, 3383, 3384, 3384, 3402, 3402, 3441, 3458, 3459, 3459, 3476, 3476, 3695, 3695, 3776, 3776, 3776, 3830, 3856, 3909, 3909, 3968, 3968, 4001, 4119, 4124, 4207, 4207, 4310, 4390, 4479, 4479, 4688), c(0, 0, 0, 0, -1, 0, 0, -1, -1, -1, 0, 0, 0, 0, 0, 0, -1, -1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1, -1, -1, -1, -1, 0, 0, -1, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0)), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector15# #argv <- list(structure(c(1+2i, 5+0i, 3-4i, -6+0i), .Dim = c(2L, 2L)), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector16# #argv <- list(structure(list(row.names = character(0), A = numeric(0), B = numeric(0), C = complex(0), D = integer(0), E = logical(0), F = character(0)), .Names = c('row.names', 'A', 'B', 'C', 'D', 'E', 'F')), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector17# #argv <- list(structure(c(315.42, 316.32, 316.49, 317.56, 318.13, 318, 316.39, 314.66, 313.68, 313.18, 314.66, 315.43, 316.27, 316.81, 317.42, 318.87, 319.87, 319.43, 318.01, 315.75, 314, 313.68, 314.84, 316.03, 316.73, 317.54, 318.38, 319.31, 320.42, 319.61, 318.42, 316.64, 314.83, 315.15, 315.95, 316.85, 317.78, 318.4, 319.53, 320.41, 320.85, 320.45, 319.44, 317.25, 316.12, 315.27, 316.53, 317.53, 318.58, 318.92, 319.7, 321.22, 322.08, 321.31, 319.58, 317.61, 316.05, 315.83, 316.91, 318.2, 319.41, 320.07, 320.74, 321.4, 322.06, 321.73, 320.27, 318.54, 316.54, 316.71, 317.53, 318.55, 319.27, 320.28, 320.73, 321.97, 322, 321.71, 321.05, 318.71, 317.65, 317.14, 318.71, 319.25, 320.46, 321.43, 322.22, 323.54, 323.91, 323.59, 322.26, 320.21, 318.48, 317.94, 319.63, 320.87, 322.17, 322.34, 322.88, 324.25, 324.83, 323.93, 322.39, 320.76, 319.1, 319.23, 320.56, 321.8, 322.4, 322.99, 323.73, 324.86, 325.41, 325.19, 323.97, 321.92, 320.1, 319.96, 320.97, 322.48, 323.52, 323.89, 325.04, 326.01, 326.67, 325.96, 325.13, 322.9, 321.61, 321.01, 322.08, 323.37, 324.34, 325.3, 326.29, 327.54, 327.54, 327.21, 325.98, 324.42, 322.91, 322.9, 323.85, 324.96, 326.01, 326.51, 327.01, 327.62, 328.76, 328.4, 327.2, 325.28, 323.2, 323.4, 324.64, 325.85, 326.6, 327.47, 327.58, 329.56, 329.9, 328.92, 327.89, 326.17, 324.68, 325.04, 326.34, 327.39, 328.37, 329.4, 330.14, 331.33, 332.31, 331.9, 330.7, 329.15, 327.34, 327.02, 327.99, 328.48, 329.18, 330.55, 331.32, 332.48, 332.92, 332.08, 331.02, 329.24, 327.28, 327.21, 328.29, 329.41, 330.23, 331.24, 331.87, 333.14, 333.8, 333.42, 331.73, 329.9, 328.4, 328.17, 329.32, 330.59, 331.58, 332.39, 333.33, 334.41, 334.71, 334.17, 332.88, 330.77, 329.14, 328.77, 330.14, 331.52, 332.75, 333.25, 334.53, 335.9, 336.57, 336.1, 334.76, 332.59, 331.41, 330.98, 332.24, 333.68, 334.8, 335.22, 336.47, 337.59, 337.84, 337.72, 336.37, 334.51, 332.6, 332.37, 333.75, 334.79, 336.05, 336.59, 337.79, 338.71, 339.3, 339.12, 337.56, 335.92, 333.74, 333.7, 335.13, 336.56, 337.84, 338.19, 339.9, 340.6, 341.29, 341, 339.39, 337.43, 335.72, 335.84, 336.93, 338.04, 339.06, 340.3, 341.21, 342.33, 342.74, 342.07, 340.32, 338.27, 336.52, 336.68, 338.19, 339.44, 340.57, 341.44, 342.53, 343.39, 343.96, 343.18, 341.88, 339.65, 337.8, 337.69, 339.09, 340.32, 341.2, 342.35, 342.93, 344.77, 345.58, 345.14, 343.81, 342.22, 339.69, 339.82, 340.98, 342.82, 343.52, 344.33, 345.11, 346.88, 347.25, 346.61, 345.22, 343.11, 340.9, 341.17, 342.8, 344.04, 344.79, 345.82, 347.25, 348.17, 348.75, 348.07, 346.38, 344.52, 342.92, 342.63, 344.06, 345.38, 346.12, 346.79, 347.69, 349.38, 350.04, 349.38, 347.78, 345.75, 344.7, 344.01, 345.5, 346.75, 347.86, 348.32, 349.26, 350.84, 351.7, 351.11, 349.37, 347.97, 346.31, 346.22, 347.68, 348.82, 350.29, 351.58, 352.08, 353.45, 354.08, 353.66, 352.25, 350.3, 348.58, 348.74, 349.93, 351.21, 352.62, 352.93, 353.54, 355.27, 355.52, 354.97, 353.74, 351.51, 349.63, 349.82, 351.12, 352.35, 353.47, 354.51, 355.18, 355.98, 356.94, 355.99, 354.58, 352.68, 350.72, 350.92, 352.55, 353.91), .Tsp = c(1959, 1990.91666666667, 12), class = 'ts'), 'symbol'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector18# #argv <- list(structure(list(age = 60), .Names = 'age', row.names = c(NA, -1L), class = 'data.frame'), 'numeric'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector19# #argv <- list(c(1.00000001+1.00000001i, 1.00000002+1.00000002i, 1.00000003+1.00000003i, 1.00000004+1.00000004i, 1.00000005+1.00000005i, 1.00000006+1.00000006i, 1.00000007+1.00000007i, 1.00000008+1.00000008i, 1.00000009+1.00000009i, 1.0000001+1.0000001i), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector2# #argv <- list(list(c(' 1', 'NA', ' 1'), c('1.1', ' NA', '2.0'), c('1.1+0i', ' NA', '3.0+0i'), c('NA', 'NA', 'NA'), c('FALSE', ' NA', ' TRUE'), c('abc', NA, 'def')), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector20# #argv <- list(list(), 'list'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector21# #argv <- list(structure(list(`1` = c(256.266652076228, 529.998452486383, 655.612271403493, 31.5607377310524, 10.1780771257452, 0.82654086298349, 0.192588149393303, 0.27340160887417, 0.420761091220242, 0.212073424883136, 6006.37649011526, 8.9782737548589e+42)), .Names = '1'), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector22# #argv <- list(structure(list(Subject = structure(c(40L, 40L, 40L, 40L, 40L, 40L, 40L, 40L), .Label = c('42', '28', '30', '56', '46', '5', '55', '32', '43', '29', '3', '11', '45', '22', '40', '47', '31', '14', '7', '41', '33', '44', '23', '57', '34', '18', '36', '21', '15', '38', '10', '1', '58', '51', '4', '6', '19', '2', '27', '53', '37', '20', '12', '9', '17', '26', '8', '49', '39', '54', '25', '35', '52', '13', '16', '59', '48', '24', '50'), class = c('ordered', 'factor')), Wt = c(1.7, 1.7, 1.7, 1.7, 1.7, 1.7, 1.7, 1.7), Apgar = structure(c(8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L), .Label = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10'), class = c('ordered', 'factor')), ApgarInd = structure(c(2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('< 5', '>= 5'), class = 'factor'), time = c(0, 4, 6, 23.8, 27, 28, 39.5, 47), dose = c(17, 17, NA, 4, 7.5, 4, 4, NA), conc = c(NA, NA, 19.1, NA, NA, NA, NA, 33.3)), .Names = c('Subject', 'Wt', 'Apgar', 'ApgarInd', 'time', 'dose', 'conc'), row.names = c('669', '670', '671', '672', '673', '674', '675', '676'), class = 'data.frame'), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector23# #argv <- list(list(structure(c(0.445983387275159, 0.0291424961297979, 0.305722673636889, 0.0640910333172597, 6.1841587262516e-05, 0.000608774190997193, 0.00533346072966287, 1.87468589092225, 0.00776943250876635, 0.00695873604736988), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), 0), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector24# #argv <- list(structure(list(`1` = structure(list(stats = c(-9.90250128905181, -7.70852699427806, -5.13496062122677, -3.95948091921295, 1.46970778502994), n = 29L, conf = c(-6.23492561965266, -4.03499562280088), out = numeric(0)), .Names = c('stats', 'n', 'conf', 'out')), `2` = structure(list(stats = c(-11.1332994435188, -6.39592651878103, -4.21825647639093, -2.4710346135438, 0.142332232638518), n = 27L, conf = c(-5.41170283935282, -3.02481011342905), out = c(5.49660997093232, 3.55716552721441)), .Names = c('stats', 'n', 'conf', 'out')), `3` = structure(list(stats = c(-6.21825647639093, -4.89504044270307, -3.50339002906768, -2.12460329098075, 1.68674122392151), n = 27L, conf = c(-4.34580001700278, -2.66098004113257), out = 3.49961675599928), .Names = c('stats', 'n', 'conf', 'out')), `4` = structure(list(stats = c(-5.85766776736148, -2.17391966458661, -1.21825647639093, 0.620760276498144, 4.06758688195534), n = 27L, conf = c(-2.06803799696724, -0.368474955814626), out = numeric(0)), .Names = c('stats', 'n', 'conf', 'out')), `5` = structure(list(stats = c(-7.47307099543129, -3.31679346391683, -0.571500134198763, 0.883997101871453, 5.68320653608317), n = 29L, conf = c(-1.8040063492643, 0.661006080866776), out = numeric(0)), .Names = c('stats', 'n', 'conf', 'out')), `6` = structure(list(stats = c(-5.74371144541934, -1.32005454439779, -0.0691719185754582, 1.68918858100201, 5.88399710187145), n = 25L, conf = c(-1.02009274620179, 0.881748909050878), out = numeric(0)), .Names = c('stats', 'n', 'conf', 'out')), `7` = structure(list( stats = c(-0.959725366614089, 1.04051908078705, 2.68320653608317, 4.68320653608317, 6.86503937877323), n = 29L, conf = c(1.61444701144563, 3.7519660607207), out = c(10.4020441274641, 11.9338597320297)), .Names = c('stats', 'n', 'conf', 'out')), `8` = structure(list(stats = c(-4.31872184443094, -0.341901367712618, 2.09749871094819, 4.42849305489153, 9.86504029478776), n = 29L, conf = c(0.69787150218962, 3.49712591970676), out = numeric(0)), .Names = c('stats', 'n', 'conf', 'out')), `9` = structure(list( stats = c(-4.47307099543129, 1.46970778502994, 3.27573063223268, 6.09749871094819, 8.5266833961141), n = 29L, conf = c(1.91794309465097, 4.63351816981439), out = numeric(0)), .Names = c('stats', 'n', 'conf', 'out')), `10` = structure(list(stats = c(-5.31679346391683, -1.04725655125673, 2.61440793064106, 7.68320653608317, 14.5985362650564), n = 26L, conf = c(-0.0908438616349159, 5.31965972291703), out = numeric(0)), .Names = c('stats', 'n', 'conf', 'out')), `11` = structure(list(stats = c(-4.26322883423527, -1.27884444060771, 1.37070166144218, 5.85051662661329, 10.1854674121229), n = 31L, conf = c(-0.65244259398095, 3.39384591686531), out = numeric(0)), .Names = c('stats', 'n', 'conf', 'out'))), .Dim = 11L, .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11'))), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector25# #argv <- list(structure(list(A = c(1L, NA, 1L), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA, NA, NA), E = c(FALSE, NA, TRUE), F = structure(c(1L, NA, 2L), .Label = c('abc', 'def'), class = 'factor')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector26# #argv <- list(list(structure(list(srcfile = c(NA, '/home/lzhao/hg/r-instrumented/library/graphics/R/graphics'), frow = c(NA, 3990L), lrow = c(NA, 3991L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2, class = 'data.frame'), structure(list(srcfile = '/home/lzhao/hg/r-instrumented/library/graphics/R/graphics', frow = 3998L, lrow = 4009L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L), class = 'data.frame')), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector27# #argv <- list(structure(list(y = c(-0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861), x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE), z = 1:10), .Names = c('y', 'x', 'z'), terms = quote(y ~ x * z), row.names = c(NA, 10L), class = 'data.frame'), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector28# #argv <- list(list(structure(c(-1L, -2L, -3L, -4L, -5L, -6L, -7L, -8L, -9L, -10L), .Dim = c(2L, 5L)), structure(list(V1 = 1:5, V2 = 6:10, V3 = 11:15, V4 = 16:20, V5 = 21:25), .Names = c('V1', 'V2', 'V3', 'V4', 'V5'), row.names = c(NA, -5L), class = 'data.frame')), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector29# #argv <- list(structure(list(group = structure(c(1L, 1L), .Label = c('Ctl', 'Trt'), class = 'factor', contrasts = 'contr.treatment')), .Names = 'group', class = 'data.frame', row.names = 1:2), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector3# #argv <- list(structure(list(A = c(1, NA, 1), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA_integer_, NA_integer_, NA_integer_), E = c(FALSE, NA, TRUE), F = c('abc', NA, 'def')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector30# #argv <- list(structure(c(12L, 120L, 116L), .Dim = 3L, .Dimnames = structure(list(c('0-5yrs', '6-11yrs', '12+ yrs')), .Names = ''), class = 'table'), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector31# #argv <- list(structure(c(1L, 3L, 2L, 3L, 3L, 1L, 2L, 3L, 2L, 2L), .Label = c('A', 'B', 'C'), class = 'factor'), 'symbol'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector32# #argv <- list(structure(list(Df = c(NA, 0L), Deviance = c(NA, 0), `Resid. Df` = c(10L, 10L), `Resid. Dev` = c(2.74035772634541, 2.74035772634541)), .Names = c('Df', 'Deviance', 'Resid. Df', 'Resid. Dev'), row.names = c('NULL', 'x'), class = c('anova', 'data.frame'), heading = 'Analysis of Deviance Table\n\nModel: gaussian, link: identity\n\nResponse: y\n\nTerms added sequentially (first to last)\n\n'), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector34# #argv <- structure(list(x = 3), .Names = 'x');do.call('is.vector', argv) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector4# #argv <- list(structure(list(character = character(0), numeric = numeric(0), numeric = numeric(0), complex = complex(0), integer = integer(0), logical = logical(0), character = character(0)), .Names = c('character', 'numeric', 'numeric', 'complex', 'integer', 'logical', 'character')), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector5# #argv <- list(structure(list(group = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Ctl', 'Trt'), class = 'factor')), .Names = 'group', class = 'data.frame', row.names = c(NA, 20L)), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector6# #argv <- list(structure(list(y = c(1.08728092481538, 0.0420572471552261, 0.787502161306819, 0.512717751544676, 3.35376639535311, 0.204341510750309, -0.334930602487435, 0.80049208412789, -0.416177803375218, -0.777970346246018, 0.934996808181635, -0.678786709127108, 1.52621589791412, 0.5895781228122, -0.744496121210548, -1.99065153885627, 1.51286447692396, -0.750182409847851), A = c(0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1), U = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('a', 'b', 'c'), class = 'factor'), V = structure(c(1L, 1L, 2L, 2L, 3L, 3L, 1L, 1L, 2L, 2L, 3L, 3L, 1L, 1L, 2L, 2L, 3L, 3L), .Label = c('a', 'b', 'c'), class = 'factor')), .Names = c('y', 'A', 'U', 'V'), terms = quote(y ~ A:U + A:V - 1), row.names = c(NA, 18L), class = 'data.frame'), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector7# #argv <- list(list(integer(0)), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector8# #argv <- list(list(structure(0:100, .Tsp = c(1, 101, 1), class = 'ts'), structure(c(0, 10, 20, 30, 40, 50, 60, 70, 80, 90, 100, 110, 120, 130, 140, 150, 160, 170, 180, 190, 200, 210, 220, 230, 240, 250, 260, 270, 280, 290, 300, 310, 320, 330, 340, 350, 360, 370, 380, 390, 400, 410, 420, 430, 440, 450, 460, 470, 480, 490, 500, 510, 520, 530, 540, 550, 560, 570, 580, 590, 600, 610, 620, 630, 640, 650, 660, 670, 680, 690, 700, 710, 720, 730, 740, 750, 760, 770, 780, 790, 800, 810, 820, 830, 840, 850, 860, 870, 880, 890, 900, 910, 920, 930, 940, 950, 960, 970, 980, 990, 1000), .Tsp = c(1, 101, 1), class = 'ts'), structure(c(-4, -3, -2, -1, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96), .Tsp = c(1, 101, 1), class = 'ts')), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_isvector.testisvector9# #argv <- list(structure(list(Plant = structure(c(5L, 5L, 5L, 5L, 5L, 5L, 5L), .Label = c('Qn1', 'Qn2', 'Qn3', 'Qc1', 'Qc3', 'Qc2', 'Mn3', 'Mn2', 'Mn1', 'Mc2', 'Mc3', 'Mc1'), class = c('ordered', 'factor')), Type = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L), .Label = c('Quebec', 'Mississippi'), class = 'factor'), Treatment = structure(c(2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('nonchilled', 'chilled'), class = 'factor')), .Names = c('Plant', 'Type', 'Treatment'), class = 'data.frame', row.names = 36:42), 'any'); .Internal(is.vector(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_julianDate.testjulianDate1# #argv <- structure(list(x = structure(16352, class = 'Date'), origin = -2440588), .Names = c('x', 'origin'));do.call('julian.Date', argv) [1] 2456940 attr(,"origin") [1] -2440588 ##com.oracle.truffle.r.test.builtins.TestBuiltin_labels.testlabels1# #argv <- structure(list(object = structure(c(-469.098459411633, 469.356672501203, -0.429918004252249, 0.00364370239091614, -0.256875513692359, -0.0204799335117722, 2.00613934942808), .Names = c('(Intercept)', 'gravity', 'ph', 'osmo', 'conduct', 'urea', 'log(calc)'))), .Names = 'object');do.call('labels', argv) [1] "(Intercept)" "gravity" "ph" "osmo" "conduct" [6] "urea" "log(calc)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #f <- function(...) { .Internal(lapply(1:4, NA)) }; f() Error in f() : attempt to apply non-function ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #f <- function(...) { .Internal(lapply(1:4, NULL)) }; f() Error in f() : attempt to apply non-function ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #f <- function(...) { .Internal(lapply(FUN=function(x){x})) }; f() Error in f() : 1 argument passed to .Internal(lapply) which requires 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #f <- function(...) { .Internal(lapply(NA, FUN=function(x){x})) }; f() [[1]] [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #f <- function(...) { .Internal(lapply(NULL, function(x){x})) }; f() list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #f <- function(...) { .Internal(lapply(X=1:4)) }; f() Error in f() : 1 argument passed to .Internal(lapply) which requires 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply#Ignored.ImplementationError# #f <- function(...) { .Internal(lapply(X=c(function() {print('test1')}, function() {print('test2')}), FUN=function(x){x})) }; f() [[1]] function() {print('test1')} [[2]] function() {print('test2')} ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply#Output.IgnoreErrorContext# #f <- function(...) { .Internal(lapply(X=environment(), FUN=function(x){x})) }; f() Error in environment()[[i]] : wrong arguments for subsetting an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply#Output.IgnoreErrorContext# #f <- function(...) { .Internal(lapply(X=function() {print('test')}, FUN=function(x){x})) }; f() Error in function() { : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #lapply(1:4, NA) Error in match.fun(FUN) : 'NA' is not a function, character or symbol ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #lapply(1:4, NULL) Error in match.fun(FUN) : 'NULL' is not a function, character or symbol ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply#Output.IgnoreErrorMessage# #lapply(FUN=function(x){x}) Error in is.vector(X) : argument "X" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #lapply(NA, FUN=function(x){x}) [[1]] [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #lapply(NULL, function(x){x}) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply#Output.IgnoreErrorContext# #lapply(X=1:4) Error in match.fun(FUN) : argument "FUN" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply#Output.IgnoreWhitespace# #lapply(X=c(function() {print("test1")}, function() {print("test2")}), FUN=function(x){x}) [[1]] function() {print("test1")} [[2]] function() {print("test2")} ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #lapply(X=environment(), FUN=function(x){x}) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #lapply(X=function() {print('test')}, FUN=function(x){x}) [[1]] { print("test") } ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #lapply(list('a'), match.arg, c('a')) [[1]] [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #lapply(list(2), expression)[[1]][[1]] X[[i]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ .Internal(lapply(1:4, 42)) } Error: attempt to apply non-function ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ f <- function() { lapply(c(X="a",Y="b"), function(x) { c(a=x) }) } ; f() } $X a "a" $Y a "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ f <- function(x) 2 * x ; lapply(1:3, f) } [[1]] [1] 2 [[2]] [1] 4 [[3]] [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ f <- function(x, y) x * y ; lapply(1:3, f, 2) } [[1]] [1] 2 [[2]] [1] 4 [[3]] [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ l <- list(list(1),list(2),list(3)); f <- function(a) { lapply(a, function(x) lapply(x, function(y) print(y))) }; f(l)} [1] 1 [1] 2 [1] 3 [[1]] [[1]][[1]] [1] 1 [[2]] [[2]][[1]] [1] 2 [[3]] [[3]][[1]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ lapply(1:3, function(x) { 2*x }) } [[1]] [1] 2 [[2]] [1] 4 [[3]] [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ lapply(1:3, function(x,y) { x*y }, 2) } [[1]] [1] 2 [[2]] [1] 4 [[3]] [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ lapply(1:3, function(x,y,z) { as.character(x*y+z) }, 2,7) } [[1]] [1] "9" [[2]] [1] "11" [[3]] [1] "13" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ lapply(1:3, sum) } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ lapply(1:3, sum, 2) } [[1]] [1] 3 [[2]] [1] 4 [[3]] [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ x <- list(a=1:10, b=1:20) ; lapply(x, sum) } $a [1] 55 $b [1] 210 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{ x<-c(1,3,4);attr(x,"names")<-c("a","b","c");lapply(x, function(x,y) { as.character(x*y) }, 2) } $a [1] "2" $b [1] "6" $c [1] "8" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testLapply# #{res <- lapply(1:3, function(x) { function() x }); res[[1]](); res[[2]](); res[[3]]()} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ (sapply(1:3, function(i) { if (i < 3) { c(xxx=1) } else {c(2)} })) } xxx xxx 1 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ (sapply(1:3, function(i) { if (i < 3) { list(xxx=1) } else {list(zzz=2)} })) } $xxx [1] 1 $xxx [1] 1 $zzz [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ (sapply(1:3, function(i) { list(xxx=1:i) } )) } $xxx [1] 1 $xxx [1] 1 2 $xxx [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f <- function() { sapply(1:3,function(x){x*2L}) }; f() + f() } [1] 4 8 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f <- function() { sapply(c("a","b"), function(x) { c(a=x) }) } ; f() } a.a b.a "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f <- function() { sapply(c(1,2), function(x) { c(a=x) }) } ; f() } a a 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f <- function() { sapply(c(1,2,3),function(x){x*2}) }; f() + f() } [1] 4 8 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f <- function() { sapply(c(X="a",Y="b"), function(x) { c(a=x) }) } ; f() } X.a Y.a "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f <- function() { sapply(c(X=1,Y=2), function(x) { c(a=x) }) } ; f() } X.a Y.a 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f <- function(v) { sapply(1:3, function(k) v)}; f(1); f(2) } [1] 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f<-function() { x<-2 ; sapply(1, function(i) { x }) } ; f() } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f<-function(g) { sapply(1:3, g) } ; f(function(x) { x*2 }) ; f(function(x) { TRUE }) } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f<-function(g) { sapply(1:3, g) } ; f(function(x) { x*2 }) } [1] 2 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ f<-length; sapply(1:3, f) } [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ h <- new.env() ; assign("a",1,h) ; assign("b",2,h) ; sa <- sapply(ls(h), function(k) get(k,h,inherits=FALSE)) ; names(sa) } [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:2, function(i) { if (i==1) { as.raw(0) } else { "hello" }} ) } [1] "00" "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:2, function(i) { if (i==1) { as.raw(0) } else { 5+10i } }) } [1] 0+ 0i 5+10i ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:2, function(i) { if (i==1) { as.raw(0) } else { as.raw(10) } }) } [1] 00 0a ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3, "-", 2) } [1] -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3, `-`, 2) } [1] -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3, function(i) { if (i < 3) { c(1+1i,2) } else { c(11,12) } }) } [,1] [,2] [,3] [1,] 1+1i 1+1i 11+0i [2,] 2+0i 2+0i 12+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3, function(i) { if (i < 3) { list(1,2) } else { c(11,12) } }) } [,1] [,2] [,3] [1,] 1 1 11 [2,] 2 2 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3, function(i) { if (i < 3) { list(xxx=1) } else {list(2)} }) } $xxx [1] 1 $xxx [1] 1 [[3]] [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3, function(i) { list(1,2) }) } [,1] [,2] [,3] [1,] 1 1 1 [2,] 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3, function(x) { if (x==1) { 1 } else if (x==2) { integer() } else { TRUE } }) } [[1]] [1] 1 [[2]] integer(0) [[3]] [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3, function(x) { if (x==1) { list(1) } else if (x==2) { list(NULL) } else { list() } }) } [[1]] [[1]][[1]] [1] 1 [[2]] [[2]][[1]] NULL [[3]] list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3, function(x) { if (x==1) { list(1) } else if (x==2) { list(NULL) } else { list(2) } }) } [[1]] [1] 1 [[2]] NULL [[3]] [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3, length) } [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(1:3,function(x){x*2L}) } [1] 2 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(c("a","b","c"), function(x) { x }) } a b c "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(c(1,2,3),function(x){x*2}) } [1] 2 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testSapply# #{ sapply(list(1,2,3),function(x){x*2}) } [1] 2 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testTapply# #{ ind <- list(c(1, 2, 2), c("A", "A", "B")) ; tapply(1:3, ind) } [1] 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testTapply# #{ ind <- list(c(1, 2, 2), c("A", "A", "B")) ; tapply(1:3, ind, sum) } A B 1 1 NA 2 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lapply.testTapply# #{ n <- 17 ; fac <- factor(rep(1:3, length = n), levels = 1:5) ; tapply(1:n, fac, sum) } 1 2 3 4 5 51 57 45 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #.Internal(lbeta(47, structure(array(21:24, dim=c(2,2)), dimnames=list(a=c('a1','a2'),b=c('b1','b2'))))) b a b1 b2 a1 -42.44874 -44.76679 a2 -43.62373 -45.87979 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #.Internal(lbeta(structure(47, myattr='hello'), 2)) [1] -7.721349 attr(,"myattr") [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #.Internal(lbeta(structure(array(21:24, dim=c(2,2)), dimnames=list(a=c('a1','a2'),b=c('b1','b2'))), 2)) b a b1 b2 a1 -6.135565 -6.313548 a2 -6.226537 -6.396930 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(0:2, 2.2)) } [1] Inf -0.7884574 -1.9516082 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(1, NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(1, NULL)) } Error: non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(2, 2.2)) } [1] -1.951608 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(FALSE, FALSE)) } [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(NA, 1)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(NULL, 1)) } Error: non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(c(2.2, 3.3), 2)) } [1] -1.951608 -2.652537 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(c(2.2, 3.3), c(2,3,4))) } [1] -1.951608 -3.627097 -3.243592 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(c(2.2, 3.3, 4.4), c(2,3))) } [1] -1.951608 -3.627097 -3.168003 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lbeta.testlbeta1# #{ .Internal(lbeta(logical(0), logical(0))) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose1# #argv <- list(FALSE, FALSE); .Internal(lchoose(argv[[1]], argv[[2]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose2# #argv <- list(50L, 0:48); .Internal(lchoose(argv[[1]], argv[[2]])) [1] 0.000000 3.912023 7.110696 9.883285 12.347138 14.566342 16.581245 [8] 18.419524 20.101283 21.641728 23.052715 24.343699 25.522354 26.594991 [15] 27.566851 28.442320 29.225079 29.918226 30.524362 31.045659 31.483914 [22] 31.840589 32.116842 32.313553 32.431336 32.470557 32.431336 32.313553 [29] 32.116842 31.840589 31.483914 31.045659 30.524362 29.918226 29.225079 [36] 28.442320 27.566851 26.594991 25.522354 24.343699 23.052715 21.641728 [43] 20.101283 18.419524 16.581245 14.566342 12.347138 9.883285 7.110696 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose3# #argv <- list(0.5, 1:9); .Internal(lchoose(argv[[1]], argv[[2]])) [1] -0.6931472 -2.0794415 -2.7725887 -3.2425924 -3.5992673 -3.8869494 -4.1281114 [8] -4.3357508 -4.5180723 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #.Internal(lchoose(47, structure(array(21:24, dim=c(2,2)), dimnames=list(a=c('a1','a2'),b=c('b1','b2'))))) b a b1 b2 a1 30.16088 30.41132 a2 30.32794 30.41132 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #.Internal(lchoose(structure(47, myattr='hello'), 2)) [1] 6.985642 attr(,"myattr") [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #.Internal(lchoose(structure(array(21:24, dim=c(2,2)), dimnames=list(a=c('a1','a2'),b=c('b1','b2'))), 2)) b a b1 b2 a1 5.347108 5.533389 a2 5.442418 5.620401 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4#Output.IgnoreWarningMessage# #{ .Internal(lchoose(0:2, 2.2)) } [1] -Inf -Inf 0 Warning messages: 1: 'k' (2.20) must be integer, rounded to 2 2: 'k' (2.20) must be integer, rounded to 2 3: 'k' (2.20) must be integer, rounded to 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #{ .Internal(lchoose(1, NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #{ .Internal(lchoose(1, NULL)) } Error: non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4#Output.IgnoreWarningMessage# #{ .Internal(lchoose(2, 2.2)) } [1] 0 Warning message: 'k' (2.20) must be integer, rounded to 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #{ .Internal(lchoose(NA, 1)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #{ .Internal(lchoose(NULL, 1)) } Error: non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #{ .Internal(lchoose(c(2.2, 3.3), 2)) } [1] 0.2776317 1.3336844 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #{ .Internal(lchoose(c(2.2, 3.3), c(2,3,4))) } [1] 0.2776317 0.4974364 -4.0398564 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #{ .Internal(lchoose(c(2.2, 3.3, 4.4), c(2,3))) } [1] 0.2776317 0.4974364 2.0122328 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lchoose.testlchoose4# #{ .Internal(lchoose(logical(0), logical(0))) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #length(as.symbol('x')) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #length(quote(x)) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ e <- new.env(); setClass('LengthTestClass', representation(a = 'numeric'), where=e); obj <- new('LengthTestClass', a = 1:100); length(obj) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ foo <- function(...) length(get('...')); foo(a=1, b=2, c=3, d=4); } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ length(1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ length(1+1i) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ length(1:3) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ length(1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ length(NA) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ length(NULL) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ length(TRUE) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ length(c(z=1:4)) } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testLength# #{ length(d<-dim(1:3)) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength1# #argv <- list('~ . + Soft+M.user:Temp');length(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength10# #argv <- list(list(structure(c(-1L, -2L, -3L, -4L, -5L, -6L, -7L, -8L, -9L, -10L), .Dim = c(2L, 5L)), structure(list(V1 = 1:5, V2 = 6:10, V3 = 11:15, V4 = 16:20, V5 = 21:25), .Names = c('V1', 'V2', 'V3', 'V4', 'V5'), row.names = c(NA, -5L), class = 'data.frame')));length(argv[[1]]); [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength11# #argv <- list(structure(list(weight = c(4.17, 5.58), group = structure(c(1L, 1L), .Label = c('Ctl', 'Trt'), class = 'factor')), .Names = c('weight', 'group'), row.names = 1:2, class = 'data.frame'));length(argv[[1]]); [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength12# #argv <- list(quote(cbind(X, M) ~ M.user + Temp + M.user:Temp));length(argv[[1]]); [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength13# #argv <- list(structure(c(-Inf, -Inf, 0, 0, 1, 2, Inf, Inf, Inf, -Inf, -Inf, 0, 0.5, 1, 2, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 1, 2, 2, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.8, 1.6, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.3, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.4, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.2, 1.9, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.499999999999999, 1.33333333333333, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.325, Inf, Inf, Inf, Inf), .Dim = c(9L, 9L), .Dimnames = list(c('20%', '30%', '40%', '50%', '60%', '70%', '80%', '90%', '100%'), NULL)));length(argv[[1]]); [1] 81 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength14# #argv <- list(structure(list(character = character(0), numeric = numeric(0), numeric = numeric(0), complex = complex(0), integer = integer(0), logical = logical(0), character = character(0)), .Names = c('character', 'numeric', 'numeric', 'complex', 'integer', 'logical', 'character')));length(argv[[1]]); [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength15# #argv <- list(structure(list(loc = c(0.0804034870161223, 10.3548347412639), cov = structure(c(3.01119301965569, 6.14320559215603, 6.14320559215603, 14.7924762275451), .Dim = c(2L, 2L)), d2 = 2, wt = c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0), sqdist = c(0.439364946869246, 0.0143172566761092, 0.783644692619938, 0.766252947443554, 0.346865912102713, 1.41583192825661, 0.168485512965902, 0.354299830956879, 0.0943280426627965, 1.05001058449122, 1.02875556201707, 0.229332323173361, 0.873263925064789, 2.00000009960498, 0.449304354954282, 0.155023307933165, 0.118273979375253, 0.361693898800799, 0.21462398586105, 0.155558909016629, 0.471723661454506, 0.719528696331092, 0.0738164380664225, 1.46001193111051, 0.140785322548143, 0.127761195166703, 0.048012401156175, 0.811750426884519, 0.425827709817574, 0.163016638545231, 0.557810866640707, 0.277350147637843, 0.0781399119055092, 1.29559183995835, 0.718376405567138, 1.37650242941478, 0.175087780508154, 0.233808973148729, 0.693473805463067, 0.189096604125073, 1.96893781800017, 0.4759756980592, 1.69665760380474, 0.277965749373647, 0.920525436884815, 0.57525234053591, 1.59389578665009, 0.175715364671313, 0.972045794851437, 1.75514684962809, 0.0597413185507202, 0.174340343040626, 0.143421553552865, 0.997322770596838, 1.94096736957465, 2.00000001159796, 0.367000821772989, 0.682474530588235, 1.20976163307984, 1.27031685239035, 1.79775635513363, 0.0857761902860323, 0.435578932929501, 0.214370604878221, 0.494714247412686, 1.78784623754399, 1.24216674083069, 1.87749485326709, 0.0533296334123023, 1.45588362584438, 2.00000000631459, 0.208857144738039, 0.119251291573058, 0.365303924649962, 0.690656674239668, 0.0396958405786268, 0.258262120876164, 1.57360254057537, 0.307548421049514, 0.628417063100241, 1.00647098749202, 0.297624360530352, 0.400289147351669, 1.98298426250944, 0.129127182829694, 0.0794695319493149, 0.991481735944321, 0.444068154119836, 0.206790162395106, 0.574310829851377, 0.181887577583334, 0.433872021297517, 0.802994892604009, 0.293053770941001, 1.7002969001965, 0.77984639982848, 1.36127407487932, 0.761935213110323, 0.597915313430067, 0.237134831067472), prob = NULL, tol = 1e-07, eps = 9.96049758228423e-08, it = 898L, maxit = 5000, ierr = 0L, conv = TRUE), .Names = c('loc', 'cov', 'd2', 'wt', 'sqdist', 'prob', 'tol', 'eps', 'it', 'maxit', 'ierr', 'conv'), class = 'ellipsoid'));length(argv[[1]]); [1] 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength16# #argv <- list(c(-167.089651989438, -122.420302709026));length(argv[[1]]); [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength17# #argv <- list(structure(list(srcfile = c('/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils'), frow = c(1809L, 1810L, 1811L, 1812L, 1802L, 1827L, 1840L), lrow = c(1809L, 1814L, 1811L, 1813L, 1816L, 1834L, 1842L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 7L)));length(argv[[1]]); [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength18# #argv <- list(structure(list(object = structure(3.14159265358979, comment = 'Start with pi'), slots = 'comment', dataPart = TRUE), .Names = c('object', 'slots', 'dataPart')));length(argv[[1]]); [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength19# #argv <- list(structure(list(name = structure(c('McNeil', 'Ripley', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'AsIs'), title = structure(c(3L, 6L, 7L, 4L, 2L, 5L), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA, NA, NA, NA, NA, 1L), .Label = c('Ripley', 'Venables & Smith'), class = 'factor'), nationality = structure(c(1L, 2L, 2L, 3L, 3L, 1L), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(1L, 1L, 1L, 1L, 2L, 1L), .Label = c('no', 'yes'), class = 'factor')), .Names = c('name', 'title', 'other.author', 'nationality', 'deceased'), row.names = c(6L, 4L, 5L, 3L, 1L, 2L), class = 'data.frame'));length(argv[[1]]); [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength2# #argv <- list(structure(list(A = c(1L, NA, 1L), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA, NA, NA), E = c(FALSE, NA, TRUE), F = structure(c(1L, NA, 2L), .Label = c('abc', 'def'), class = 'factor')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')));length(argv[[1]]); [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength20# #argv <- list(c(' These operators return vectors containing the result of the element', ' by element operations. The elements of shorter vectors are recycled', ' as necessary (with a ‘warning’ when they are recycled only', ' _fractionally_). The operators are ‘+’ for addition,', ' ‘-’ for subtraction, ‘*’ for multiplication, ‘/’ for', ' division and ‘^’ for exponentiation.', '', ' ‘%%’ indicates ‘x mod y’ and ‘%/%’ indicates', ' integer division. It is guaranteed that '));length(argv[[1]]); [1] 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength21# #argv <- list(structure(c(3.14475800140539, 3.11465478132706, 3.10630529271564, 3.0844667956717, 3.10602734436792, 3.1179780987041, 3.10510218928681, 3.13870964347838, 3.1236627058491, 3.16426296817658, 3.18524449375727, 3.19607967740367, 3.12404668400251, 3.1073799072767, 3.10252776401906, 3.0888846453793, 3.10244112014795, 3.1099501880355, 3.10186319790916, 3.12297248377609, 3.11352136079872, 3.13902281247452, 3.1522015282299, 3.15900722027104), .Tsp = c(1983, 1984.91666666667, 12), class = 'ts'));length(argv[[1]]); [1] 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength22# #argv <- list(c(3.14159265358979e-10, 0.0314159265358979, 3.14159265358979, 31.4159265358979, 314.159265358979, 314159265.358979, 3.14159265358979e+20));length(argv[[1]]); [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength23# #argv <- list(structure(list(names = character(0), row.names = integer(0), class = 'data.frame'), .Names = c('names', 'row.names', 'class')));length(argv[[1]]); [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength24# #argv <- list(structure(list(a = 1), .Dim = 1L, .Dimnames = list('a')));length(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength25# #argv <- list(c(0+0i, -0.740437474899139-0.482946826369552i, -0.333166449062945-0.753763230370951i, 0+0i, 0.522033838837248+0.102958580568997i, 0+0i, 0+0i, 0+0i, -0.563222209454641-0.518013590538404i, -0.068796124369349+0.97981641556181i, 0.244428915757284-0.330850507052219i, 0+0i, 0+0i, 0+0i, -0.451685375030484+0.126357395265016i, 0.375304016677864+0.436900190874168i, -0.674059300339186+0.084416799015191i, 0+0i, 0.509114684244823-0.086484623694157i, -0.535642839219739+0.289927561259502i, 0.629727249341749+0.707648659913726i, 0+0i, -0.333800277698424-0.317646103980588i, -0.422186107911717+0.317002735170286i, -0.616692335171505+0.068946145379939i, -0.136100485502624-0.487679764177213i, -0.68086000613138+0.047032323152903i, 0.296209908189768+0.585533462557103i, 0.43280012844045+0.136998748692477i, -0.680205941942733-0.256569497284745i, 0+0i, 0+0i, 0+0i, -0.983769553611346-0.088288289740869i, -0.046488672133508-0.622109071207677i, 0+0i, 0.379095891586975-0.727769566649926i, 0+0i, 0+0i, -0.150428076228347+0.615598727377677i, 0.762964492726935+0.377685645913312i, -0.7825325866026+0.365371705974346i, -0.792443423040311-0.029652870362208i, 0.265771060547393-0.106618612674382i, -0.076741350022367-0.422144111460857i, 0.120061986786934-0.623033085890884i, 0+0i, -0.145741981978782+0.529165019069452i, 0+0i, 0+0i, 0+0i, 0+0i, 0+0i, 0.328611964770906+0.215416587846774i, -0.583053183540166-0.668235480667835i, -0.782507286391418+0.318827979750013i, 0+0i, 0+0i, 0+0i, 0+0i, -0.271871452223431+0.426340387811162i, 0.590808184713385-0.344468770084509i, 0+0i, 0+0i, 0+0i, 0+0i, 0.866602113481861-0.172567291859327i, 0.031389337713892-0.607820631329035i, 0+0i, 0+0i, 0.151969488085021-0.827990593142535i, -0.266853748421854-0.866413193943766i, 0.071623062591495-0.867246686843546i, -0.788765741891382+0.508717463380604i, -0.228835546857432-0.349587041980114i, 0.500139791176978-0.016703152458872i, 0.15619107374708-0.485402548890295i, -0.369039310626083+0.398423724273751i, 0+0i, -0.399467692630093-0.421179989556223i, 0.411274074028001+0.133781691724871i, 0.573364366690245+0.328833257005489i, 0+0i, 0.387209171815106+0.750271083217101i, 0+0i, 0+0i, -0.168543113030619+0.43048451175239i, 0+0i, 0.388005062566602-0.290649953587954i, -0.013004326537709-0.490434895455784i, 0.069845221019376-0.762134635168809i, 0+0i, 0.27384734040072+0.383667165938905i, 0+0i, -0.894951082455532+0.317442909372288i, 0.5073401683933-0.213001485168032i, 0+0i, -0.343169835663372+0.597359384628839i, -0.283179001991236-0.385834501657171i, -0.517794900198098-0.36732932802092i));length(argv[[1]]); [1] 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength26# #argv <- list(structure(list(sec = numeric(0), min = integer(0), hour = integer(0), mday = integer(0), mon = integer(0), year = integer(0), wday = integer(0), yday = integer(0), isdst = integer(0)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')));length(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength27# #argv <- list(c(FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE));length(argv[[1]]); [1] 23 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength28# #argv <- list(structure(list(A = c(1, NA, 1), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA_integer_, NA_integer_, NA_integer_), E = c(FALSE, NA, TRUE), F = c('abc', NA, 'def')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')));length(argv[[1]]); [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength29# #argv <- list(list(structure(list(srcfile = c('/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R'), frow = 122:123, lrow = 122:123), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2, class = 'data.frame'), structure(list(srcfile = '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/rlm.R', frow = 124L, lrow = 124L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L), class = 'data.frame')));length(argv[[1]]); [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength3# #argv <- list(structure(' \'Le français, cest façile: Règles, Liberté, Egalité, Fraternité...\')\n', Rd_tag = 'RCODE'));length(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength30# #argv <- list(structure(list(Df = c(NA, 1, 1, 1), `Sum of Sq` = c(NA, 820.907401534698, 26.7893827563485, 9.93175377572661), RSS = c(47.9727294003871, 868.880130935086, 74.7621121567356, 57.9044831761137), AIC = c(24.9738836085411, 60.6293256496563, 28.7417044039189, 25.4199908988691)), .Names = c('Df', 'Sum of Sq', 'RSS', 'AIC'), row.names = c('', '- x1', '- x2', '- x4'), class = c('anova', 'data.frame')));length(argv[[1]]); [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength31# #argv <- list(list(structure(c(30.3398431424662, 53.0273088677942, 11.6721423374092, 3.1219098789343, 9.58888402166762, 41.0027598267751, 8.26816396385794, 46.7997906867199, 7.96616780447507, 27.2952699050281, 7.05399789883986, 5.03904688224502, 2.61409832611023, 14.9537930856989, 7.22312484916424, 8.25480759597494, 37.7467076615774, 65.972863357068, 14.5216619125438, 3.88406159493231, 10.6419076139158, 45.5055646732323, 9.17614988785547, 51.9392087455927, 7.84624470450625, 26.8843655076016, 6.94780665155944, 4.96318881123281, 2.45558360989303, 14.0470191347445, 6.78512618085463, 7.75424934595279), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32')), 2.22044604925031e-16));length(argv[[1]]); [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength32# #argv <- list(structure(c(78796800, 94694400, 126230400, 157766400, 189302400, 220924800, 252460800, 283996800, 315532800, 362793600, 394329600, 425865600, 489024000, 567993600, 631152000, 662688000, 709948800, 741484800, 773020800, 820454400, 867715200, 915148800, 1136073600, 1230768000, 1341100800), class = c('POSIXct', 'POSIXt')));length(argv[[1]]); [1] 25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength33# #argv <- list(c(1.03711990677284e+29, 4.58346574364236e+27, 2.02562481791768e+26, 8.95208153058638e+24, 3.95629847255715e+23, 1.7484534240517e+22, 7.7271454561408e+20, 34149480972585590784, 1509208102926327040, 66698206089453432, 2947672264272576, 130269967045726, 5757178273805.44, 254434569303.796, 11244672651.0134, 496975017.177538, 21967997.2327598, 971670.715389718, 43086.3667907314, 1929.95757399166, 90.0797181275922, 5.03402841668789, 0.625146618950265, -0.304867530220417, -0.123332207492738, 0.0884498083502638, 0.0243523396488189, -0.0527015109337102, -3.68088311960635e-05, -0.0351989174304481, 0.024656114194774));length(argv[[1]]); [1] 31 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength34# #argv <- list(structure(c('1.0', NA, NA, 'methods, graphics, pkgA', NA, NA, NA, 'GPL (>= 2)', NA, NA, NA, NA, NA, NA, 'R 3.0.1; ; 2014-03-17 18:49:56 UTC; unix'), .Names = c('Version', NA, NA, 'Imports', NA, NA, NA, 'License', NA, NA, NA, NA, NA, NA, 'Built')));length(argv[[1]]); [1] 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength35# #argv <- list(structure(c(-1, 0, 1, 2, 3), .Tsp = c(-1, 3, 1)));length(argv[[1]]); [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength37# #argv <- list(function(file = ifelse(onefile, 'Rplots.pdf', 'Rplot%03d.pdf'), width, height, onefile, family, title, fonts, version, paper, encoding, bg, fg, pointsize, pagecentre, colormodel, useDingbats, useKerning, fillOddEven, compress) { invisible()}); do.call('length', argv) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength4# #argv <- list(structure(list(a = 6:10), .Names = 'a', row.names = 6:10, class = 'data.frame'));length(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength5# #argv <- list(structure(list(`log(x)` = c(0, 0.693147180559945, 1.09861228866811, 1.38629436111989, 1.6094379124341, 1.79175946922805, 1.94591014905531, 2.07944154167984, 2.19722457733622, 2.30258509299405, 2.39789527279837, 2.484906649788, 2.56494935746154, 2.63905732961526, 2.70805020110221, 2.77258872223978, 2.83321334405622, 2.89037175789616, 2.94443897916644, 2.99573227355399, 3.04452243772342, 3.09104245335832, 3.13549421592915, 3.17805383034795, 3.2188758248682, 3.25809653802148, 3.29583686600433, 3.3322045101752, 3.36729582998647, 3.40119738166216, 3.43398720448515, 3.46573590279973, 3.49650756146648, 3.52636052461616, 3.55534806148941, 3.58351893845611, 3.61091791264422, 3.63758615972639, 3.66356164612965, 3.68887945411394, 3.71357206670431, 3.73766961828337, 3.76120011569356, 3.78418963391826, 3.80666248977032, 3.8286413964891, 3.85014760171006, 3.87120101090789, 3.89182029811063, 3.91202300542815, 3.93182563272433, 3.95124371858143, 3.97029191355212, 3.98898404656427, 4.00733318523247, 4.02535169073515, 4.04305126783455, 4.06044301054642, 4.07753744390572, 4.0943445622221, 4.11087386417331, 4.12713438504509, 4.14313472639153, 4.15888308335967, 4.17438726989564, 4.18965474202643, 4.20469261939097, 4.21950770517611, 4.23410650459726, 4.24849524204936, 4.26267987704132, 4.27666611901606, 4.29045944114839, 4.30406509320417, 4.31748811353631, 4.33073334028633, 4.34380542185368, 4.35670882668959, 4.36944785246702, 4.38202663467388, 4.39444915467244, 4.40671924726425, 4.4188406077966, 4.43081679884331, 4.44265125649032, 4.45434729625351, 4.46590811865458, 4.47733681447821, 4.48863636973214, 4.49980967033027, 4.51085950651685, 4.52178857704904, 4.53259949315326, 4.54329478227, 4.55387689160054, 4.56434819146784, 4.57471097850338, 4.58496747867057, 4.59511985013459, 4.60517018598809), `log(z)` = c(2.39789527279837, 2.484906649788, 2.56494935746154, 2.63905732961526, 2.70805020110221, 2.77258872223978, 2.83321334405622, 2.89037175789616, 2.94443897916644, 2.99573227355399, 3.04452243772342, 3.09104245335832, 3.13549421592915, 3.17805383034795, 3.2188758248682, 3.25809653802148, 3.29583686600433, 3.3322045101752, 3.36729582998647, 3.40119738166216, 3.43398720448515, 3.46573590279973, 3.49650756146648, 3.52636052461616, 3.55534806148941, 3.58351893845611, 3.61091791264422, 3.63758615972639, 3.66356164612965, 3.68887945411394, 3.71357206670431, 3.73766961828337, 3.76120011569356, 3.78418963391826, 3.80666248977032, 3.8286413964891, 3.85014760171006, 3.87120101090789, 3.89182029811063, 3.91202300542815, 3.93182563272433, 3.95124371858143, 3.97029191355212, 3.98898404656427, 4.00733318523247, 4.02535169073515, 4.04305126783455, 4.06044301054642, 4.07753744390572, 4.0943445622221, 4.11087386417331, 4.12713438504509, 4.14313472639153, 4.15888308335967, 4.17438726989564, 4.18965474202643, 4.20469261939097, 4.21950770517611, 4.23410650459726, 4.24849524204936, 4.26267987704132, 4.27666611901606, 4.29045944114839, 4.30406509320417, 4.31748811353631, 4.33073334028633, 4.34380542185368, 4.35670882668959, 4.36944785246702, 4.38202663467388, 4.39444915467244, 4.40671924726425, 4.4188406077966, 4.43081679884331, 4.44265125649032, 4.45434729625351, 4.46590811865458, 4.47733681447821, 4.48863636973214, 4.49980967033027, 4.51085950651685, 4.52178857704904, 4.53259949315326, 4.54329478227, 4.55387689160054, 4.56434819146784, 4.57471097850338, 4.58496747867057, 4.59511985013459, 4.60517018598809, 4.61512051684126, 4.62497281328427, 4.63472898822964, 4.64439089914137, 4.65396035015752, 4.66343909411207, 4.67282883446191, 4.68213122712422, 4.69134788222914, 4.70048036579242)), .Names = c('log(x)', 'log(z)'), class = 'data.frame', row.names = c(NA, 100L), terms = quote(~log(x) + log(z))));length(argv[[1]]); [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength6# #argv <- list(list('Residuals vs Fitted', 'Normal Q-Q', 'Scale-Location', 'Cooks distance', 'Residuals vs Leverage', expression('Cooks dist vs Leverage ' * h[ii]/(1 - h[ii]))));length(argv[[1]]); [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength7# #argv <- list(structure(list(sec = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), min = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), hour = c(20L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 20L, 20L, 20L, 20L, 19L, 19L, 19L, 20L, 20L, 20L, 19L, 20L, 19L, 19L, 19L, 20L), mday = c(30L, 31L, 31L, 31L, 31L, 31L, 31L, 31L, 31L, 30L, 30L, 30L, 30L, 31L, 31L, 31L, 30L, 30L, 30L, 31L, 30L, 31L, 31L, 31L, 30L), mon = c(5L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 5L, 5L, 5L, 5L, 11L, 11L, 11L, 5L, 5L, 5L, 11L, 5L, 11L, 11L, 11L, 5L), year = c(72L, 72L, 73L, 74L, 75L, 76L, 77L, 78L, 79L, 81L, 82L, 83L, 85L, 87L, 89L, 90L, 92L, 93L, 94L, 95L, 97L, 98L, 105L, 108L, 112L), wday = c(5L, 0L, 1L, 2L, 3L, 5L, 6L, 0L, 1L, 2L, 3L, 4L, 0L, 4L, 0L, 1L, 2L, 3L, 4L, 0L, 1L, 4L, 6L, 3L, 6L), yday = c(181L, 365L, 364L, 364L, 364L, 365L, 364L, 364L, 364L, 180L, 180L, 180L, 180L, 364L, 364L, 364L, 181L, 180L, 180L, 364L, 180L, 364L, 364L, 365L, 181L), isdst = c(1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 1L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')));length(argv[[1]]); [1] 25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength8# #argv <- list(complex(0));length(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_length.testlength9# #argv <- list(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE));length(argv[[1]]); [1] 260 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testArgsCasts# #{ x<-c(42, 1); length(x)<-'3'; x } [1] 42 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testArgsCasts# #{ x<-c(42, 1); length(x)<-3.1; x } [1] 42 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testArgsCasts# #{ x<-c(42, 1); length(x)<-c(1,2) } Error in length(x) <- c(1, 2) : wrong length for 'value' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testArgsCasts# #{ x<-quote(a); length(x)<-2 } Error in length(x) <- 2 : cannot set length of non-(vector or list) ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x <- 1 ; f <- function() { length(x) <<- 2 } ; f() ; x } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x <- 1:2 ; length(x) <- 4 ; x } [1] 1 2 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x <- 1:2 ; z <- (length(x) <- 4) ; z } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x <- 1:4 ; length(x) <- 2 ; x } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-NULL; length(x)<-0; x } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-NULL; length(x)<-2; x } NULL Warning message: In length(x) <- 2 : length of NULL cannot be changed ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-c(a=1, b=2); length(x)<-1; x } a 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-c(a=1, b=2); length(x)<-4; x } a b 1 2 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-c(a=7, b=42); length(x)<-1; x } a 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-c(a=7, b=42); length(x)<-4; x } a b 7 42 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-data.frame(a=1,b=2); length(x)<-1; attributes(x) } $names [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-data.frame(a=1,b=2); length(x)<-4; attributes(x) } $names [1] "a" "b" "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-data.frame(a=c(1,2), b=c(3,4)); length(x)<-1; x } $a [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-data.frame(a=c(1,2), b=c(3,4)); length(x)<-4; x } $a [1] 1 2 $b [1] 3 4 [[3]] NULL [[4]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-factor(c("a", "b", "a")); length(x)<-1; x } [1] a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{ x<-factor(c("a", "b", "a")); length(x)<-4; x } [1] a b a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{a <- structure(c(3,4), names=c('a','b'),package=c('methods')); b <- a; length(b) <- 1; list(a=a,b=b)} $a a b 3 4 attr(,"package") [1] "methods" $b a 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testLengthUpdate# #{a <- structure(c(3,4), names=c('a','b'),package=c('methods')); length(a) <- 2; a} a b 3 4 attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testlengthassign1# #argv <- list(c('A', 'B'), value = 5);`length<-`(argv[[1]],argv[[2]]); [1] "A" "B" NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testlengthassign2# #argv <- list(list(list(2, 2, 6), list(2, 2, 0)), value = 0);`length<-`(argv[[1]],argv[[2]]); list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testlengthassign3# #argv <- list(list(list(2, 2, 6), list(1, 3, 9), list(1, 3, -1)), value = 1);`length<-`(argv[[1]],argv[[2]]); [[1]] [[1]][[1]] [1] 2 [[1]][[2]] [1] 2 [[1]][[3]] [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testlengthassign4# #argv <- list(c(28, 27, 26, 25, 24, 23, 22, 21, 20, 19, 18, 17, 16, 15, 14, 13, 12, 11, 10, 9, 8, 7, 6, 5, 4, 3, 2, 1), value = 0L);`length<-`(argv[[1]],argv[[2]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testlengthassign5# #argv <- list(c(0L, 1L, 2L, 3L, 4L, 5L, 6L, 0L, 1L, 2L, 3L, 4L, 5L, 6L, 0L, 1L, 2L, 3L, 4L, 5L, 6L, 0L, 1L, 2L, 3L, 4L, 5L, 6L), value = 0L);`length<-`(argv[[1]],argv[[2]]); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testlengthassign6# #argv <- list(list(), value = 0L);`length<-`(argv[[1]],argv[[2]]); list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengthassign.testlengthassign6#Output.IgnoreErrorContext# #argv <- structure(list(1:3, value = TRUE), .Names = c('', 'value'));do.call('length<-', argv) Error in do.call("length<-", argv) : invalid value ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.basics# #lengths(1:11) [1] 1 1 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.basics# #lengths(NULL) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.basics# #lengths(c(1,2,3)) [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.basics# #lengths(list(1, c(1,2), 1:3)) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.basics# #lengths(list(1, list(1, c(1,2)), 1:3)) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.withNames# #lengths(list(a=1, b=c(1,2))) a b 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.withNames# #lengths(list(a=1, b=c(1,2)), use.names=FALSE) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.withNames# #lengths(matrix(1:4, nrow=2, ncol=2, dimnames=list(c('a', 'b'), c('d', 'e')))) d e a 1 1 b 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.withNames# #x<-c(1,2); names(x) <- c('a', 'b'); lengths(x) a b 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.withNames# #x<-c(1,2); names(x) <- c('a', 'b'); lengths(x, use.names=FALSE) [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.wrongArgs# #lengths(42, use.names='as') Error in lengths(42, use.names = "as") : invalid 'use.names' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_lengths.wrongArgs# #lengths(quote(a)) Error in lengths(quote(a)) : 'x' must be a list or atomic vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- 1 ; levels(x)<-"a"; levels(x);} [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- 1 ; levels(x)<-1; levels(x);} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- 1 ; levels(x)<-4.5; levels(x);} [1] 4.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels#Output.MayIgnoreErrorContext# #{ x <- 1 ; levels(x)<-NULL; levels(notx)} Error in levels(notx) : object 'notx' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- 1 ; levels(x)<-NULL; levels(x)} NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- 1 ; levels(x)<-c("cat", "dog"); levels(x)} [1] "cat" "dog" ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- 1 ; levels(x)<-c(1); levels(x);} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- 1 ; levels(x)<-c(1, "cat", 4.5, "3"); levels(x);} [1] "1" "cat" "4.5" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- 1 ; levels(x)<-c(3, "cat"); levels(x);} [1] "3" "cat" ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- 5 ; levels(x)<-"catdog"; levels(x);} [1] "catdog" ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- 5 ; levels(x)<-c(1,2,3); levels(x);} [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testLevels# #{ x <- NULL; levels(x)<-"dog"; levels(x)} Error in levels(x) <- "dog" : attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_levels.testlevels1# #argv <- structure(list(x = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('1', '2'), class = 'factor')), .Names = 'x');do.call('levels', argv) [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_levelsassign.testlevelsassign1# #argv <- list(structure(1:2, .Label = c('a', 'b'), class = 'factor'), value = structure(list(C = 'C', A = 'a', B = 'b'), .Names = c('C', 'A', 'B')));`levels<-`(argv[[1]],argv[[2]]); [1] A B Levels: C A B ##com.oracle.truffle.r.test.builtins.TestBuiltin_levelsassign.testlevelsassign2# #argv <- list(structure(c(24L, 13L, 15L, 68L, 39L, 74L, 22L, 1L, 8L, 55L, 24L, 20L, 51L, 13L, 3L, 4L, 5L, 6L, 15L, 2L, 8L, 60L, 67L, 23L, 58L, 24L, 22L, 21L, 37L, 74L, 59L, 39L, 14L, 14L, 19L, 23L, 70L, 21L, 22L, 31L, 29L, 30L, 45L, 58L, 17L, 7L, 19L, 26L, 39L, 74L, 57L, 59L, 12L, 72L, 70L, 37L, 64L, 16L, 18L, 21L, 22L, 8L, 62L, 61L, 63L, 71L, 105L, 64L, 10L, 41L, 8L, 27L, 11L, 34L, 32L, 33L, 68L, 107L, NA, 66L, NA, 65L, 48L, 52L, 43L, 47L, 46L, 44L, 41L, 54L, 28L, 50L, 40L, NA, 69L, NA, 75L, 109L, NA, 86L, 112L, 110L, 104L, 24L, 111L, 87L, NA, NA, 92L, 73L, 85L, 90L, 89L, NA, 83L, NA, 102L, NA, 108L, 88L, 91L, 93L, NA, 94L, 84L, NA, 106L, NA, 95L, 82L, 56L, 87L, 109L, 75L, 104L, 110L, 112L, 111L, 24L, 73L, 85L, 86L, 90L, 89L, 102L, 88L, 92L, 9L, 49L, 42L, 38L, 35L, 36L, 25L, NA, NA, 9L, 49L, 42L, NA, 36L, 38L, 25L, 53L, 79L, 78L, 103L, 77L, 80L, 114L, 97L, 113L, 76L, 96L, 81L, 116L, 99L, 117L, 115L, 98L, 101L, 100L), .Label = c('1008', '1011', '1013', '1014', '1015', '1016', '1027', '1028', '1030', '1032', '1051', '1052', '1083', '1093', '1095', '1096', '110', '1102', '111', '1117', '112', '113', '116', '117', '1219', '125', '1250', '1251', '126', '127', '128', '1291', '1292', '1293', '1298', '1299', '130', '1308', '135', '1376', '1377', '1383', '1408', '1409', '141', '1410', '1411', '1413', '1418', '1422', '1438', '1445', '1456', '1492', '2001', '2316', '262', '266', '269', '270', '2708', '2714', '2715', '272', '2728', '2734', '280', '283', '286', '290', '3501', '411', '412', '475', '5028', '5042', '5043', '5044', '5045', '5047', '5049', '5050', '5051', '5052', '5053', '5054', '5055', '5056', '5057', '5058', '5059', '5060', '5061', '5062', '5066', '5067', '5068', '5069', '5070', '5072', '5073', '5115', '5160', '5165', '655', '724', '885', '931', '942', '952', '955', '958', 'c118', 'c168', 'c203', 'c204', 'c266'), class = 'factor'), value = c('1008', '1011', '1013', '1014', '1015', '1016', '1027', '1028', '1030', '1032', '1051', '1052', '1083', '1093', '1095', '1096', '110', '1102', '111', '1117', '112', '113', '116', 'abcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyz', '1219', '125', '1250', '1251', '126', '127', '128', '1291', '1292', '1293', '1298', '1299', '130', '1308', '135', '1376', '1377', '1383', '1408', '1409', '141', '1410', '1411', '1413', '1418', '1422', '1438', '1445', '1456', '1492', '2001', '2316', '262', '266', '269', '270', '2708', '2714', '2715', '272', '2728', '2734', '280', '283', '286', '290', '3501', '411', '412', '475', '5028', '5042', '5043', '5044', '5045', '5047', '5049', '5050', '5051', '5052', '5053', '5054', '5055', '5056', '5057', '5058', '5059', '5060', '5061', '5062', '5066', '5067', '5068', '5069', '5070', '5072', '5073', '5115', '5160', '5165', '655', '724', '885', '931', '942', '952', '955', '958', 'c118', 'c168', 'c203', 'c204', 'c266'));`levels<-`(argv[[1]],argv[[2]]); [1] abcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyz [2] 1083 [3] 1095 [4] 283 [5] 135 [6] 475 [7] 113 [8] 1008 [9] 1028 [10] 2001 [11] abcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyz [12] 1117 [13] 1438 [14] 1083 [15] 1013 [16] 1014 [17] 1015 [18] 1016 [19] 1095 [20] 1011 [21] 1028 [22] 270 [23] 280 [24] 116 [25] 266 [26] abcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyz [27] 113 [28] 112 [29] 130 [30] 475 [31] 269 [32] 135 [33] 1093 [34] 1093 [35] 111 [36] 116 [37] 290 [38] 112 [39] 113 [40] 128 [41] 126 [42] 127 [43] 141 [44] 266 [45] 110 [46] 1027 [47] 111 [48] 125 [49] 135 [50] 475 [51] 262 [52] 269 [53] 1052 [54] 411 [55] 290 [56] 130 [57] 272 [58] 1096 [59] 1102 [60] 112 [61] 113 [62] 1028 [63] 2714 [64] 2708 [65] 2715 [66] 3501 [67] 655 [68] 272 [69] 1032 [70] 1377 [71] 1028 [72] 1250 [73] 1051 [74] 1293 [75] 1291 [76] 1292 [77] 283 [78] 885 [79] [80] 2734 [81] [82] 2728 [83] 1413 [84] 1445 [85] 1408 [86] 1411 [87] 1410 [88] 1409 [89] 1377 [90] 1492 [91] 1251 [92] 1422 [93] 1376 [94] [95] 286 [96] [97] 5028 [98] 942 [99] [100] 5054 [101] 958 [102] 952 [103] 5165 [104] abcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyz [105] 955 [106] 5055 [107] [108] [109] 5060 [110] 412 [111] 5053 [112] 5058 [113] 5057 [114] [115] 5051 [116] [117] 5115 [118] [119] 931 [120] 5056 [121] 5059 [122] 5061 [123] [124] 5062 [125] 5052 [126] [127] 724 [128] [129] 5066 [130] 5050 [131] 2316 [132] 5055 [133] 942 [134] 5028 [135] 5165 [136] 952 [137] 958 [138] 955 [139] abcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyz [140] 412 [141] 5053 [142] 5054 [143] 5058 [144] 5057 [145] 5115 [146] 5056 [147] 5060 [148] 1030 [149] 1418 [150] 1383 [151] 1308 [152] 1298 [153] 1299 [154] 1219 [155] [156] [157] 1030 [158] 1418 [159] 1383 [160] [161] 1299 [162] 1308 [163] 1219 [164] 1456 [165] 5045 [166] 5044 [167] 5160 [168] 5043 [169] 5047 [170] c168 [171] 5068 [172] c118 [173] 5042 [174] 5067 [175] 5049 [176] c204 [177] 5070 [178] c266 [179] c203 [180] 5069 [181] 5073 [182] 5072 117 Levels: 1008 1011 1013 1014 1015 1016 1027 1028 1030 1032 1051 1052 ... c266 ##com.oracle.truffle.r.test.builtins.TestBuiltin_levelsassign.testlevelsassign4# #argv <- list(structure(c(1L, 1L, 2L, 2L, 3L, 3L, 1L, 1L, 2L, 2L, 3L, 3L), .Label = c('1', '2', '3'), class = 'factor'), value = structure(list(A = c(1, 3), B = 2), .Names = c('A', 'B')));`levels<-`(argv[[1]],argv[[2]]); [1] A A B B A A A A B B A A Levels: A B ##com.oracle.truffle.r.test.builtins.TestBuiltin_levelsassign.testlevelsassign5# #argv <- list(structure(FALSE, .Label = FALSE), FALSE);`levels<-`(argv[[1]],argv[[2]]); [1] FALSE attr(,"levels") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_levelsassign.testlevelsassign6# #argv <- list(NULL, NULL);`levels<-`(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_levelsassign.testlevelsassign7# #argv <- list(structure(list(), .Label = list()), list());`levels<-`(argv[[1]],argv[[2]]); list() attr(,"levels") list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_levelsassign_.testlevelsassign_1# #argv <- structure(list(structure(c(4L, 4L, 3L, 6L, 5L, 4L, 4L, 5L, 4L, 4L, 2L, 1L, 3L, 2L, 2L, 3L, 4L, 3L, 2L, 2L, 2L, 4L, 3L, 2L, 6L, 3L, 6L, 2L, 3L, 5L, 2L, 6L, 4L, 2L, 1L, 6L, 6L, 4L, 5L, 3L, 5L, 5L, 6L, 2L, 4L, 3L, 4L, 5L, 4L, 4L, 2L, 6L, 1L, 3L, 5L, 4L, 5L, 2L, 5L, 1L, 6L, 5L, 3L, 6L, 3L, 6L, 3L, 6L, 4L, 6L, 1L, 3L, 2L, 5L, 3L, 3L, 2L, 4L, 3L, 4L, 2L, 1L, 4L, 5L, 3L, 6L, 3L, 6L, 6L, 6L, 4L, 4L, 6L, 4L, 2L, 2L, 3L, 3L, 3L, 5L, 3L, 1L, 5L, 6L, 6L, 6L, 2L, 3L, 3L, 5L, 4L, 2L, 2L, 5L, 2L, 3L, 1L, 3L, 3L, 6L, 1L, 6L, 5L, 4L, 3L, 1L, 1L, 1L, 3L, 5L, 4L, 4L, 1L, 1L, 6L, 2L, 6L, 6L, 1L, 5L, 6L, 6L, 2L, 4L, 6L, 6L, 4L, 4L, 5L, 4L, 4L, 1L, 3L, 1L, 2L, 6L, 6L, 1L, 2L, 6L, 3L, 5L, 4L, 6L, 5L, 3L, 4L, 2L, 5L, 2L, 3L, 2L, 1L, 5L, 1L, 1L, 6L, 6L, 1L, 4L, 2L, 3L, 4L, 3L, 3L, 5L, 3L, 6L, 4L, 3L, 5L, 3L, 5L, 5L, 4L, 2L, 2L, 4L, 1L, 6L, 5L, 6L, 3L, 5L, 1L, 2L, 1L, 3L, 5L, 1L, 4L, 1L, 2L, 4L, 5L, 4L, 6L, 3L, 5L, 6L, 1L, 3L, 4L, 6L, 5L, 5L, 1L, 3L, 2L, 6L, 5L, 5L, 4L, 3L, 5L, 3L, 6L, 5L, 4L, 4L, 2L, 4L, 5L, 2L, 5L, 3L, 1L, 1L, 6L, 5L, 6L, 6L, 1L, 5L, 5L, 3L, 6L, 6L, 1L, 4L, 3L, 6L, 4L, 4L, 6L, 4L, 4L, 3L, 5L, 4L, 1L, 2L, 1L, 5L, 2L, 6L, 4L, 1L, 3L, 4L, 4L, 2L, 4L, 5L, 6L, 5L, 5L, 5L, 3L, 1L, 6L, 2L, 2L, 2L, 6L, 4L, 2L, 5L, 4L, 3L, 4L, 3L, 1L, 2L, 2L, 3L, 4L, 5L, 6L, 4L, 3L, 4L, 6L, 3L, 3L, 5L, 6L, 3L, 3L, 3L, 1L, 2L, 4L, 5L, 2L, 5L, 4L, 4L, 2L, 4L, 3L, 1L, 3L, 3L, 6L, 5L, 4L, 2L, 1L, 4L, 4L, 1L, 4L, 3L, 4L, 3L, 1L, 4L, 6L, 2L, 5L, 6L, 3L, 6L, 2L, 1L, 6L, 6L, 2L, 6L, 6L, 5L, 2L, 2L, 4L, 6L, 6L, 5L, 2L, 3L, 3L, 1L, 3L, 4L, 3L, 5L, 5L, 2L, 4L, 2L, 2L, 6L, 3L, 6L, 4L, 4L, 1L, 4L, 5L, 2L, 2L, 4L, 6L, 5L, 4L, 3L, 2L, 4L, 4L, 6L, 5L, 4L, 4L, 6L, 4L, 4L, 1L, 5L, 2L, 1L, 6L, 5L, 4L, 2L, 5L, 4L, 2L, 4L, 6L, 1L, 6L, 5L, 4L, 5L, 1L, 4L, 6L, 2L, 4L, 4L, 2L, 3L, 2L, 1L, 5L, 2L, 4L, 5L, 2L, 5L, 3L, 2L, 3L, 6L, 6L, 3L, 1L, 3L, 2L, 6L, 5L, 5L, 4L, 3L, 3L, 6L, 5L, 2L, 5L, 4L, 5L, 1L, 2L, 6L, 2L, 6L, 3L, 5L, 6L, 1L, 6L, 3L, 4L, 2L, 1L, 6L, 2L, 5L, 5L, 4L, 3L, 2L, 2L, 2L, 1L, 2L, 6L, 1L, 5L, 1L, 3L, 1L, 1L, 6L, 4L, 5L, 2L, 4L, 2L, 5L, 3L, 4L, 1L, 2L, 5L, 1L, 1L, 2L, 6L, 2L, 4L, 3L, 3L, 4L, 4L, 5L, 5L, 6L, 1L, 4L, 2L, 2L, 3L, 3L, 3L, 6L, 3L, 5L, 4L, 4L, 3L, 3L, 3L, 3L, 5L, 4L, 5L, 1L, 4L, 4L, 5L, 6L, 4L, 5L, 1L, 6L, 2L, 1L, 3L, 6L, 3L, 2L, 5L, 1L, 3L, 2L, 3L, 3L, 2L, 5L, 3L, 5L, 5L, 4L, 6L, 6L, 5L, 6L, 6L, 3L, 4L, 2L, 4L, 2L, 3L, 1L, 4L, 5L, 4L, 1L, 5L, 4L, 5L, 6L, 3L, 5L, 6L, 5L, 1L, 2L, 2L, 4L, 6L, 4L, 5L, 6L, 3L, 4L, 2L, 1L, 2L, 5L, 3L, 6L, 5L, 5L, 5L, 3L, 5L, 5L, 2L, 2L, 3L, 2L, 5L, 5L, 4L, 5L, 1L, 5L, 2L, 5L, 4L, 2L, 4L, 6L, 3L, 6L, 3L, 1L, 6L, 5L, 4L, 5L, 6L, 4L, 5L, 2L, 1L, 3L, 6L, 1L, 5L, 1L, 2L, 5L, 2L, 1L, 6L, 4L, 1L, 6L, 3L, 2L, 2L, 4L, 5L, 5L, 5L, 3L, 3L, 1L, 4L, 2L, 4L, 6L, 1L, 3L, 1L, 6L, 3L, 2L, 1L, 3L, 3L, 4L, 1L, 3L, 3L, 5L, 1L, 2L, 2L, 5L, 2L, 4L, 3L, 2L, 3L, 3L, 6L, 5L, 1L, 4L, 3L, 4L, 5L, 5L, 1L, 5L, 6L, 5L, 2L, 2L, 3L, 5L, 3L, 1L, 2L, 5L, 5L, 1L, 3L, 4L, 3L, 3L, 6L, 5L, 2L, 5L, 5L, 2L, 6L, 2L, 1L, 1L, 2L, 6L, 4L, 5L, 1L, 2L, 1L, 1L, 4L, 4L, 1L, 3L, 5L, 4L, 4L, 3L, 4L, 5L, 3L, 4L, 5L, 1L, 3L, 2L, 3L, 4L, 3L, 5L, 3L, 2L, 4L, 5L, 1L, 2L, 4L, 3L, 6L, 3L, 6L, 3L, 6L, 3L, 4L, 3L, 2L, 3L, 6L, 2L, 4L, 1L, 1L, 2L, 2L, 5L, 3L, 2L, 3L, 6L, 2L, 3L, 2L, 5L, 5L, 2L, 3L, 3L, 5L, 3L, 5L, 4L, 6L, 2L, 2L, 1L, 5L, 4L, 4L, 4L, 1L, 6L, 6L, 3L, 2L, 3L, 6L, 4L, 4L, 4L, 4L, 4L, 5L, 3L, 5L, 6L, 5L, 2L, 4L, 6L, 5L, 6L, 5L, 5L, 1L, 3L, 6L, 3L, 2L, 2L, 4L, 4L, 2L, 5L, 4L, 4L, 6L, 4L, 5L, 5L, 5L, 3L, 6L, 4L, 6L, 5L, 6L, 4L, 4L, 6L, 2L, 3L, 5L, 5L, 2L, 5L, 4L, 4L, 1L, 4L, 2L, 6L, 2L, 1L, 4L, 2L, 6L, 4L, 2L, 3L, 4L, 6L, 6L, 2L, 3L, 4L, 3L, 2L, 3L, 5L, 2L, 6L, 4L, 4L, 1L, 5L, 3L, 6L, 1L, 2L, 3L, 5L, 5L, 5L, 5L, 3L, 5L, 4L, 5L, 6L, 4L, 5L, 5L, 3L, 4L, 4L, 2L, 4L, 3L, 4L, 6L, 3L, 5L, 2L, 5L, 5L, 4L, 2L, 1L, 6L, 2L, 4L, 6L, 3L, 3L, 6L, 5L, 6L, 1L, 5L, 2L, 4L, 6L, 4L, 5L, 3L, 2L, 6L, 1L, 3L, 3L, 3L, 2L, 4L, 3L, 2L, 5L, 5L, 4L, 2L, 6L, 6L, 2L, 6L, 3L, 6L, 1L, 4L, 6L, 4L, 6L, 6L, 1L, 5L, 1L, 3L, 1L, 6L, 1L, 3L, 2L, 3L, 2L, 2L, 4L, 1L, 3L, 1L, 5L, 3L, 5L, 4L, 3L, 2L, 3L, 2L, 3L, 3L, 6L, 1L, 2L, 6L, 5L, 2L, 6L, 2L, 6L, 5L, 3L, 1L, 2L, 2L, 4L, 5L, 4L, 6L, 5L, 3L, 4L, 2L, 5L, 6L, 4L, 1L, 5L, 3L, 1L, 5L, 4L, 2L, 2L, 5L, 2L, 5L, 4L, 3L, 5L, 3L, 2L, 2L, 3L, 2L, 1L, 4L, 5L, 4L, 6L, 3L, 6L, 3L, 6L, 4L, 1L, 6L, 6L, 4L, 1L, 5L, 2L, 5L, 5L, 4L, 2L, 5L, 4L, 6L, 4L, 6L, 3L, 4L, 1L, 4L, 3L, 1L, 4L, 5L, 3L, 4L, 1L, 5L, 5L, 1L, 2L, 1L, 4L, 1L, 5L, 5L, 4L, 4L, 6L, 6L, 4L, 6L, 4L, 2L, 2L, 3L, 5L, 1L, 2L, 3L, 6L, 3L, 4L, 4L, 2L, 4L, 2L, 3L, 3L, 2L, 1L, 1L, 3L, 2L, 2L, 1L, 1L, 6L, 3L, 3L, 6L, 1L, 6L, 4L, 2L, 4L, 2L, 1L, 1L, 4L, 4L, 4L, 6L, 4L, 4L, 6L, 2L, 3L, 3L, 3L, 2L, 2L, 4L, 4L, 6L, 5L, 5L, 3L, 4L, 5L, 4L, 1L, 3L, 1L, 5L, 5L, 6L, 5L, 1L, 5L, 3L, 6L, 3L, 4L, 6L, 3L, 3L, 5L, 1L, 5L, 2L, 3L, 2L, 2L, 2L, 2L, 4L, 4L, 2L, 5L, 4L, 1L, 2L, 3L, 1L, 4L, 2L, 1L, 6L, 4L, 1L, 4L, 2L, 5L, 4L, 3L, 5L, 2L, 1L, 1L, 4L, 3L, 2L, 3L, 1L, 2L, 6L, 6L, 1L, 3L, 4L, 1L, 5L, 6L, 4L, 4L), .Label = c('(0,25]', '(25,35]', '(35,45]', '(45,55]', '(55,65]', '(65,99]'), class = 'factor'), value = c('age1824', 'age2534', 'age3544', 'age4554', 'age5564', 'age6599')), .Names = c('', 'value'));do.call('levels<-', argv) [1] age4554 age4554 age3544 age6599 age5564 age4554 age4554 age5564 age4554 [10] age4554 age2534 age1824 age3544 age2534 age2534 age3544 age4554 age3544 [19] age2534 age2534 age2534 age4554 age3544 age2534 age6599 age3544 age6599 [28] age2534 age3544 age5564 age2534 age6599 age4554 age2534 age1824 age6599 [37] age6599 age4554 age5564 age3544 age5564 age5564 age6599 age2534 age4554 [46] age3544 age4554 age5564 age4554 age4554 age2534 age6599 age1824 age3544 [55] age5564 age4554 age5564 age2534 age5564 age1824 age6599 age5564 age3544 [64] age6599 age3544 age6599 age3544 age6599 age4554 age6599 age1824 age3544 [73] age2534 age5564 age3544 age3544 age2534 age4554 age3544 age4554 age2534 [82] age1824 age4554 age5564 age3544 age6599 age3544 age6599 age6599 age6599 [91] age4554 age4554 age6599 age4554 age2534 age2534 age3544 age3544 age3544 [100] age5564 age3544 age1824 age5564 age6599 age6599 age6599 age2534 age3544 [109] age3544 age5564 age4554 age2534 age2534 age5564 age2534 age3544 age1824 [118] age3544 age3544 age6599 age1824 age6599 age5564 age4554 age3544 age1824 [127] age1824 age1824 age3544 age5564 age4554 age4554 age1824 age1824 age6599 [136] age2534 age6599 age6599 age1824 age5564 age6599 age6599 age2534 age4554 [145] age6599 age6599 age4554 age4554 age5564 age4554 age4554 age1824 age3544 [154] age1824 age2534 age6599 age6599 age1824 age2534 age6599 age3544 age5564 [163] age4554 age6599 age5564 age3544 age4554 age2534 age5564 age2534 age3544 [172] age2534 age1824 age5564 age1824 age1824 age6599 age6599 age1824 age4554 [181] age2534 age3544 age4554 age3544 age3544 age5564 age3544 age6599 age4554 [190] age3544 age5564 age3544 age5564 age5564 age4554 age2534 age2534 age4554 [199] age1824 age6599 age5564 age6599 age3544 age5564 age1824 age2534 age1824 [208] age3544 age5564 age1824 age4554 age1824 age2534 age4554 age5564 age4554 [217] age6599 age3544 age5564 age6599 age1824 age3544 age4554 age6599 age5564 [226] age5564 age1824 age3544 age2534 age6599 age5564 age5564 age4554 age3544 [235] age5564 age3544 age6599 age5564 age4554 age4554 age2534 age4554 age5564 [244] age2534 age5564 age3544 age1824 age1824 age6599 age5564 age6599 age6599 [253] age1824 age5564 age5564 age3544 age6599 age6599 age1824 age4554 age3544 [262] age6599 age4554 age4554 age6599 age4554 age4554 age3544 age5564 age4554 [271] age1824 age2534 age1824 age5564 age2534 age6599 age4554 age1824 age3544 [280] age4554 age4554 age2534 age4554 age5564 age6599 age5564 age5564 age5564 [289] age3544 age1824 age6599 age2534 age2534 age2534 age6599 age4554 age2534 [298] age5564 age4554 age3544 age4554 age3544 age1824 age2534 age2534 age3544 [307] age4554 age5564 age6599 age4554 age3544 age4554 age6599 age3544 age3544 [316] age5564 age6599 age3544 age3544 age3544 age1824 age2534 age4554 age5564 [325] age2534 age5564 age4554 age4554 age2534 age4554 age3544 age1824 age3544 [334] age3544 age6599 age5564 age4554 age2534 age1824 age4554 age4554 age1824 [343] age4554 age3544 age4554 age3544 age1824 age4554 age6599 age2534 age5564 [352] age6599 age3544 age6599 age2534 age1824 age6599 age6599 age2534 age6599 [361] age6599 age5564 age2534 age2534 age4554 age6599 age6599 age5564 age2534 [370] age3544 age3544 age1824 age3544 age4554 age3544 age5564 age5564 age2534 [379] age4554 age2534 age2534 age6599 age3544 age6599 age4554 age4554 age1824 [388] age4554 age5564 age2534 age2534 age4554 age6599 age5564 age4554 age3544 [397] age2534 age4554 age4554 age6599 age5564 age4554 age4554 age6599 age4554 [406] age4554 age1824 age5564 age2534 age1824 age6599 age5564 age4554 age2534 [415] age5564 age4554 age2534 age4554 age6599 age1824 age6599 age5564 age4554 [424] age5564 age1824 age4554 age6599 age2534 age4554 age4554 age2534 age3544 [433] age2534 age1824 age5564 age2534 age4554 age5564 age2534 age5564 age3544 [442] age2534 age3544 age6599 age6599 age3544 age1824 age3544 age2534 age6599 [451] age5564 age5564 age4554 age3544 age3544 age6599 age5564 age2534 age5564 [460] age4554 age5564 age1824 age2534 age6599 age2534 age6599 age3544 age5564 [469] age6599 age1824 age6599 age3544 age4554 age2534 age1824 age6599 age2534 [478] age5564 age5564 age4554 age3544 age2534 age2534 age2534 age1824 age2534 [487] age6599 age1824 age5564 age1824 age3544 age1824 age1824 age6599 age4554 [496] age5564 age2534 age4554 age2534 age5564 age3544 age4554 age1824 age2534 [505] age5564 age1824 age1824 age2534 age6599 age2534 age4554 age3544 age3544 [514] age4554 age4554 age5564 age5564 age6599 age1824 age4554 age2534 age2534 [523] age3544 age3544 age3544 age6599 age3544 age5564 age4554 age4554 age3544 [532] age3544 age3544 age3544 age5564 age4554 age5564 age1824 age4554 age4554 [541] age5564 age6599 age4554 age5564 age1824 age6599 age2534 age1824 age3544 [550] age6599 age3544 age2534 age5564 age1824 age3544 age2534 age3544 age3544 [559] age2534 age5564 age3544 age5564 age5564 age4554 age6599 age6599 age5564 [568] age6599 age6599 age3544 age4554 age2534 age4554 age2534 age3544 age1824 [577] age4554 age5564 age4554 age1824 age5564 age4554 age5564 age6599 age3544 [586] age5564 age6599 age5564 age1824 age2534 age2534 age4554 age6599 age4554 [595] age5564 age6599 age3544 age4554 age2534 age1824 age2534 age5564 age3544 [604] age6599 age5564 age5564 age5564 age3544 age5564 age5564 age2534 age2534 [613] age3544 age2534 age5564 age5564 age4554 age5564 age1824 age5564 age2534 [622] age5564 age4554 age2534 age4554 age6599 age3544 age6599 age3544 age1824 [631] age6599 age5564 age4554 age5564 age6599 age4554 age5564 age2534 age1824 [640] age3544 age6599 age1824 age5564 age1824 age2534 age5564 age2534 age1824 [649] age6599 age4554 age1824 age6599 age3544 age2534 age2534 age4554 age5564 [658] age5564 age5564 age3544 age3544 age1824 age4554 age2534 age4554 age6599 [667] age1824 age3544 age1824 age6599 age3544 age2534 age1824 age3544 age3544 [676] age4554 age1824 age3544 age3544 age5564 age1824 age2534 age2534 age5564 [685] age2534 age4554 age3544 age2534 age3544 age3544 age6599 age5564 age1824 [694] age4554 age3544 age4554 age5564 age5564 age1824 age5564 age6599 age5564 [703] age2534 age2534 age3544 age5564 age3544 age1824 age2534 age5564 age5564 [712] age1824 age3544 age4554 age3544 age3544 age6599 age5564 age2534 age5564 [721] age5564 age2534 age6599 age2534 age1824 age1824 age2534 age6599 age4554 [730] age5564 age1824 age2534 age1824 age1824 age4554 age4554 age1824 age3544 [739] age5564 age4554 age4554 age3544 age4554 age5564 age3544 age4554 age5564 [748] age1824 age3544 age2534 age3544 age4554 age3544 age5564 age3544 age2534 [757] age4554 age5564 age1824 age2534 age4554 age3544 age6599 age3544 age6599 [766] age3544 age6599 age3544 age4554 age3544 age2534 age3544 age6599 age2534 [775] age4554 age1824 age1824 age2534 age2534 age5564 age3544 age2534 age3544 [784] age6599 age2534 age3544 age2534 age5564 age5564 age2534 age3544 age3544 [793] age5564 age3544 age5564 age4554 age6599 age2534 age2534 age1824 age5564 [802] age4554 age4554 age4554 age1824 age6599 age6599 age3544 age2534 age3544 [811] age6599 age4554 age4554 age4554 age4554 age4554 age5564 age3544 age5564 [820] age6599 age5564 age2534 age4554 age6599 age5564 age6599 age5564 age5564 [829] age1824 age3544 age6599 age3544 age2534 age2534 age4554 age4554 age2534 [838] age5564 age4554 age4554 age6599 age4554 age5564 age5564 age5564 age3544 [847] age6599 age4554 age6599 age5564 age6599 age4554 age4554 age6599 age2534 [856] age3544 age5564 age5564 age2534 age5564 age4554 age4554 age1824 age4554 [865] age2534 age6599 age2534 age1824 age4554 age2534 age6599 age4554 age2534 [874] age3544 age4554 age6599 age6599 age2534 age3544 age4554 age3544 age2534 [883] age3544 age5564 age2534 age6599 age4554 age4554 age1824 age5564 age3544 [892] age6599 age1824 age2534 age3544 age5564 age5564 age5564 age5564 age3544 [901] age5564 age4554 age5564 age6599 age4554 age5564 age5564 age3544 age4554 [910] age4554 age2534 age4554 age3544 age4554 age6599 age3544 age5564 age2534 [919] age5564 age5564 age4554 age2534 age1824 age6599 age2534 age4554 age6599 [928] age3544 age3544 age6599 age5564 age6599 age1824 age5564 age2534 age4554 [937] age6599 age4554 age5564 age3544 age2534 age6599 age1824 age3544 age3544 [946] age3544 age2534 age4554 age3544 age2534 age5564 age5564 age4554 age2534 [955] age6599 age6599 age2534 age6599 age3544 age6599 age1824 age4554 age6599 [964] age4554 age6599 age6599 age1824 age5564 age1824 age3544 age1824 age6599 [973] age1824 age3544 age2534 age3544 age2534 age2534 age4554 age1824 age3544 [982] age1824 age5564 age3544 age5564 age4554 age3544 age2534 age3544 age2534 [991] age3544 age3544 age6599 age1824 age2534 age6599 age5564 age2534 age6599 [1000] age2534 age6599 age5564 age3544 age1824 age2534 age2534 age4554 age5564 [1009] age4554 age6599 age5564 age3544 age4554 age2534 age5564 age6599 age4554 [1018] age1824 age5564 age3544 age1824 age5564 age4554 age2534 age2534 age5564 [1027] age2534 age5564 age4554 age3544 age5564 age3544 age2534 age2534 age3544 [1036] age2534 age1824 age4554 age5564 age4554 age6599 age3544 age6599 age3544 [1045] age6599 age4554 age1824 age6599 age6599 age4554 age1824 age5564 age2534 [1054] age5564 age5564 age4554 age2534 age5564 age4554 age6599 age4554 age6599 [1063] age3544 age4554 age1824 age4554 age3544 age1824 age4554 age5564 age3544 [1072] age4554 age1824 age5564 age5564 age1824 age2534 age1824 age4554 age1824 [1081] age5564 age5564 age4554 age4554 age6599 age6599 age4554 age6599 age4554 [1090] age2534 age2534 age3544 age5564 age1824 age2534 age3544 age6599 age3544 [1099] age4554 age4554 age2534 age4554 age2534 age3544 age3544 age2534 age1824 [1108] age1824 age3544 age2534 age2534 age1824 age1824 age6599 age3544 age3544 [1117] age6599 age1824 age6599 age4554 age2534 age4554 age2534 age1824 age1824 [1126] age4554 age4554 age4554 age6599 age4554 age4554 age6599 age2534 age3544 [1135] age3544 age3544 age2534 age2534 age4554 age4554 age6599 age5564 age5564 [1144] age3544 age4554 age5564 age4554 age1824 age3544 age1824 age5564 age5564 [1153] age6599 age5564 age1824 age5564 age3544 age6599 age3544 age4554 age6599 [1162] age3544 age3544 age5564 age1824 age5564 age2534 age3544 age2534 age2534 [1171] age2534 age2534 age4554 age4554 age2534 age5564 age4554 age1824 age2534 [1180] age3544 age1824 age4554 age2534 age1824 age6599 age4554 age1824 age4554 [1189] age2534 age5564 age4554 age3544 age5564 age2534 age1824 age1824 age4554 [1198] age3544 age2534 age3544 age1824 age2534 age6599 age6599 age1824 age3544 [1207] age4554 age1824 age5564 age6599 age4554 age4554 Levels: age1824 age2534 age3544 age4554 age5564 age6599 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testLgamma# #{ lgamma(1) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testLgamma# #{ lgamma(1+1i) } Error in lgamma(1 + (0+1i)) : unimplemented complex function ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testLgamma# #{ lgamma(100) } [1] 359.1342 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testLgamma# #{ lgamma(7.42) } [1] 7.379082 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testLgamma# #{ lgamma(FALSE) } [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testLgamma# #{ lgamma(as.double(NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testLgamma# #{ lgamma(as.raw(1)) } Error in lgamma(as.raw(1)) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testLgamma# #{ lgamma(c(100, 2.2)) } [1] 359.13420537 0.09694747 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testlgamma1# #argv <- list(structure(c(2, 1, 1, 1, 3, 1, 1, 1, 4), .Dim = c(3L, 3L)));lgamma(argv[[1]]); [,1] [,2] [,3] [1,] 0 0.0000000 0.000000 [2,] 0 0.6931472 0.000000 [3,] 0 0.0000000 1.791759 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testlgamma2# #argv <- list(structure(c(2, 3, 2, 1, 4, 4, 7, 2, 11, 11, 15, 10, 7, 8, 13, 12), .Dim = c(4L, 4L), .Dimnames = structure(list(income = c('< 15k', '15-25k', '25-40k', '> 40k'), satisfaction = c('VeryD', 'LittleD', 'ModerateS', 'VeryS')), .Names = c('income', 'satisfaction'))));lgamma(argv[[1]]); satisfaction income VeryD LittleD ModerateS VeryS < 15k 0.0000000 1.791759 15.10441 6.579251 15-25k 0.6931472 1.791759 15.10441 8.525161 25-40k 0.0000000 6.579251 25.19122 19.987214 > 40k 0.0000000 0.000000 12.80183 17.502308 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testlgamma3# #argv <- list(1.72926007700446);lgamma(argv[[1]]); [1] -0.0893685 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testlgamma4# #argv <- list(0.999935539560166);lgamma(argv[[1]]); [1] 3.721099e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testlgamma5# #argv <- list(FALSE);lgamma(argv[[1]]); [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testlgamma6# #argv <- list(numeric(0));lgamma(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testlgamma7# #argv <- list(structure(c(11.4065045686104, 9.40650456861037, 8.40650456861037, 11.4065045686104, 9.40650456861037, 6.40650456861036, 15.4065045686104, 9.40650456861037, 9.40650456861037, 8.40650456861037, 6.40650456861036, 7.40650456861036, 8.40650456861037, 7.40650456861036, 9.40650456861037, 13.4065045686104, 10.4065045686104, 11.4065045686104, 14.4065045686104, 10.4065045686104, 16.4065045686104, 10.4065045686104, 7.40650456861036, 9.40650456861037, 7.40650456861036, 13.4065045686104, 17.4065045686104, 4.40650456861036, 10.4065045686104, 5.40650456861036, 6.40650456861036, 4.40650456861036, 5.40650456861036, 4.40650456861036, 4.40650456861036, 8.40650456861037, 9.40650456861037, 5.40650456861036, 9.40650456861037, 7.40650456861036, 7.40650456861036, 8.40650456861037), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42')));lgamma(argv[[1]]); 1 2 3 4 5 6 7 8 16.068174 11.484342 9.355336 16.068174 11.484342 5.495664 26.283999 11.484342 9 10 11 12 13 14 15 16 11.484342 9.355336 5.495664 7.352977 9.355336 7.352977 11.484342 21.020579 17 18 19 20 21 22 23 24 13.725743 16.068174 23.616319 13.725743 29.018789 13.725743 7.352977 11.484342 25 26 27 28 29 30 31 32 7.352977 21.020579 31.816466 2.324979 13.725743 3.808061 5.495664 2.324979 33 34 35 36 37 38 39 40 3.808061 2.324979 2.324979 9.355336 11.484342 3.808061 11.484342 7.352977 41 42 7.352977 9.355336 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lgamma.testlgamma9# #argv <- list(Inf);do.call('lgamma', argv) [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testList#Output.IgnoreErrorContext# #l<- list(1); l[[1]] <- l[[1]] + 1 <- l[[1]] Error in l[[1]] + 1 <- l[[1]] : could not find function "+<-" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testList# #list(1,2,3,) Error in list(1, 2, 3, ) : argument 4 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testList# #{ list(1, b=2) } [[1]] [1] 1 $b [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testList# #{ list(a=1, 2) } $a [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testList# #{ list(a=1, b=2) } $a [1] 1 $b [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testList# #{ x<-c(y=1, 2); list(a=x, 42) } $a y 1 2 [[2]] [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testList# #{ x<-list(y=1, 2); c(42, a=x) } [[1]] [1] 42 $a.y [1] 1 $a2 [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testList# #{ x<-list(y=1, 2); c(a=x, 42) } $a.y [1] 1 $a2 [1] 2 [[3]] [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testList# #{ x<-list(y=1, 2); c(a=x, c(y=7,z=42)) } $a.y [1] 1 $a2 [1] 2 $y [1] 7 $z [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testList# #{ x<-list(y=1, 2); c(a=x, c(z=7,42)) } $a.y [1] 1 $a2 [1] 2 $z [1] 7 [[4]] [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testRefCount# #{ l <- list(a=c(1,2)); l2 <- l; l$a[[1]] <- 3; l2 } $a [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist1# #argv <- list(surname = structure(c('McNeil', 'Ripley', 'Ripley', 'Tierney', 'Tukey', 'Venables', 'R Core'), class = 'AsIs'), nationality = structure(c('Australia', 'UK', 'UK', 'US', 'US', 'Australia', NA), class = 'AsIs'), deceased = structure(c('no', 'no', 'no', 'no', 'yes', 'no', NA), class = 'AsIs'), title = structure(c('Interactive Data Analysis', 'Spatial Statistics', 'Stochastic Simulation', 'LISP-STAT', 'Exploratory Data Analysis', 'Modern Applied Statistics ...', 'An Introduction to R'), class = 'AsIs'), other.author = structure(c(NA, NA, NA, NA, NA, 'Ripley', 'Venables & Smith'), class = 'AsIs'));list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]]); [[1]] [1] "McNeil" "Ripley" "Ripley" "Tierney" "Tukey" "Venables" "R Core" [[2]] [1] "Australia" "UK" "UK" "US" "US" "Australia" [7] NA [[3]] [1] "no" "no" "no" "no" "yes" "no" NA [[4]] [1] "Interactive Data Analysis" "Spatial Statistics" [3] "Stochastic Simulation" "LISP-STAT" [5] "Exploratory Data Analysis" "Modern Applied Statistics ..." [7] "An Introduction to R" [[5]] [1] NA NA NA NA [5] NA "Ripley" "Venables & Smith" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist10#Output.IgnoreWhitespace# #argv <- list(linkfun = function (mu) .Call(C_logit_link, mu), linkinv = function (eta) .Call(C_logit_linkinv, eta), mu.eta = function (eta) .Call(C_logit_mu_eta, eta), valideta = function (eta) TRUE, name = 'logit');list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]]); [[1]] function (mu) .Call(C_logit_link, mu) [[2]] function (eta) .Call(C_logit_linkinv, eta) [[3]] function (eta) .Call(C_logit_mu_eta, eta) [[4]] function (eta) TRUE [[5]] [1] "logit" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist11#Output.IgnoreWhitespace# #argv <- list(linkfun = function (mu) log(mu), linkinv = function (eta) pmax(exp(eta), .Machine$double.eps), mu.eta = function (eta) pmax(exp(eta), .Machine$double.eps), valideta = function (eta) TRUE, name = 'log');list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]]); [[1]] function (mu) log(mu) [[2]] function (eta) pmax(exp(eta), .Machine$double.eps) [[3]] function (eta) pmax(exp(eta), .Machine$double.eps) [[4]] function (eta) TRUE [[5]] [1] "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist12# #argv <- list(class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rnorm(2, numeric()))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition')));list(argv[[1]],argv[[2]]); [[1]] [1] "try-error" [[2]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist13# #argv <- list(class = 'try-error', condition = structure(list(message = 'undefined columns selected', call = quote(`[.data.frame`(dd, , 'x'))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition')));list(argv[[1]],argv[[2]]); [[1]] [1] "try-error" [[2]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist14#Output.IgnoreWhitespace# #argv <- list(error = function (e) -1);list(argv[[1]]); [[1]] function (e) -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist15#Ignored.OutputFormatting# #argv <- list(error = function (e) warning(gettextf('%s namespace cannot be unloaded:\n ', sQuote(pkgname)), conditionMessage(e), call. = FALSE, domain = NA));list(argv[[1]]); [[1]] function (e) warning(gettextf('%s namespace cannot be unloaded:\n ', sQuote(pkgname)), conditionMessage(e), call. = FALSE, domain = NA) ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist16# #argv <- list(aa = structure(c('1', '2', '3'), class = 'AsIs'), ..dfd.row.names = structure(c('4', '5', '6', '7', '8', '9'), .Dim = c(3L, 2L), .Dimnames = list(NULL, c('a', 'b'))));list(argv[[1]],argv[[2]]); [[1]] [1] "1" "2" "3" [[2]] a b [1,] "4" "7" [2,] "5" "8" [3,] "6" "9" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist17# #argv <- list(deviance.resid = structure(c(-0.667819876370237, 0.170711734013213, 0.552921941721332, -0.253162069270378, -0.00786394222146348, 0.0246733498130512, 0.0730305465518564, -1.36919169254062, 0.0881443844426084, -0.0834190388782434), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), coefficients = structure(logical(0), .Dim = c(0L, 4L), .Dimnames = list(NULL, c('Estimate', 'Std. Error', 't value', 'Pr(>|t|)'))), aliased = structure(TRUE, .Names = 'x'), dispersion = 0.274035772634541, df = c(0L, 10L, 1L), cov.unscaled = structure(logical(0), .Dim = c(0L, 0L)), cov.scaled = structure(logical(0), .Dim = c(0L, 0L)));list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]],argv[[6]],argv[[7]]); [[1]] 1 2 3 4 5 6 -0.667819876 0.170711734 0.552921942 -0.253162069 -0.007863942 0.024673350 7 8 9 10 0.073030547 -1.369191693 0.088144384 -0.083419039 [[2]] Estimate Std. Error t value Pr(>|t|) [[3]] x TRUE [[4]] [1] 0.2740358 [[5]] [1] 0 10 1 [[6]] <0 x 0 matrix> [[7]] <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist18# #argv <- list(date = structure(1065672000, class = c('POSIXct', 'POSIXt'), tzone = ''));list(argv[[1]]); [[1]] [1] "2003-10-09 04:00:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist19#Ignored.OutputFormatting# #argv <- list(arguments = structure('object', simpleOnly = TRUE), generic = structure(function (object) standardGeneric('show'), generic = structure('show', package = 'methods'), package = 'methods', group = list(), valueClass = character(0), signature = structure('object', simpleOnly = TRUE), default = structure(function (object) showDefault(object, FALSE), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'object', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'object', package = 'methods'), generic = structure('show', package = 'methods'), class = structure('derivedDefaultMethod', package = 'methods')), skeleton = quote((function (object) showDefault(object, FALSE))(object)), class = structure('standardGeneric', package = 'methods')));list(argv[[1]],argv[[2]]); [[1]] [1] "object" attr(,"simpleOnly") [1] TRUE [[2]] function (object) standardGeneric('show') attr(,"generic") [1] "show" attr(,"generic")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"group") list() attr(,"valueClass") character(0) attr(,"signature") [1] "object" attr(,"signature")attr(,"simpleOnly") [1] TRUE attr(,"default") function (object) showDefault(object, FALSE) attr(,"target") object "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"defined") object "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"generic") [1] "show" attr(,"generic")attr(,"package") [1] "methods" attr(,"class") [1] "derivedDefaultMethod" attr(,"class")attr(,"package") [1] "methods" attr(,"skeleton") (function(object) showDefault(object, FALSE))(object) attr(,"class") [1] "standardGeneric" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist2# #argv <- list(`_R_NS_LOAD_` = structure('survival', .Names = 'name'));list(argv[[1]]); [[1]] name "survival" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist20#Output.IgnoreWhitespace# #argv <- list('Residuals vs Fitted', 'Normal Q-Q', 'Scale-Location', 'Cooks distance', 'Residuals vs Leverage', expression('Cooks dist vs Leverage ' * h[ii]/(1 - h[ii])));list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]],argv[[6]]); [[1]] [1] "Residuals vs Fitted" [[2]] [1] "Normal Q-Q" [[3]] [1] "Scale-Location" [[4]] [1] "Cooks distance" [[5]] [1] "Residuals vs Leverage" [[6]] expression("Cooks dist vs Leverage " * h[ii]/(1 - h[ii])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist21# #argv <- list(Df = structure(c(NA, 2, 1), .Names = c('', 'Soft', 'M.user:Temp')), Deviance = structure(c(8.44399377410362, 8.2279889309135, 5.65604443125997), .Names = c('', 'Soft', 'M.user:Temp')), AIC = structure(c(72.1419514890413, 75.9259466458512, 71.3540021461976), .Names = c('', 'Soft', 'M.user:Temp')));list(argv[[1]],argv[[2]],argv[[3]]); [[1]] Soft M.user:Temp NA 2 1 [[2]] Soft M.user:Temp 8.443994 8.227989 5.656044 [[3]] Soft M.user:Temp 72.14195 75.92595 71.35400 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist22# #argv <- list(structure(TRUE, .Dim = c(1L, 1L)));list(argv[[1]]); [[1]] [,1] [1,] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist23# #argv <- list(V1 = c(1L, 1L, 2L, 3L), V2 = structure(c(1L, 1L, 2L, 3L), .Label = c('A', 'D', 'E'), class = 'factor'), V3 = c(6, 6, 9, 10));list(argv[[1]],argv[[2]],argv[[3]]); [[1]] [1] 1 1 2 3 [[2]] [1] A A D E Levels: A D E [[3]] [1] 6 6 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist24# #argv <- list(structure(1:5, .Tsp = c(-1, 3, 1), class = 'ts'), structure(1:5, .Tsp = c(1, 5, 1), class = 'ts'));list(argv[[1]],argv[[2]]); [[1]] Time Series: Start = -1 End = 3 Frequency = 1 [1] 1 2 3 4 5 [[2]] Time Series: Start = 1 End = 5 Frequency = 1 [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist25# #argv <- list(structure(list(x = 1L, y = structure(1L, .Label = c('A', 'D', 'E'), class = 'factor'), z = 6), .Names = c('x', 'y', 'z'), row.names = 1L, class = 'data.frame'), structure(list(), .Names = character(0), row.names = 1L, class = 'data.frame'));list(argv[[1]],argv[[2]]); [[1]] x y z 1 1 A 6 [[2]] data frame with 0 columns and 1 row ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist26# #argv <- list(1L, 3.14159265358979, 3+5i, 'testit', TRUE, structure(1L, .Label = 'foo', class = 'factor'));list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]],argv[[6]]); [[1]] [1] 1 [[2]] [1] 3.141593 [[3]] [1] 3+5i [[4]] [1] "testit" [[5]] [1] TRUE [[6]] [1] foo Levels: foo ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist27# #argv <- list(structure(c(24L, 13L, 15L, 68L, 39L, 74L, 22L, 1L, 8L, 55L, 24L, 20L, 51L, 13L, 3L, 4L, 5L, 6L, 15L, 2L, 8L, 60L, 67L, 23L, 58L, 24L, 22L, 21L, 37L, 74L, 59L, 39L, 14L, 14L, 19L, 23L, 70L, 21L, 22L, 31L, 29L, 30L, 45L, 58L, 17L, 7L, 19L, 26L, 39L, 74L, 57L, 59L, 12L, 72L, 70L, 37L, 64L, 16L, 18L, 21L, 22L, 8L, 62L, 61L, 63L, 71L, 105L, 64L, 10L, 41L, 8L, 27L, 11L, 34L, 32L, 33L, 68L, 107L, NA, 66L, NA, 65L, 48L, 52L, 43L, 47L, 46L, 44L, 41L, 54L, 28L, 50L, 40L, NA, 69L, NA, 75L, 109L, NA, 86L, 112L, 110L, 104L, 24L, 111L, 87L, NA, NA, 92L, 73L, 85L, 90L, 89L, NA, 83L, NA, 102L, NA, 108L, 88L, 91L, 93L, NA, 94L, 84L, NA, 106L, NA, 95L, 82L, 56L, 87L, 109L, 75L, 104L, 110L, 112L, 111L, 24L, 73L, 85L, 86L, 90L, 89L, 102L, 88L, 92L, 9L, 49L, 42L, 38L, 35L, 36L, 25L, NA, NA, 9L, 49L, 42L, NA, 36L, 38L, 25L, 53L, 79L, 78L, 103L, 77L, 80L, 114L, 97L, 113L, 76L, 96L, 81L, 116L, 99L, 117L, 115L, 98L, 101L, 100L), .Label = c('1008', '1011', '1013', '1014', '1015', '1016', '1027', '1028', '1030', '1032', '1051', '1052', '1083', '1093', '1095', '1096', '110', '1102', '111', '1117', '112', '113', '116', '117', '1219', '125', '1250', '1251', '126', '127', '128', '1291', '1292', '1293', '1298', '1299', '130', '1308', '135', '1376', '1377', '1383', '1408', '1409', '141', '1410', '1411', '1413', '1418', '1422', '1438', '1445', '1456', '1492', '2001', '2316', '262', '266', '269', '270', '2708', '2714', '2715', '272', '2728', '2734', '280', '283', '286', '290', '3501', '411', '412', '475', '5028', '5042', '5043', '5044', '5045', '5047', '5049', '5050', '5051', '5052', '5053', '5054', '5055', '5056', '5057', '5058', '5059', '5060', '5061', '5062', '5066', '5067', '5068', '5069', '5070', '5072', '5073', '5115', '5160', '5165', '655', '724', '885', '931', '942', '952', '955', '958', 'c118', 'c168', 'c203', 'c204', 'c266'), class = 'factor'));list(argv[[1]]); [[1]] [1] 117 1083 1095 283 135 475 113 1008 1028 2001 117 1117 1438 1083 1013 [16] 1014 1015 1016 1095 1011 1028 270 280 116 266 117 113 112 130 475 [31] 269 135 1093 1093 111 116 290 112 113 128 126 127 141 266 110 [46] 1027 111 125 135 475 262 269 1052 411 290 130 272 1096 1102 112 [61] 113 1028 2714 2708 2715 3501 655 272 1032 1377 1028 1250 1051 1293 1291 [76] 1292 283 885 2734 2728 1413 1445 1408 1411 1410 1409 1377 1492 [91] 1251 1422 1376 286 5028 942 5054 958 952 5165 117 955 [106] 5055 5060 412 5053 5058 5057 5051 5115 931 5056 [121] 5059 5061 5062 5052 724 5066 5050 2316 5055 942 5028 5165 [136] 952 958 955 117 412 5053 5054 5058 5057 5115 5056 5060 1030 1418 1383 [151] 1308 1298 1299 1219 1030 1418 1383 1299 1308 1219 1456 5045 [166] 5044 5160 5043 5047 c168 5068 c118 5042 5067 5049 c204 5070 c266 c203 5069 [181] 5073 5072 117 Levels: 1008 1011 1013 1014 1015 1016 1027 1028 1030 1032 1051 1052 ... c266 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist28# #argv <- list(3.14159265358979, 'C', NaN, Inf, 1:3, c(0, NA), NA);list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]],argv[[6]],argv[[7]]); [[1]] [1] 3.141593 [[2]] [1] "C" [[3]] [1] NaN [[4]] [1] Inf [[5]] [1] 1 2 3 [[6]] [1] 0 NA [[7]] [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist29# #argv <- list(assign = c(0L, 1L, 1L, 1L), qr = structure(list(qr = structure(c(-28.8270706107991, 0.273146306828071, 0.312206540911182, 0.247733407426682, 0.216636580341913, 0.0849718577324175, 0.298411357268471, 0.294351149612123, 0.247733407426682, 0.308328048219576, 0.125075187976724, 0.138758462627192, 0.190002850064127, 0.1835601922086, 0.232705016165824, 0.069379231313596, 0.120168353625222, 0.222121918799273, 0.190002850064127, 0.247733407426682, 0.0917800961043001, -10.2334366187554, 13.7940847818881, 0.190374922931528, 0.151060987411652, 0.132099001405849, -0.125761881229701, -0.441661211981173, -0.435651935890569, -0.366655739827817, -0.45633832676795, -0.185116476853374, 0.084611076858457, 0.115858488525451, 0.111929933764425, 0.141897089628727, 0.0423055384292285, 0.0732753420009814, 0.13544380924692, 0.115858488525451, 0.151060987411652, 0.0559649668822123, -4.26682272578616, -3.16543363464969, 9.7352069177467, 0.118607830555703, 0.10371953900067, 0.00616533725634264, 0.0216519528674631, 0.0213573547475655, 0.0179748924786157, 0.0223714822011986, 0.00907513071804667, -0.344446140042991, -0.471652301867824, -0.45565941330494, -0.577653737792655, -0.172223070021495, 0.0575332486360618, 0.106345765721762, 0.0909680534393656, 0.118607830555703, 0.0439417444752447, -4.89123580760852, -3.62866782508622, -3.32364207119197, 9.63649238427318, 0.135617489972887, 0.00806142768852949, 0.0283108036266689, 0.0279256046761512, 0.0235028985277947, 0.0292516173165799, 0.0118661002643811, 0.0254562434016423, 0.0348573968510539, 0.0336754446773372, 0.0426914180233895, 0.0127281217008212, -0.284250391934964, -0.525414891452651, -0.449439332155022, -0.585997195035538, -0.217099822893807), assign = c(0L, 1L, 1L, 1L), contrasts = structure(list(trt = 'contr.treatment'), .Names = 'trt'), .Dim = c(21L, 4L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21'), c('(Intercept)', 'trt2', 'trt3', 'trt4'))), qraux = c(1.21663658034191, 1.16655707135303, 1.14947576464323, 1.15508453302121), pivot = 1:4, tol = 1e-07, rank = 4L), .Names = c('qr', 'qraux', 'pivot', 'tol', 'rank'), class = 'qr'), df.residual = 17L);list(argv[[1]],argv[[2]],argv[[3]]); [[1]] [1] 0 1 1 1 [[2]] $qr (Intercept) trt2 trt3 trt4 1 -28.82707061 -10.23343662 -4.266822726 -4.891235808 2 0.27314631 13.79408478 -3.165433635 -3.628667825 3 0.31220654 0.19037492 9.735206918 -3.323642071 4 0.24773341 0.15106099 0.118607831 9.636492384 5 0.21663658 0.13209900 0.103719539 0.135617490 6 0.08497186 -0.12576188 0.006165337 0.008061428 7 0.29841136 -0.44166121 0.021651953 0.028310804 8 0.29435115 -0.43565194 0.021357355 0.027925605 9 0.24773341 -0.36665574 0.017974892 0.023502899 10 0.30832805 -0.45633833 0.022371482 0.029251617 11 0.12507519 -0.18511648 0.009075131 0.011866100 12 0.13875846 0.08461108 -0.344446140 0.025456243 13 0.19000285 0.11585849 -0.471652302 0.034857397 14 0.18356019 0.11192993 -0.455659413 0.033675445 15 0.23270502 0.14189709 -0.577653738 0.042691418 16 0.06937923 0.04230554 -0.172223070 0.012728122 17 0.12016835 0.07327534 0.057533249 -0.284250392 18 0.22212192 0.13544381 0.106345766 -0.525414891 19 0.19000285 0.11585849 0.090968053 -0.449439332 20 0.24773341 0.15106099 0.118607831 -0.585997195 21 0.09178010 0.05596497 0.043941744 -0.217099823 attr(,"assign") [1] 0 1 1 1 attr(,"contrasts") attr(,"contrasts")$trt [1] "contr.treatment" $qraux [1] 1.216637 1.166557 1.149476 1.155085 $pivot [1] 1 2 3 4 $tol [1] 1e-07 $rank [1] 4 attr(,"class") [1] "qr" [[3]] [1] 17 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist3#IgnoreOS.Solaris# #argv <- list(x = c(9.5367431640625e-07, 1.9073486328125e-06, 3.814697265625e-06, 7.62939453125e-06, 1.52587890625e-05, 3.0517578125e-05, 6.103515625e-05, 0.0001220703125, 0.000244140625, 0.00048828125, 0.0009765625, 0.001953125, 0.00390625, 0.0078125, 0.015625, 0.03125, 0.0625, 0.125, 0.25, 0.5, 1, 2, 4, 8, 16, 32, 64, 128, 256, 512, 1024), y = c(3.69420518444359e+25, 2.30887824027777e+24, 1.44304890017492e+23, 9.01905562612606e+21, 5.63690976641081e+20, 35230686042118275072, 2201917878145066496, 137619867512235136, 8601241751556820, 537577617482832, 33598603095309.8, 2099913194115.17, 131244699796.888, 8202825028.58974, 512684387.219832, 32044730.0464007, 2003284.70114408, 125327.674230857, 7863.68742857025, 499.272560819512, 33.2784230289721, 2.7659432263306, 0.488936768533843, -0.282943224311172, 7.32218543045282e-05, -0.00636442868227041, -0.0483709204009262, -0.0704795507649514, 0.0349437746169591, -0.0264830837608839, 0.0200901469411759), xlab = NULL, ylab = NULL);list(argv[[1]],argv[[2]],argv[[3]],argv[[4]]); [[1]] [1] 9.536743e-07 1.907349e-06 3.814697e-06 7.629395e-06 1.525879e-05 [6] 3.051758e-05 6.103516e-05 1.220703e-04 2.441406e-04 4.882812e-04 [11] 9.765625e-04 1.953125e-03 3.906250e-03 7.812500e-03 1.562500e-02 [16] 3.125000e-02 6.250000e-02 1.250000e-01 2.500000e-01 5.000000e-01 [21] 1.000000e+00 2.000000e+00 4.000000e+00 8.000000e+00 1.600000e+01 [26] 3.200000e+01 6.400000e+01 1.280000e+02 2.560000e+02 5.120000e+02 [31] 1.024000e+03 [[2]] [1] 3.694205e+25 2.308878e+24 1.443049e+23 9.019056e+21 5.636910e+20 [6] 3.523069e+19 2.201918e+18 1.376199e+17 8.601242e+15 5.375776e+14 [11] 3.359860e+13 2.099913e+12 1.312447e+11 8.202825e+09 5.126844e+08 [16] 3.204473e+07 2.003285e+06 1.253277e+05 7.863687e+03 4.992726e+02 [21] 3.327842e+01 2.765943e+00 4.889368e-01 -2.829432e-01 7.322185e-05 [26] -6.364429e-03 -4.837092e-02 -7.047955e-02 3.494377e-02 -2.648308e-02 [31] 2.009015e-02 [[3]] NULL [[4]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist30#Output.IgnoreWhitespace# #argv <- list(function (x, i, j, ...) x@aa[[i]]);list(argv[[1]]); [[1]] function (x, i, j, ...) x@aa[[i]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist31# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = 2:3, .Dimnames = list(NULL, c('a', 'b', 'c'))), structure(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = c(2L, 2L, 5L)), TRUE);list(argv[[1]],argv[[2]],argv[[3]]); [[1]] a b c [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE [[2]] , , 1 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE , , 2 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE , , 3 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE , , 4 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE , , 5 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE [[3]] [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist32#Ignored.OutputFormatting# #argv <- list(structure(function (e1, e2) standardGeneric('Ops'), generic = structure('Ops', package = 'base'), package = 'base', group = list(), valueClass = character(0), signature = c('e1', 'e2'), default = quote(`\001NULL\001`), skeleton = quote((function (e1, e2) stop('invalid call in method dispatch to Ops (no default method)', domain = NA))(e1, e2)), groupMembers = list('Arith', 'Compare', 'Logic'), class = structure('groupGenericFunction', package = 'methods')));list(argv[[1]]); [[1]] function (e1, e2) standardGeneric('Ops') attr(,"generic") [1] "Ops" attr(,"generic")attr(,"package") [1] "base" attr(,"package") [1] "base" attr(,"group") list() attr(,"valueClass") character(0) attr(,"signature") [1] "e1" "e2" attr(,"default") `\001NULL\001` attr(,"skeleton") (function(e1, e2) stop("invalid call in method dispatch to Ops (no default method)", domain = NA))(e1, e2) attr(,"groupMembers") attr(,"groupMembers")[[1]] [1] "Arith" attr(,"groupMembers")[[2]] [1] "Compare" attr(,"groupMembers")[[3]] [1] "Logic" attr(,"class") [1] "groupGenericFunction" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist33# #argv <- list(tables = structure(list(`Grand mean` = 103.87323943662, N = structure(c(78.7365206866197, 98.5088731171753, 113.842206450509, 123.008873117175), .Dim = 4L, .Dimnames = structure(list(N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = 'N'), class = 'mtable'), `V:N` = structure(c(79.5323303457107, 86.1989970123773, 69.7732394366197, 98.0323303457106, 108.032330345711, 89.1989970123773, 114.198997012377, 116.698997012377, 110.365663679044, 124.365663679044, 126.365663679044, 118.032330345711), .Dim = 3:4, .Dimnames = structure(list(V = c('Golden.rain', 'Marvellous', 'Victory'), N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = c('V', 'N')), class = 'mtable')), .Names = c('Grand mean', 'N', 'V:N')), n = structure(list(N = structure(c(17, 18, 18, 18), .Dim = 4L, .Dimnames = structure(list(N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = 'N')), `V:N` = structure(c(6, 6, 5, 6, 6, 6, 6, 6, 6, 6, 6, 6), .Dim = 3:4, .Dimnames = structure(list(V = c('Golden.rain', 'Marvellous', 'Victory'), N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = c('V', 'N')))), .Names = c('N', 'V:N')));list(argv[[1]],argv[[2]]); [[1]] [[1]]$`Grand mean` [1] 103.8732 [[1]]$N N 0.0cwt 0.2cwt 0.4cwt 0.6cwt 78.73652 98.50887 113.84221 123.00887 [[1]]$`V:N` N V 0.0cwt 0.2cwt 0.4cwt 0.6cwt Golden.rain 79.53233 98.03233 114.19900 124.36566 Marvellous 86.19900 108.03233 116.69900 126.36566 Victory 69.77324 89.19900 110.36566 118.03233 [[2]] [[2]]$N N 0.0cwt 0.2cwt 0.4cwt 0.6cwt 17 18 18 18 [[2]]$`V:N` N V 0.0cwt 0.2cwt 0.4cwt 0.6cwt Golden.rain 6 6 6 6 Marvellous 6 6 6 6 Victory 5 6 6 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist34# #argv <- list(itemBullet = '• ');list(argv[[1]]); [[1]] [1] "• " ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist35# #argv <- list(class = 'try-error', condition = structure(list(message = 'more columns than column names', call = quote(read.table('foo6', header = TRUE))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition')));list(argv[[1]],argv[[2]]); [[1]] [1] "try-error" [[2]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist36# #argv <- list(name = 'list', objs = structure(list(`package:base` = .Primitive('list'), .Primitive('list')), .Names = c('package:base', '')), where = c('package:base', 'namespace:base'), visible = c(TRUE, FALSE), dups = c(FALSE, TRUE));list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]]); [[1]] [1] "list" [[2]] [[2]]$`package:base` function (...) .Primitive("list") [[2]][[2]] function (...) .Primitive("list") [[3]] [1] "package:base" "namespace:base" [[4]] [1] TRUE FALSE [[5]] [1] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist37# #argv <- list(structure(-1.81670076485116, .Names = '5%'), structure(c(-0.569903669351869, -3.58817618394987, 1.7002237104195, 0.247262299686774, -1.6099565644337, -0.117004990933267, 2.26201852051082, 1.27765184061634, -0.585159452768219, 0.777745165779344, -0.299055554574658, -0.10613560158199, -0.96347850905908, 2.01298478288055, -0.65898967614864, 0.497719980170775, 0.113843920033269, -0.766958149949393, 3.9222560854539, -0.936533336103743, 0.287536526568389, -1.36853788163704, 0.875060974238616, 6.63795852562496, -1.7181964535622, -1.84566355665129, -2.51563250429738, -0.197885450775488, 0.343408036526242, 0.0203380393884578, 0.207160904400713, 0.869565410777187, -0.815315222368209, -0.0998963343276999, 0.656114271672876, 1.27566552196184, 0.0658788246994603, -1.69200573781689, -0.0369929356350034, -0.342061734014624, 0.31798622848054, -1.52242182038666, -1.33617654990952, 0.0175687049379899, -0.093090859182165, -0.0507330478224399, -0.431715933999334, 0.37428759377223, -1.51710077889452, 0.148230661369186, 0.214909263767934, 0.178494903424769, -2.69339417614172, 0.644025806665703, -0.287978582462478, 3.36345700350871, 1.39656784449323, -0.344866954524567, -0.270662469024608, -1.32424067954204), .Dim = 60L, .Dimnames = list(c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'))), c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L));list(argv[[1]],argv[[2]],argv[[3]]); [[1]] 5% -1.816701 [[2]] 1 1 1 1 1 1 -0.56990367 -3.58817618 1.70022371 0.24726230 -1.60995656 -0.11700499 1 1 1 1 1 1 2.26201852 1.27765184 -0.58515945 0.77774517 -0.29905555 -0.10613560 1 1 1 1 1 1 -0.96347851 2.01298478 -0.65898968 0.49771998 0.11384392 -0.76695815 1 1 1 1 1 1 3.92225609 -0.93653334 0.28753653 -1.36853788 0.87506097 6.63795853 1 1 1 1 1 1 -1.71819645 -1.84566356 -2.51563250 -0.19788545 0.34340804 0.02033804 1 1 1 1 1 1 0.20716090 0.86956541 -0.81531522 -0.09989633 0.65611427 1.27566552 1 1 1 1 1 1 0.06587882 -1.69200574 -0.03699294 -0.34206173 0.31798623 -1.52242182 1 1 1 1 1 1 -1.33617655 0.01756870 -0.09309086 -0.05073305 -0.43171593 0.37428759 1 1 1 1 1 1 -1.51710078 0.14823066 0.21490926 0.17849490 -2.69339418 0.64402581 1 1 1 1 1 1 -0.28797858 3.36345700 1.39656784 -0.34486695 -0.27066247 -1.32424068 [[3]] [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 [39] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist38# #argv <- list(srcfile = '/home/lzhao/hg/r-instrumented/library/utils/R/utils', frow = 1271L, lrow = 1273L);list(argv[[1]],argv[[2]],argv[[3]]); [[1]] [1] "/home/lzhao/hg/r-instrumented/library/utils/R/utils" [[2]] [1] 1271 [[3]] [1] 1273 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist39# #argv <- list(structure(list(srcfile = c('/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils'), frow = c(6889L, 6893L, 6897L, 6901L, 6902L, 6903L, 6903L, 6917L, 6918L, 6919L, 6919L, 6927L, 6928L), lrow = c(6889L, 6893L, 6900L, 6901L, 6902L, 6903L, 6903L, 6917L, 6918L, 6919L, 6919L, 6927L, 6928L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 13L), class = 'data.frame'), structure(list( srcfile = '/home/lzhao/hg/r-instrumented/library/utils/R/utils', frow = 6928L, lrow = 6928L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L), class = 'data.frame'));list(argv[[1]],argv[[2]]); [[1]] srcfile frow lrow 1 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6889 6889 2 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6893 6893 3 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6897 6900 4 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6901 6901 5 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6902 6902 6 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6903 6903 7 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6903 6903 8 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6917 6917 9 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6918 6918 10 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6919 6919 11 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6919 6919 12 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6927 6927 13 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6928 6928 [[2]] srcfile frow lrow 1 /home/lzhao/hg/r-instrumented/library/utils/R/utils 6928 6928 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist4# #argv <- list(class = 'try-error', condition = structure(list(message = 'line 1 did not have 4 elements', call = quote(scan(file, what, nmax, sep, dec, quote, skip, nlines, na.strings, flush, fill, strip.white, quiet, blank.lines.skip, multi.line, comment.char, allowEscapes, encoding))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition')));list(argv[[1]],argv[[2]]); [[1]] [1] "try-error" [[2]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist40# #argv <- list(x = c(190, 118, 149, 313, NA, NA, 299, 99, 19, 194, NA, 256, 290, 274, 65, 334, 307, 78, 322, 44, 8, 320, 25, 92, 66, 266, NA, 13, 252, 223, 279, 286, 287, 242, 186, 220, 264, 127, 273, 291, 323, 259, 250, 148, 332, 322, 191, 284, 37, 120, 137, 150, 59, 91, 250, 135, 127, 47, 98, 31, 138, 269, 248, 236, 101, 175, 314, 276, 267, 272, 175, 139, 264, 175, 291, 48, 260, 274, 285, 187, 220, 7, 258, 295, 294, 223, 81, 82, 213, 275, 253, 254, 83, 24, 77, NA, NA, NA, 255, 229, 207, 222, 137, 192, 273, 157, 64, 71, 51, 115, 244, 190, 259, 36, 255, 212, 238, 215, 153, 203, 225, 237, 188, 167, 197, 183, 189, 95, 92, 252, 220, 230, 259, 236, 259, 238, 24, 112, 237, 224, 27, 238, 201, 238, 14, 139, 49, 20, 193, 145, 191, 131, 223), y = c(7.4, 8, 12.6, 11.5, 14.3, 14.9, 8.6, 13.8, 20.1, 8.6, 6.9, 9.7, 9.2, 10.9, 13.2, 11.5, 12, 18.4, 11.5, 9.7, 9.7, 16.6, 9.7, 12, 16.6, 14.9, 8, 12, 14.9, 5.7, 7.4, 8.6, 9.7, 16.1, 9.2, 8.6, 14.3, 9.7, 6.9, 13.8, 11.5, 10.9, 9.2, 8, 13.8, 11.5, 14.9, 20.7, 9.2, 11.5, 10.3, 6.3, 1.7, 4.6, 6.3, 8, 8, 10.3, 11.5, 14.9, 8, 4.1, 9.2, 9.2, 10.9, 4.6, 10.9, 5.1, 6.3, 5.7, 7.4, 8.6, 14.3, 14.9, 14.9, 14.3, 6.9, 10.3, 6.3, 5.1, 11.5, 6.9, 9.7, 11.5, 8.6, 8, 8.6, 12, 7.4, 7.4, 7.4, 9.2, 6.9, 13.8, 7.4, 6.9, 7.4, 4.6, 4, 10.3, 8, 8.6, 11.5, 11.5, 11.5, 9.7, 11.5, 10.3, 6.3, 7.4, 10.9, 10.3, 15.5, 14.3, 12.6, 9.7, 3.4, 8, 5.7, 9.7, 2.3, 6.3, 6.3, 6.9, 5.1, 2.8, 4.6, 7.4, 15.5, 10.9, 10.3, 10.9, 9.7, 14.9, 15.5, 6.3, 10.9, 11.5, 6.9, 13.8, 10.3, 10.3, 8, 12.6, 9.2, 10.3, 10.3, 16.6, 6.9, 13.2, 14.3, 8, 11.5), xlab = NULL, ylab = NULL);list(argv[[1]],argv[[2]],argv[[3]],argv[[4]]); [[1]] [1] 190 118 149 313 NA NA 299 99 19 194 NA 256 290 274 65 334 307 78 [19] 322 44 8 320 25 92 66 266 NA 13 252 223 279 286 287 242 186 220 [37] 264 127 273 291 323 259 250 148 332 322 191 284 37 120 137 150 59 91 [55] 250 135 127 47 98 31 138 269 248 236 101 175 314 276 267 272 175 139 [73] 264 175 291 48 260 274 285 187 220 7 258 295 294 223 81 82 213 275 [91] 253 254 83 24 77 NA NA NA 255 229 207 222 137 192 273 157 64 71 [109] 51 115 244 190 259 36 255 212 238 215 153 203 225 237 188 167 197 183 [127] 189 95 92 252 220 230 259 236 259 238 24 112 237 224 27 238 201 238 [145] 14 139 49 20 193 145 191 131 223 [[2]] [1] 7.4 8.0 12.6 11.5 14.3 14.9 8.6 13.8 20.1 8.6 6.9 9.7 9.2 10.9 13.2 [16] 11.5 12.0 18.4 11.5 9.7 9.7 16.6 9.7 12.0 16.6 14.9 8.0 12.0 14.9 5.7 [31] 7.4 8.6 9.7 16.1 9.2 8.6 14.3 9.7 6.9 13.8 11.5 10.9 9.2 8.0 13.8 [46] 11.5 14.9 20.7 9.2 11.5 10.3 6.3 1.7 4.6 6.3 8.0 8.0 10.3 11.5 14.9 [61] 8.0 4.1 9.2 9.2 10.9 4.6 10.9 5.1 6.3 5.7 7.4 8.6 14.3 14.9 14.9 [76] 14.3 6.9 10.3 6.3 5.1 11.5 6.9 9.7 11.5 8.6 8.0 8.6 12.0 7.4 7.4 [91] 7.4 9.2 6.9 13.8 7.4 6.9 7.4 4.6 4.0 10.3 8.0 8.6 11.5 11.5 11.5 [106] 9.7 11.5 10.3 6.3 7.4 10.9 10.3 15.5 14.3 12.6 9.7 3.4 8.0 5.7 9.7 [121] 2.3 6.3 6.3 6.9 5.1 2.8 4.6 7.4 15.5 10.9 10.3 10.9 9.7 14.9 15.5 [136] 6.3 10.9 11.5 6.9 13.8 10.3 10.3 8.0 12.6 9.2 10.3 10.3 16.6 6.9 13.2 [151] 14.3 8.0 11.5 [[3]] NULL [[4]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist41# #argv <- list(properties = structure(list(.Data = 'numeric', comment = 'character'), .Names = c('.Data', 'comment')), prototype = structure(3.14159265358979, comment = 'Start with pi'));list(argv[[1]],argv[[2]]); [[1]] [[1]]$.Data [1] "numeric" [[1]]$comment [1] "character" [[2]] [1] 3.141593 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist42# #argv <- list(structure(c(NA, NA, FALSE), .Names = c('perm', 'LDL', 'super')));list(argv[[1]]); [[1]] perm LDL super NA NA FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist43# #argv <- list(raster = structure('#000000', .Dim = c(1L, 1L), class = 'r_raster'), x = structure(0, unit = 'npc', valid.unit = 0L, class = 'r_unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'r_unit'), width = NULL, height = NULL, just = 'centre', hjust = NULL, vjust = NULL, interpolate = TRUE, name = NULL, gp = structure(list(), class = 'r_gpar'), vp = NULL);list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]],argv[[6]],argv[[7]],argv[[8]],argv[[9]],argv[[10]],argv[[11]],argv[[12]]); [[1]] [,1] [1,] "#000000" attr(,"class") [1] "r_raster" [[2]] [1] 0 attr(,"unit") [1] "npc" attr(,"valid.unit") [1] 0 attr(,"class") [1] "r_unit" [[3]] [1] 0.5 attr(,"unit") [1] "npc" attr(,"valid.unit") [1] 0 attr(,"class") [1] "r_unit" [[4]] NULL [[5]] NULL [[6]] [1] "centre" [[7]] NULL [[8]] NULL [[9]] [1] TRUE [[10]] NULL [[11]] list() attr(,"class") [1] "r_gpar" [[12]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist44# #argv <- list(trace = 0, fnscale = 1, parscale = 1, ndeps = 0.001, maxit = 100L, abstol = -Inf, reltol = 1.49011611938477e-08, alpha = 1, beta = 0.5, gamma = 2, REPORT = 10, type = 1, lmm = 5, factr = 1e+07, pgtol = 0, tmax = 10, temp = 10);list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]],argv[[6]],argv[[7]],argv[[8]],argv[[9]],argv[[10]],argv[[11]],argv[[12]],argv[[13]],argv[[14]],argv[[15]],argv[[16]],argv[[17]]); [[1]] [1] 0 [[2]] [1] 1 [[3]] [1] 1 [[4]] [1] 0.001 [[5]] [1] 100 [[6]] [1] -Inf [[7]] [1] 1.490116e-08 [[8]] [1] 1 [[9]] [1] 0.5 [[10]] [1] 2 [[11]] [1] 10 [[12]] [1] 1 [[13]] [1] 5 [[14]] [1] 1e+07 [[15]] [1] 0 [[16]] [1] 10 [[17]] [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist45#Output.IgnoreWhitespace# #argv <- list(error = function (...) {});list(argv[[1]]); [[1]] function (...) {} ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist46# #argv <- list(structure(list(srcfile = c(NA, '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R'), frow = c(NA, 832L, 833L, 834L, 842L, 845L, 845L, 849L, 858L, 860L, 862L, 863L), lrow = c(NA, 832L, 833L, 834L, 842L, 846L, 846L, 851L, 859L, 860L, 862L, 863L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 12L), class = 'data.frame'), structure(list( srcfile = '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R', frow = 863L, lrow = 863L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L), class = 'data.frame'));list(argv[[1]],argv[[2]]); [[1]] srcfile frow lrow 1 NA NA 2 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 832 832 3 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 833 833 4 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 834 834 5 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 842 842 6 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 845 846 7 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 845 846 8 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 849 851 9 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 858 859 10 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 860 860 11 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 862 862 12 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 863 863 [[2]] srcfile frow lrow 1 /home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/lmList.R 863 863 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist48# #argv <- list(structure(list(Month = c(5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L)), .Names = 'Month', class = 'data.frame', row.names = c(1L, 2L, 3L, 4L, 6L, 7L, 8L, 9L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 28L, 29L, 30L, 31L, 38L, 40L, 41L, 44L, 47L, 48L, 49L, 50L, 51L, 62L, 63L, 64L, 66L, 67L, 68L, 69L, 70L, 71L, 73L, 74L, 76L, 77L, 78L, 79L, 80L, 81L, 82L, 85L, 86L, 87L, 88L, 89L, 90L, 91L, 92L, 93L, 94L, 95L, 96L, 97L, 98L, 99L, 100L, 101L, 104L, 105L, 106L, 108L, 109L, 110L, 111L, 112L, 113L, 114L, 116L, 117L, 118L, 120L, 121L, 122L, 123L, 124L, 125L, 126L, 127L, 128L, 129L, 130L, 131L, 132L, 133L, 134L, 135L, 136L, 137L, 138L, 139L, 140L, 141L, 142L, 143L, 144L, 145L, 146L, 147L, 148L, 149L, 151L, 152L, 153L)));list(argv[[1]]); [[1]] Month 1 5 2 5 3 5 4 5 6 5 7 5 8 5 9 5 11 5 12 5 13 5 14 5 15 5 16 5 17 5 18 5 19 5 20 5 21 5 22 5 23 5 24 5 28 5 29 5 30 5 31 5 38 6 40 6 41 6 44 6 47 6 48 6 49 6 50 6 51 6 62 7 63 7 64 7 66 7 67 7 68 7 69 7 70 7 71 7 73 7 74 7 76 7 77 7 78 7 79 7 80 7 81 7 82 7 85 7 86 7 87 7 88 7 89 7 90 7 91 7 92 7 93 8 94 8 95 8 96 8 97 8 98 8 99 8 100 8 101 8 104 8 105 8 106 8 108 8 109 8 110 8 111 8 112 8 113 8 114 8 116 8 117 8 118 8 120 8 121 8 122 8 123 8 124 9 125 9 126 9 127 9 128 9 129 9 130 9 131 9 132 9 133 9 134 9 135 9 136 9 137 9 138 9 139 9 140 9 141 9 142 9 143 9 144 9 145 9 146 9 147 9 148 9 149 9 151 9 152 9 153 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist49# #argv <- list(structure(list(stats = c(7, 35, 60, 80, 135), n = 26L, conf = c(46.0561427916751, 73.9438572083249), out = integer(0)), .Names = c('stats', 'n', 'conf', 'out')));list(argv[[1]]); [[1]] [[1]]$stats [1] 7 35 60 80 135 [[1]]$n [1] 26 [[1]]$conf [1] 46.05614 73.94386 [[1]]$out integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist5# #argv <- list(structure(list(Hair = structure(c(1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('Black', 'Brown', 'Red', 'Blond'), class = 'factor'), Eye = structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L), .Label = c('Brown', 'Blue', 'Hazel', 'Green'), class = 'factor'), Sex = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Male', 'Female'), class = 'factor')), .Names = c('Hair', 'Eye', 'Sex'), out.attrs = structure(list(dim = structure(c(4L, 4L, 2L), .Names = c('Hair', 'Eye', 'Sex')), dimnames = structure(list(Hair = c('Hair=Black', 'Hair=Brown', 'Hair=Red', 'Hair=Blond'), Eye = c('Eye=Brown', 'Eye=Blue', 'Eye=Hazel', 'Eye=Green'), Sex = c('Sex=Male', 'Sex=Female')), .Names = c('Hair', 'Eye', 'Sex'))), .Names = c('dim', 'dimnames')), class = 'data.frame', row.names = c(NA, -32L)), Fr = c(32, 53, 10, 3, 11, 50, 10, 30, 10, 25, 7, 5, 3, 15, 7, 8, 36, 66, 16, 4, 9, 34, 7, 64, 5, 29, 7, 5, 2, 14, 7, 8));list(argv[[1]],argv[[2]]); [[1]] Hair Eye Sex 1 Black Brown Male 2 Brown Brown Male 3 Red Brown Male 4 Blond Brown Male 5 Black Blue Male 6 Brown Blue Male 7 Red Blue Male 8 Blond Blue Male 9 Black Hazel Male 10 Brown Hazel Male 11 Red Hazel Male 12 Blond Hazel Male 13 Black Green Male 14 Brown Green Male 15 Red Green Male 16 Blond Green Male 17 Black Brown Female 18 Brown Brown Female 19 Red Brown Female 20 Blond Brown Female 21 Black Blue Female 22 Brown Blue Female 23 Red Blue Female 24 Blond Blue Female 25 Black Hazel Female 26 Brown Hazel Female 27 Red Hazel Female 28 Blond Hazel Female 29 Black Green Female 30 Brown Green Female 31 Red Green Female 32 Blond Green Female [[2]] [1] 32 53 10 3 11 50 10 30 10 25 7 5 3 15 7 8 36 66 16 4 9 34 7 64 5 [26] 29 7 5 2 14 7 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist50# #argv <- list('‘', 'Matrix', '’');list(argv[[1]],argv[[2]],argv[[3]]); [[1]] [1] "‘" [[2]] [1] "Matrix" [[3]] [1] "’" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist51#Output.IgnoreWhitespace# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));list(argv[[1]]); [[1]] [1] 3.141593 attr(,"class") [1] "3.14159265358979" attr(,"class") [1] "testit" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist52# #argv <- list(structure(1386392034.50546, class = c('POSIXct', 'POSIXt')));list(argv[[1]]); [[1]] [1] "2013-12-07 04:53:54 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist53# #argv <- list(structure(list(sec = 54.5054557323456, min = 53L, hour = 23L, mday = 6L, mon = 11L, year = 113L, wday = 5L, yday = 339L, isdst = 0L), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')));list(argv[[1]]); [[1]] [1] "2013-12-06 23:53:54 EST" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist54# #argv <- list(values = c(0.266917355843816, 0.00557315714782281, 0.00229578896250102, 0.000615239459643172, 8.19421206363694e-05), vectors = structure(c(-0.452472222108953, -0.386550651250976, -0.453293999783174, -0.439775552409852, -0.496960255453506, -0.157430201026812, 0.910628681750865, -0.204120426456847, -0.072367418669335, -0.314752194584169, 0.437863914035591, 0.0975567326834968, -0.370843683888789, -0.67178336056532, 0.458192050652246, 0.752103796361061, -0.0893037594956476, 0.0198033027727173, 0.0214021063919376, -0.652314722415877, 0.114453887261006, -0.0619800003080987, -0.784182499538679, 0.591277842073673, 0.136040832629847), .Dim = c(5L, 5L)));list(argv[[1]],argv[[2]]); [[1]] [1] 2.669174e-01 5.573157e-03 2.295789e-03 6.152395e-04 8.194212e-05 [[2]] [,1] [,2] [,3] [,4] [,5] [1,] -0.4524722 -0.15743020 0.43786391 0.75210380 0.1144539 [2,] -0.3865507 0.91062868 0.09755673 -0.08930376 -0.0619800 [3,] -0.4532940 -0.20412043 -0.37084368 0.01980330 -0.7841825 [4,] -0.4397756 -0.07236742 -0.67178336 0.02140211 0.5912778 [5,] -0.4969603 -0.31475219 0.45819205 -0.65231472 0.1360408 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist55# #argv <- list(object = c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));list(argv[[1]]); [[1]] [1] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [6] 1.753688e-134 0.000000e+00 0.000000e+00 0.000000e+00 2.604776e-251 [11] 1.164850e-260 0.000000e+00 1.531604e-322 3.333314e-01 0.000000e+00 [16] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [21] 0.000000e+00 0.000000e+00 0.000000e+00 3.441613e-123 0.000000e+00 [26] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [31] 0.000000e+00 0.000000e+00 0.000000e+00 1.968812e-173 0.000000e+00 [36] 8.235997e-150 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [41] 6.517332e-10 0.000000e+00 2.368402e-67 0.000000e+00 9.434841e-307 [46] 0.000000e+00 1.599599e-89 0.000000e+00 8.738369e-286 7.097162e-54 [51] 0.000000e+00 0.000000e+00 0.000000e+00 1.530425e-274 8.575901e-14 [56] 3.333331e-01 0.000000e+00 0.000000e+00 1.368952e-199 2.022610e-177 [61] 5.504454e-42 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [66] 1.078464e-44 1.886055e-186 1.091561e-26 0.000000e+00 3.070288e-124 [71] 3.333332e-01 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [76] 0.000000e+00 0.000000e+00 3.098161e-94 0.000000e+00 0.000000e+00 [81] 4.752273e-272 0.000000e+00 0.000000e+00 2.300933e-06 0.000000e+00 [86] 0.000000e+00 1.270828e-274 0.000000e+00 0.000000e+00 0.000000e+00 [91] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 4.566203e-65 [96] 0.000000e+00 2.779959e-149 0.000000e+00 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist56# #argv <- list(class = 'data.frame', row.names = c(NA, 32L));list(argv[[1]],argv[[2]]); [[1]] [1] "data.frame" [[2]] [1] NA 32 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist57# #argv <- list(structure(list(srcfile = c('/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R'), frow = 164:165, lrow = c(164L, 169L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2, class = 'data.frame'), structure(list(srcfile = '/home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R', frow = 170L, lrow = 177L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L), class = 'data.frame'));list(argv[[1]],argv[[2]]); [[1]] srcfile frow lrow 1 /home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R 164 164 2 /home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R 165 169 [[2]] srcfile frow lrow 1 /home/lzhao/tmp/Rtmpe5iuYI/R.INSTALL2aa854a74188/foreign/R/spss.R 170 177 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist58# #argv <- list(structure(FALSE, .Names = 'Series 1', .Tsp = c(0, 0, 1), class = 'ts'), structure(FALSE, .Names = 'Series 1', .Tsp = c(1, 1, 1), class = 'ts'));list(argv[[1]],argv[[2]]); [[1]] Time Series: Start = 0 End = 0 Frequency = 1 Series 1 FALSE [[2]] Time Series: Start = 1 End = 1 Frequency = 1 Series 1 FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist59# #argv <- list(structure(FALSE, .Tsp = c(1, 1, 1), class = 'ts'), structure(FALSE, .Tsp = c(1, 1, 1), class = 'ts'));list(argv[[1]],argv[[2]]); [[1]] Time Series: Start = 1 End = 1 Frequency = 1 [1] FALSE [[2]] Time Series: Start = 1 End = 1 Frequency = 1 [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist6# #argv <- list(deviance.resid = structure(c(0.979005810350303, 0.190415231217834, -0.262041786489909, -1.18856115310823, -0.0713326116251696, 0.258231444611709, 0.637403312181204, -1.72855514890285, -0.632723785156881, -0.819071604478243, 2.23780874325045, -0.472376375886729), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')), coefficients = structure(c(0.291009862544455, -0.575062166945441, 0.0881289026086606, 0.127412648101879, 3.30209334202984, -4.5133836829576, 0.00095966129066828, 6.38014475989249e-06), .Dim = c(2L, 4L), .Dimnames = list(c('(Intercept)', 'M.userY'), c('Estimate', 'Std. Error', 'z value', 'Pr(>|z|)'))), aliased = structure(c(FALSE, FALSE), .Names = c('(Intercept)', 'M.userY')), dispersion = 1, df = c(2L, 10L, 2L), cov.unscaled = structure(c(0.00776670347500679, -0.00776670347500679, -0.00776670347500679, 0.0162339828963334), .Dim = c(2L, 2L), .Dimnames = list(c('(Intercept)', 'M.userY'), c('(Intercept)', 'M.userY'))), cov.scaled = structure(c(0.00776670347500679, -0.00776670347500679, -0.00776670347500679, 0.0162339828963334), .Dim = c(2L, 2L), .Dimnames = list(c('(Intercept)', 'M.userY'), c('(Intercept)', 'M.userY'))));list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]],argv[[6]],argv[[7]]); [[1]] 1 3 5 7 9 11 0.97900581 0.19041523 -0.26204179 -1.18856115 -0.07133261 0.25823144 13 15 17 19 21 23 0.63740331 -1.72855515 -0.63272379 -0.81907160 2.23780874 -0.47237638 [[2]] Estimate Std. Error z value Pr(>|z|) (Intercept) 0.2910099 0.0881289 3.302093 9.596613e-04 M.userY -0.5750622 0.1274126 -4.513384 6.380145e-06 [[3]] (Intercept) M.userY FALSE FALSE [[4]] [1] 1 [[5]] [1] 2 10 2 [[6]] (Intercept) M.userY (Intercept) 0.007766703 -0.007766703 M.userY -0.007766703 0.016233983 [[7]] (Intercept) M.userY (Intercept) 0.007766703 -0.007766703 M.userY -0.007766703 0.016233983 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist60# #argv <- list(Depends = structure(logical(0), .Dim = c(0L, 3L)), Installed = structure(logical(0), .Dim = c(0L, 3L)), R = structure(logical(0), .Dim = c(0L, 3L)));list(argv[[1]],argv[[2]],argv[[3]]); [[1]] [,1] [,2] [,3] [[2]] [,1] [,2] [,3] [[3]] [,1] [,2] [,3] ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist61# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = c(12L, 1L), .Dimnames = structure(list(` p L s` = c('. . .', '| . .', '. | .', '| | .', '. . |', '| . |', '. | |', '| | |', '. . ?', '| . ?', '. | ?', '| | ?'), NULL), .Names = c(' p L s', ''))));list(argv[[1]]); [[1]] p L s [,1] . . . TRUE | . . TRUE . | . TRUE | | . TRUE . . | TRUE | . | TRUE . | | TRUE | | | TRUE . . ? TRUE | . ? TRUE . | ? TRUE | | ? TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist62# #argv <- list(values = c(-2572.90550008339+0i, -915.064609071159+0i, -456.632018115023+0i, 419.980933101553+0i, -366.745362912885+0i, -308.301779528581+0i, -258.104614655539+0i, -208.43876984087+0i, -174.152165416129+0i, 166.131403923756+0i, -153.932564395224+31.248756965275i, -153.932564395224-31.248756965275i, -145.261798316303+0i, -140.969649074553+0i, -109.026224585292+37.27313202252i, -109.026224585292-37.27313202252i, -95.4200045428049+0i, -94.2845517186135+0i, 93.6287479850051+0i, -83.7083948970612+39.7221174209657i, -83.7083948970612-39.7221174209657i, -89.7405335285911+14.6972603541884i, -89.7405335285911-14.6972603541884i, -90.4677652619726+0i, 80.9227484547009+0i, -79.2808369338756+0i, -67.7641499054793+34.4882180369511i, -67.7641499054793-34.4882180369511i, -74.7131802385517+0i, -72.7892236613541+0i, -70.8748882290923+0i, -65.326216345093+24.6325729497989i, -65.326216345093-24.6325729497989i, -65.6613463045206+12.2012477360608i, -65.6613463045206-12.2012477360608i, -64.009437139127+0i, -53.8555784147338+28.3814233344012i, -53.8555784147338-28.3814233344012i, -60.372612826631+0i, -55.598407412763+0i, -53.8337490558365+13.1765372798343i, -53.8337490558365-13.1765372798343i, -48.7010835501729+24.5244827641945i, -48.7010835501729-24.5244827641945i, -51.620171425175+0i, -49.1047272072286+7.0804434036442i, -49.1047272072286-7.0804434036442i, -44.0755122578262+21.8965512206582i, -44.0755122578262-21.8965512206582i, -47.6686025497685+0i, -47.0350049752776+0i, 43.2054741656531+0i, -42.0546965543942+0i, -41.4311176038551+0i, -36.4574226401686+16.1634950480082i, -36.4574226401686-16.1634950480082i, -39.2901755793811+0i, -36.5376333751307+11.2152902727145i, -36.5376333751307-11.2152902727145i, -38.0398197891428+0i, -32.9946255929378+12.9867445602001i, -32.9946255929378-12.9867445602001i, -34.7321001383969+0i, -32.0667502593492+12.342590095597i, -32.0667502593492-12.342590095597i, -27.2830437098322+11.6992356475951i, -27.2830437098322-11.6992356475951i, -29.1247671355682+2.0847233845627i, -29.1247671355682-2.0847233845627i, -28.1216021055426+0i, -27.0745572919711+0i, 26.1565478253913+0i, -23.4210302095847+1.8723763695687i, -23.4210302095847-1.8723763695687i, 20.782836979896+0i, 16.5058357149619+0i, -15.9316203363047+0i, 13.2377600042936+0i, -11.9119569568831+0i, -11.1832867499603+0i, 8.99100195370794+0i, 7.62805946796798+0i, -7.44159556589097+0i, -6.46699019595805+0i, 5.57838460483725+0i, 5.07382264677001+0i, -4.77172378340461+0i, 4.21976444063592+0i, -2.86123099075901+0i, -2.69814683135512+0i, -2.29820560404041+0i, 2.05951624519943+0i, -1.8306332549612+0i, 1.66021670517454+0i, 1.03505989993491+0i, -0.773887754953459+0i, -0.416100454072758+0i, 0.213086170361661+0i, -3.42336062193255e-06+0i, 3.42336057523814e-06+0i), vectors = NULL);list(argv[[1]],argv[[2]]); [[1]] [1] -2.572906e+03+0.000000e+00i -9.150646e+02+0.000000e+00i [3] -4.566320e+02+0.000000e+00i 4.199809e+02+0.000000e+00i [5] -3.667454e+02+0.000000e+00i -3.083018e+02+0.000000e+00i [7] -2.581046e+02+0.000000e+00i -2.084388e+02+0.000000e+00i [9] -1.741522e+02+0.000000e+00i 1.661314e+02+0.000000e+00i [11] -1.539326e+02+3.124876e+01i -1.539326e+02-3.124876e+01i [13] -1.452618e+02+0.000000e+00i -1.409696e+02+0.000000e+00i [15] -1.090262e+02+3.727313e+01i -1.090262e+02-3.727313e+01i [17] -9.542000e+01+0.000000e+00i -9.428455e+01+0.000000e+00i [19] 9.362875e+01+0.000000e+00i -8.370839e+01+3.972212e+01i [21] -8.370839e+01-3.972212e+01i -8.974053e+01+1.469726e+01i [23] -8.974053e+01-1.469726e+01i -9.046777e+01+0.000000e+00i [25] 8.092275e+01+0.000000e+00i -7.928084e+01+0.000000e+00i [27] -6.776415e+01+3.448822e+01i -6.776415e+01-3.448822e+01i [29] -7.471318e+01+0.000000e+00i -7.278922e+01+0.000000e+00i [31] -7.087489e+01+0.000000e+00i -6.532622e+01+2.463257e+01i [33] -6.532622e+01-2.463257e+01i -6.566135e+01+1.220125e+01i [35] -6.566135e+01-1.220125e+01i -6.400944e+01+0.000000e+00i [37] -5.385558e+01+2.838142e+01i -5.385558e+01-2.838142e+01i [39] -6.037261e+01+0.000000e+00i -5.559841e+01+0.000000e+00i [41] -5.383375e+01+1.317654e+01i -5.383375e+01-1.317654e+01i [43] -4.870108e+01+2.452448e+01i -4.870108e+01-2.452448e+01i [45] -5.162017e+01+0.000000e+00i -4.910473e+01+7.080443e+00i [47] -4.910473e+01-7.080443e+00i -4.407551e+01+2.189655e+01i [49] -4.407551e+01-2.189655e+01i -4.766860e+01+0.000000e+00i [51] -4.703500e+01+0.000000e+00i 4.320547e+01+0.000000e+00i [53] -4.205470e+01+0.000000e+00i -4.143112e+01+0.000000e+00i [55] -3.645742e+01+1.616350e+01i -3.645742e+01-1.616350e+01i [57] -3.929018e+01+0.000000e+00i -3.653763e+01+1.121529e+01i [59] -3.653763e+01-1.121529e+01i -3.803982e+01+0.000000e+00i [61] -3.299463e+01+1.298674e+01i -3.299463e+01-1.298674e+01i [63] -3.473210e+01+0.000000e+00i -3.206675e+01+1.234259e+01i [65] -3.206675e+01-1.234259e+01i -2.728304e+01+1.169924e+01i [67] -2.728304e+01-1.169924e+01i -2.912477e+01+2.084723e+00i [69] -2.912477e+01-2.084723e+00i -2.812160e+01+0.000000e+00i [71] -2.707456e+01+0.000000e+00i 2.615655e+01+0.000000e+00i [73] -2.342103e+01+1.872376e+00i -2.342103e+01-1.872376e+00i [75] 2.078284e+01+0.000000e+00i 1.650584e+01+0.000000e+00i [77] -1.593162e+01+0.000000e+00i 1.323776e+01+0.000000e+00i [79] -1.191196e+01+0.000000e+00i -1.118329e+01+0.000000e+00i [81] 8.991002e+00+0.000000e+00i 7.628059e+00+0.000000e+00i [83] -7.441596e+00+0.000000e+00i -6.466990e+00+0.000000e+00i [85] 5.578385e+00+0.000000e+00i 5.073823e+00+0.000000e+00i [87] -4.771724e+00+0.000000e+00i 4.219764e+00+0.000000e+00i [89] -2.861231e+00+0.000000e+00i -2.698147e+00+0.000000e+00i [91] -2.298206e+00+0.000000e+00i 2.059516e+00+0.000000e+00i [93] -1.830633e+00+0.000000e+00i 1.660217e+00+0.000000e+00i [95] 1.035060e+00+0.000000e+00i -7.738878e-01+0.000000e+00i [97] -4.161005e-01+0.000000e+00i 2.130862e-01+0.000000e+00i [99] -3.423361e-06+0.000000e+00i 3.423361e-06+0.000000e+00i [[2]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist63# #argv <- list(x = 2.28125, y = 1.70580465116279, xlab = NULL, ylab = NULL);list(argv[[1]],argv[[2]],argv[[3]],argv[[4]]); [[1]] [1] 2.28125 [[2]] [1] 1.705805 [[3]] NULL [[4]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist64# #argv <- list(fit = structure(numeric(0), .Dim = c(10L, 0L), constant = 0), se.fit = structure(numeric(0), .Dim = c(10L, 0L)), df = 10L, residual.scale = 0.523484262069588);list(argv[[1]],argv[[2]],argv[[3]],argv[[4]]); [[1]] [1,] [2,] [3,] [4,] [5,] [6,] [7,] [8,] [9,] [10,] attr(,"constant") [1] 0 [[2]] [1,] [2,] [3,] [4,] [5,] [6,] [7,] [8,] [9,] [10,] [[3]] [1] 10 [[4]] [1] 0.5234843 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist65#Output.IgnoreWhitespace# #argv <- list(ANY = structure(function (x, y = NULL) .Internal(crossprod(x, y)), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), generic = structure('crossprod', package = 'base'), class = structure('derivedDefaultMethod', package = 'methods')));list(argv[[1]]); [[1]] function (x, y = NULL) .Internal(crossprod(x, y)) attr(,"target") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"defined") x "ANY" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"package") [1] "methods" attr(,"generic") [1] "crossprod" attr(,"generic")attr(,"package") [1] "base" attr(,"class") [1] "derivedDefaultMethod" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist7# #argv <- list(class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rnorm(1, sd = Inf))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition')));list(argv[[1]],argv[[2]]); [[1]] [1] "try-error" [[2]] ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist8# #argv <- list(upper = quote(~M.user * Temp * Soft));list(argv[[1]]); [[1]] ~M.user * Temp * Soft ##com.oracle.truffle.r.test.builtins.TestBuiltin_list.testlist9# #argv <- list(label = '', x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'r_unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'r_unit'), just = 'centre', hjust = NULL, vjust = NULL, rot = 0, check.overlap = FALSE, name = NULL, gp = structure(list(), class = 'r_gpar'), vp = NULL);list(argv[[1]],argv[[2]],argv[[3]],argv[[4]],argv[[5]],argv[[6]],argv[[7]],argv[[8]],argv[[9]],argv[[10]],argv[[11]]); [[1]] [1] "" [[2]] [1] 0.5 attr(,"unit") [1] "npc" attr(,"valid.unit") [1] 0 attr(,"class") [1] "r_unit" [[3]] [1] 0.5 attr(,"unit") [1] "npc" attr(,"valid.unit") [1] 0 attr(,"class") [1] "r_unit" [[4]] [1] "centre" [[5]] NULL [[6]] NULL [[7]] [1] 0 [[8]] [1] FALSE [[9]] NULL [[10]] list() attr(,"class") [1] "r_gpar" [[11]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_list2env.testEmptyTarget# #{ e1 <- list2env(list(a = 1, b = 2), new.env()); c(e1$a, e1$b) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list2env.testEmptyTarget# #{ e1 <- list2env(list(a = 1, b = 2, a = 4), new.env()); c(e2$a, e2$b) } Error: object 'e2' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_list2env.testOverwriteTarget# #{ e1 <- list2env(list(a = 1, b = 2), new.env()); e2 <- list2env(list(b = 20, c = 30), e1); c(e2$a, e2$b, e2$c) } [1] 1 20 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_list2env.testOverwriteTarget# #{ e1 <- list2env(list(a = 1, b = 2, a = 4), new.env()); e2 <- list2env(list(b = 20, c = 30), e1); c(e2$a, e2$b, e2$c) } [1] 4 20 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_listdirs.testlistdirs1# #list.dirs('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data', full.names=F, recursive=F) [1] "tree1" "tree2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listdirs.testlistdirs1# #list.dirs('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data', full.names=F, recursive=T) [1] "" "tree1" "tree1/subdir" "tree2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listdirs.testlistdirs1# #list.dirs('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data', full.names=T, recursive=F) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1" [2] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listdirs.testlistdirs1# #list.dirs('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data', full.names=T, recursive=T) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data" [2] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1" [3] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/subdir" [4] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listdirs.testlistdirs1# #list.dirs('does-not-exist', full.names=F, recursive=F) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_listdirs.testlistdirs1# #wd <- getwd(); setwd('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple'); list.dirs('data', full.names=F, recursive=F); setwd(wd) [1] "tree1" "tree2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listdirs.testlistdirs1# #wd <- getwd(); setwd('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple'); list.dirs('data', full.names=F, recursive=T); setwd(wd) [1] "" "tree1" "tree1/subdir" "tree2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listdirs.testlistdirs1# #wd <- getwd(); setwd('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple'); list.dirs('data', full.names=T, recursive=F); setwd(wd) [1] "data/tree1" "data/tree2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listdirs.testlistdirs1# #wd <- getwd(); setwd('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple'); list.dirs('data', full.names=T, recursive=T); setwd(wd) [1] "data" "data/tree1" "data/tree1/subdir" [4] "data/tree2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testEmptyDir# #{ list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/empty_dir", all.files=TRUE, recursive=TRUE, no..=FALSE) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testEmptyDir# #{ list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/empty_dir", all.files=TRUE, recursive=TRUE, no..=FALSE, full.names=TRUE) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListing# #{ list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1") } [1] "bar.txt" "dummy.txt" "subdir" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListing# #{ list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", pattern=".*.tx") } [1] "bar.txt" "dummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListing# #{ list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", recursive=TRUE) } [1] "bar.txt" "dummy.txt" "subdir/subbar.txt" [4] "subdir/subdir.txt" "subdir/subdummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListing# #{ list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", recursive=TRUE, pattern=".*dummy.*") } [1] "dummy.txt" "subdir/subdummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListing# #{ list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", recursive=TRUE, pattern="dummy") } [1] "dummy.txt" "subdir/subdummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListing# #{ oldwd <- getwd(); setwd('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1'); print(list.files('subdir')); setwd(oldwd) } [1] "subbar.txt" "subdir.txt" "subdummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListingIncludesDotDot#Ignored.OutputFormatting# #{ sort(list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", all.files=TRUE)) } [1] "." ".." ".hidden.txt" "bar.txt" "dummy.txt" [6] "subdir" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListingIncludesDotDot#Ignored.OutputFormatting# #{ sort(list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", all.files=TRUE, no..=TRUE)) } [1] ".hidden.txt" "bar.txt" "dummy.txt" "subdir" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListingIncludesDotDot#Ignored.OutputFormatting# #{ sort(list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", all.files=TRUE, recursive=TRUE, no..=FALSE)) } [1] ".hidden.txt" "bar.txt" "dummy.txt" [4] "subdir/subbar.txt" "subdir/subdummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListingIncludesDotDot#Ignored.OutputFormatting# #{ sort(list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", all.files=TRUE, recursive=TRUE, no..=FALSE, full.names=TRUE)) } [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/.hidden.txt" [2] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/bar.txt" [3] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/dummy.txt" [4] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/subdir/subbar.txt" [5] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/subdir/subdummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListingIncludesDotDot#Ignored.OutputFormatting# #{ sort(list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", all.files=TRUE, recursive=TRUE, no..=FALSE, include.dirs=TRUE)) } [1] ".hidden.txt" "bar.txt" "dummy.txt" [4] "subdir" "subdir/subbar.txt" "subdir/subdummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListingIncludesDotDot#Ignored.OutputFormatting# #{ sort(list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", all.files=TRUE, recursive=TRUE, no..=TRUE)) } [1] ".hidden.txt" "bar.txt" "dummy.txt" [4] "subdir/subbar.txt" "subdir/subdummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListingUsingFilePatterns# #{ list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", pattern="$$$.txt") } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testFileListingUsingFilePatterns# #{ list.files("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1", pattern="*.txt") } [1] "bar.txt" "dummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testListNonExistingDir# #{ list.files("/tmp/some_crazy_directory_name", all.files=TRUE) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testlistfiles1# #argv <- list('.', 'myTst_.*tar\\.gz$', FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(list.files(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testlistfiles2# #argv <- list('./myTst/data', NULL, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(list.files(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testlistfiles3#Ignored.OutputFormatting# #argv <- list('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1', '^.*dummy.*', FALSE, FALSE, TRUE, FALSE, FALSE, FALSE); sort(.Internal(list.files(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]]))) [1] "dummy.txt" "subdir/subdummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_listfiles.testlistfiles4# #argv <- list('mgcv', NULL, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE); .Internal(list.files(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.test# #require(stats); lm(data = structure(list(y = c(43, 63, 71, 61, 81, 43, 58, 71, 72, 67, 64, 67, 69, 68, 77, 81, 74, 65, 65, 50, 50, 64, 53, 40, 63, 66, 82), x1 = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1), x2 = c(51, 64, 70, 63, 78, 55, 67, 75, 82, 61, 53, 60, 62, 83, 77, 90, 85, 60, 70, 58, 40, 61, 66, 37, 54, 77, 82), x3 = c(30, 51, 68, 45, 56, 49, 42, 50, 72, 45, 53, 47, 57, 83, 54, 50, 64, 65, 46, 68, 33, 52, 52, 42, 42, 66, 39), x4 = c(47, 45, 48, 39, 57, 69, 66, 50, 59, 45, 72, 50, 59, 44, 75, 39, 45, 62, 47, 74, 75, 67, 47, 58, 54, 66, 62), x5 = c(61, 63, 76, 54, 71, 54, 66, 70, 71, 62, 58, 59, 55, 59, 79, 60, 79, 55, 75, 64, 43, 66, 63, 50, 66, 88, 64), x6 = c(92, 73, 86, 84, 83, 49, 68, 66, 83, 80, 67, 74, 63, 77, 77, 54, 79, 80, 85, 78, 64, 80, 80, 57, 75, 76, 78), x7 = c(45, 47, 48, 35, 47, 34, 35, 41, 31, 41, 34, 41, 25, 35, 46, 36, 63, 60, 46, 52, 33, 41, 37, 49, 33, 72, 39)), .Names = c('y', 'x1', 'x2', 'x3', 'x4', 'x5', 'x6', 'x7'), row.names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '30'), class = 'data.frame'), formula = y ~ . + 0) Call: lm(formula = y ~ . + 0, data = structure(list(y = c(43, 63, 71, 61, 81, 43, 58, 71, 72, 67, 64, 67, 69, 68, 77, 81, 74, 65, 65, 50, 50, 64, 53, 40, 63, 66, 82), x1 = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1), x2 = c(51, 64, 70, 63, 78, 55, 67, 75, 82, 61, 53, 60, 62, 83, 77, 90, 85, 60, 70, 58, 40, 61, 66, 37, 54, 77, 82), x3 = c(30, 51, 68, 45, 56, 49, 42, 50, 72, 45, 53, 47, 57, 83, 54, 50, 64, 65, 46, 68, 33, 52, 52, 42, 42, 66, 39), x4 = c(47, 45, 48, 39, 57, 69, 66, 50, 59, 45, 72, 50, 59, 44, 75, 39, 45, 62, 47, 74, 75, 67, 47, 58, 54, 66, 62), x5 = c(61, 63, 76, 54, 71, 54, 66, 70, 71, 62, 58, 59, 55, 59, 79, 60, 79, 55, 75, 64, 43, 66, 63, 50, 66, 88, 64), x6 = c(92, 73, 86, 84, 83, 49, 68, 66, 83, 80, 67, 74, 63, 77, 77, 54, 79, 80, 85, 78, 64, 80, 80, 57, 75, 76, 78), x7 = c(45, 47, 48, 35, 47, 34, 35, 41, 31, 41, 34, 41, 25, 35, 46, 36, 63, 60, 46, 52, 33, 41, 37, 49, 33, 72, 39)), .Names = c("y", "x1", "x2", "x3", "x4", "x5", "x6", "x7"), row.names = c("1", "2", "3", "4", "5", "6", "7", "8", "9", "10", "11", "12", "13", "14", "15", "16", "17", "18", "19", "20", "21", "22", "23", "24", "25", "26", "30"), class = "data.frame")) Coefficients: x1 x2 x3 x4 x5 x6 x7 8.88053 0.79088 -0.09819 0.11563 -0.05525 0.11612 -0.08223 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.testlm1# #require(stats); ctl <- c(4.17,5.58,5.18,6.11,4.50,4.61,5.17,4.53,5.33,5.14); trt <- c(4.81,4.17,4.41,3.59,5.87,3.83,6.03,4.89,4.32,4.69); group <- gl(2,10,20, labels=c("Ctl","Trt")); weight <- c(ctl, trt); lm(formula = weight ~ group) Call: lm(formula = weight ~ group) Coefficients: (Intercept) groupTrt 5.032 -0.371 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.testlm112#Output.IgnoreErrorMessage# #require(stats);lm(formula = weight ~ group - 1) Error in eval(predvars, data, env) : object 'weight' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.testlm223#Output.IgnoreErrorMessage# #require(stats);lm(formula = weight ~ group, method = 'model.frame') Error in eval(predvars, data, env) : object 'weight' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.testlm334# #require(stats);lm(data = LifeCycleSavings, formula = sr ~ pop15 + pop75 + dpi + ddpi) Call: lm(formula = sr ~ pop15 + pop75 + dpi + ddpi, data = LifeCycleSavings) Coefficients: (Intercept) pop15 pop75 dpi ddpi 28.5660865 -0.4611931 -1.6914977 -0.0003369 0.4096949 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.testlm445# #require(stats);lm(data = attitude, formula = rating ~ .) Call: lm(formula = rating ~ ., data = attitude) Coefficients: (Intercept) complaints privileges learning raises critical 10.78708 0.61319 -0.07305 0.32033 0.08173 0.03838 advance -0.21706 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.testlm875# #require(stats); lm(data = mtcars, formula = 100/mpg ~ disp + hp + wt + am) Call: lm(formula = 100/mpg ~ disp + hp + wt + am, data = mtcars) Coefficients: (Intercept) disp hp wt am 0.740648 0.002703 0.005275 1.001303 0.155815 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.testlm876# #require(stats); lm(data = npk, formula = yield ~ block + N * P * K, singular.ok = TRUE) Call: lm(formula = yield ~ block + N * P * K, data = npk, singular.ok = TRUE) Coefficients: (Intercept) block2 block3 block4 block5 block6 51.8250 3.4250 6.7500 -3.9000 -3.5000 2.3250 N1 P1 K1 N1:P1 N1:K1 P1:K1 9.8500 0.4167 -1.9167 -3.7667 -4.7000 0.5667 N1:P1:K1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.testlm877# #require(stats); lm(data = npk, formula = yield ~ block, method = 'qr', qr = TRUE, singular.ok = TRUE) Call: lm(formula = yield ~ block, data = npk, method = "qr", qr = TRUE, singular.ok = TRUE) Coefficients: (Intercept) block2 block3 block4 block5 block6 54.025 3.425 6.750 -3.900 -3.500 2.325 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.testlm879# #require(stats); lm(data = npk, formula = yield ~ N + P + K + N:P + N:K + P:K + N:P:K, method = 'model.frame', singular.ok = TRUE) yield N P K 1 49.5 0 1 1 2 62.8 1 1 0 3 46.8 0 0 0 4 57.0 1 0 1 5 59.8 1 0 0 6 58.5 1 1 1 7 55.5 0 0 1 8 56.0 0 1 0 9 62.8 0 1 0 10 55.8 1 1 1 11 69.5 1 0 0 12 55.0 0 0 1 13 62.0 1 0 0 14 48.8 1 1 1 15 45.5 0 0 1 16 44.2 0 1 0 17 52.0 1 1 0 18 51.5 0 0 0 19 49.8 1 0 1 20 48.8 0 1 1 21 57.2 1 0 1 22 59.0 1 1 0 23 53.2 0 1 1 24 56.0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lm.testlm880#Output.IgnoreErrorMessage# #require(stats); lm(formula = y ~ x) Error in eval(predvars, data, env) : object 'y' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_loadInfoFromConn2.testLoadInfoFromConn2# #{ con <- rawConnection(raw(0), 'r+'); a <- 42; save('a', file=con, version=2); seek(con, 0); vi <- .Internal(loadInfoFromConn2(con)); vi$version; vi$writer_version; vi$min_reader_version; vi$format; vi$native_encoding } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_loadInfoFromConn2.testLoadInfoFromConn2# #{ con <- rawConnection(raw(0), 'r+'); a <- 42; save('a', file=con, version=3); seek(con, 0); vi <- .Internal(loadInfoFromConn2(con)); vi$version; vi$writer_version; vi$min_reader_version; vi$format; vi$native_encoding } [1] "UTF-8" ##com.oracle.truffle.r.test.builtins.TestBuiltin_loadInfoFromConn2.testToolsGetSerializationVersion# #{ f <- tempfile(fileext = '.rds'); saveRDS(42, f, version=2); as.integer(tools:::get_serialization_version(f)); } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_loadInfoFromConn2.testToolsGetSerializationVersion# #{ f <- tempfile(fileext = '.rds'); saveRDS(42, f, version=3); as.integer(tools:::get_serialization_version(f)); } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lockEnvironment.testlockEnvironment# #e <- new.env(); e$a <- 'foo'; lockEnvironment(e, 'a'); e$a <- 123 Error in e$a <- 123 : cannot change value of locked binding for 'a' ##com.oracle.truffle.r.test.builtins.TestBuiltin_lockEnvironment.testlockEnvironment# #e <- new.env(); e$a <- 'foo'; lockEnvironment(e, 'a'); e$b <- 123 Error in e$b <- 123 : cannot add bindings to a locked environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_lockEnvironment.testlockEnvironment# #e <- new.env(); e$a <- 'foo'; lockEnvironment(e, FALSE); e$a <- 123 ##com.oracle.truffle.r.test.builtins.TestBuiltin_lockEnvironment.testlockEnvironment# #e <- new.env(); e$a <- 'foo'; lockEnvironment(e, FALSE); e$b <- 123 Error in e$b <- 123 : cannot add bindings to a locked environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_lockEnvironment.testlockEnvironment#Ignored.MissingBuiltin# #e <- new.env(); e$a <- 'foo'; lockEnvironment(e, logical()); e$a <- 123 Error in e$a <- 123 : cannot change value of locked binding for 'a' ##com.oracle.truffle.r.test.builtins.TestBuiltin_lockEnvironment.testlockEnvironment# #e <- new.env(); e$a <- 'foo'; lockEnvironment(e, logical()); e$b <- 123 Error in e$b <- 123 : cannot add bindings to a locked environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_lockEnvironment.testlockEnvironment# #lockEnvironment('foo', TRUE) Error in lockEnvironment("foo", TRUE) : not an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(0) } [1] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(1) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(1, NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(1, NaN) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(NA, NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(NaN) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(NaN, NaN) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(c(0,1)) } [1] -Inf 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(c(2,3), 0/0) } [1] NaN NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ log(c(2,3), NA) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ round( log(10,), digits = 5 ) } [1] 2.30259 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ round( log(10,10), digits = 5 ) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLog# #{ round( log(10,2), digits = 5 ) } [1] 3.32193 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogAttrs# #{ x <- array(1:3, 1); dimnames(x) <- list('a'); r <- log(x); names(r)[[1]] <- 'new'; list(x=x, r=r); } $x a 1 $r new 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogAttrs# #{ x <- array(1:3, 3, list(x=c('x1','x2','x3'))); r <- log(x); r; } x x1 x2 x3 0.0000000 0.6931472 1.0986123 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogAttrs# #{ y <- array(1:6, c(2,3), list(y=c('y1','y2'), x=c('x1','x2','x3'))); r <- log(y); r; } x y x1 x2 x3 y1 0.0000000 1.098612 1.609438 y2 0.6931472 1.386294 1.791759 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(-10-1i, 10) } [1] 1.002161-1.321091i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(0+0i) } [1] -Inf+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex#Output.IgnoreWarningContext# #{ log(0+0i, 0) } [1] NaN+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex#Output.IgnoreWarningContext# #{ log(0+0i, 0+0i) } [1] NaN+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex#Ignored.ImplementationError# #{ log(0+0i, 1) } [1] -Inf+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex#Output.IgnoreWarningContext# #{ log(0.0, 0+0i) } [1] NaN+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex#Output.IgnoreWarningContext# #{ log(0L, 0+0i) } [1] NaN+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(1+1i) } [1] 0.3465736+0.7853982i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(1+1i, -1-1i) } [1] -0.3050968+0.1919672i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(1+1i, 0) } [1] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex#Ignored.ImplementationError# #{ log(1+1i, 1) } [1] Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(1+1i, 1+1i) } [1] 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(1+1i, 1-1i) } [1] -0.674032+0.7387021i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(1+1i, 10+10i) } [1] 0.2010479+0.236866i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(1+1i, NA_complex_) } [1] NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(1, 1+1i) } [1] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(1.0, 1+1i) } [1] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(10+10i, 10) } [1] 1.150515+0.341094i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(10+10i, 10+10i) } [1] 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(10+1i, -10) } [1] 0.3708579-0.4627043i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(10+1i, 10) } [1] 1.002161+0.043286i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(10, 10+10i) } [1] 0.7989521-0.236866i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(10-1i, 10) } [1] 1.002161-0.043286i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(10.0, 1+1i) } [1] 1.082842-2.453915i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex#Output.IgnoreWarningContext# #{ log(F, 0+0i) } [1] NaN+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(NA_complex_) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(T, 1+1i) } [1] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i)) } [1] 0.3465736+0.7853982i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i), 0) } [1] 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, 2+1i)) } [1] 0.3465736+0.7853982i 0.8047190+0.4636476i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, 2+2i), NA) } [1] NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, 2+2i), NaN) } [1] NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, 2+2i), complex(real=1, imaginary=NA)) } [1] NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, 2+2i), complex(real=1, imaginary=NaN)) } [1] NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, 2+2i), complex(real=NA, imaginary=1)) } [1] NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, 2+2i), complex(real=NaN, imaginary=1)) } [1] NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, 2+2i), complex(real=NaN, imaginary=NaN)) } [1] NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, 2+2i, NA), NA_complex_) } [1] NaN+NaNi NaN+NaNi NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, 2+2i, complex(real=NA, imaginary=NA))) } [1] 0.3465736+0.7853982i 1.0397208+0.7853982i NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, NA, NA, 2+2i), NA_complex_) } [1] NaN+NaNi NA NA NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(1+1i, NA_complex_)) } [1] 0.3465736+0.7853982i NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(10+10i, 10), 10) } [1] 1.150515+0.341094i 1.000000+0.000000i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(10+10i, 10+10i), 10+10i) } [1] 1+0i 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(10+1i, 10), 10) } [1] 1.002161+0.043286i 1.000000+0.000000i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(10, 10), 10+10i) } [1] 0.7989521-0.236866i 0.7989521-0.236866i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(10, 10+10i), 10) } [1] 1.000000+0.000000i 1.150515+0.341094i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(10.0, 10+10i), 10) } [1] 1.000000+0.000000i 1.150515+0.341094i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(10.0, 10.0), 10+10i) } [1] 0.7989521-0.236866i 0.7989521-0.236866i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(NA, 3-3i, 2+2i), NA_complex_) } [1] NA NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(NA_complex_), NA_complex_) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(T, 10+10i), 10) } [1] 0.000000+0.000000i 1.150515+0.341094i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(c(T, F), 1+1i) } [1] 0+ 0i -Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(complex(real=1, imaginary=NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(complex(real=NA, imaginary=1i)) } [1] NA Warning message: In complex(real = NA, imaginary = 0+1i) : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex# #{ log(complex(real=NA, imaginary=NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogComplex#Ignored.ImplementationError# #{ log(complex(real=sqrt(.5), imaginary=sqrt(.5)), 1) } [1] Inf+Infi ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(-1.1) } [1] NaN Warning message: In log(-1.1) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(0.0) } [1] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(1.0, 1.0) } [1] NaN Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(1.1) } [1] 0.09531018 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(10, NA_real_) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(10.0, -1.0) } [1] NaN Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(10.0, 1.0) } [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(10.0, 10.0) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(NA_real_) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(c(1.0, 0.0, 10.0), 1.0) } [1] NaN -Inf Inf Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(c(1.0, 0.0, 10.0), 10.0) } [1] 0 -Inf 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(c(1.0, 2.0), NA) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(c(1.0, 2.0), NaN) } [1] NaN NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(c(1.0, 2.0, NA)) } [1] 0.0000000 0.6931472 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogDouble# #{ log(c(10, NA_real_)) } [1] 2.302585 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(-1L) } [1] NaN Warning message: In log(-1L) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(0L) } [1] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(0L, NA_integer_) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(10L, -1L) } [1] NaN Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(10L, 10L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(10L, 1L) } [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(1L) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(1L, 1L) } [1] NaN Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(NA_integer_) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(c(0L, NA_integer_)) } [1] -Inf NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(c(1L, 0L, 10L), 1L) } [1] NaN -Inf Inf Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(c(1L, 1L, 0L, 10L), 10L) } [1] 0 0 -Inf 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(c(1L, 2L), NA) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(c(1L, 2L), NaN) } [1] NaN NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogInt# #{ log(c(1L, 2L, NA)) } [1] 0.0000000 0.6931472 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogLogical# #{ log(F, F) } [1] NaN Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogLogical# #{ log(F, T) } [1] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogLogical# #{ log(T) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogLogical# #{ log(T, F) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogLogical# #{ log(T, T) } [1] NaN Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogLogical# #{ log(c(T)) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogLogical# #{ log(c(T, F)) } [1] 0 -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogLogical# #{ log(c(T, F), T) } [1] NaN -Inf Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogLogical# #{ log(c(T, T), NA) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testLogLogical# #{ log(c(T, T), NaN) } [1] NaN NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testProducedManyNaNsButOneWarnig#Output.IgnoreWarningContext# #{ log(c(0+0i, 0+0i), 0) } [1] NaN+NaNi NaN+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testProducedManyNaNsButOneWarnig#Output.IgnoreWarningContext# #{ log(c(0+0i, 0+0i), 0+0i) } [1] NaN+NaNi NaN+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testProducedManyNaNsButOneWarnig#Output.IgnoreWarningContext# #{ log(c(0.0, 0.0), 0+0i) } [1] NaN+NaNi NaN+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testProducedManyNaNsButOneWarnig#Output.IgnoreWarningContext# #{ log(c(0L, 0L), 0+0i) } [1] NaN+NaNi NaN+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testProducedManyNaNsButOneWarnig# #{ log(c(1.0, 1.0), 1.0) } [1] NaN NaN Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testProducedManyNaNsButOneWarnig# #{ log(c(1L, 1L), 1L) } [1] NaN NaN Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testProducedManyNaNsButOneWarnig#Output.IgnoreWarningContext# #{ log(c(F, F), 0+0i) } [1] NaN+NaNi NaN+NaNi Warning message: NaNs produced in function "log" ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testProducedManyNaNsButOneWarnig# #{ log(c(F, F), F) } [1] NaN NaN Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testSideEffect# #{ a <- c(1, 2, 4); foo <- function() { a[[1]] <<- 42; 33; }; log(a, foo()) } [1] 0.0000000 0.1982399 0.3964797 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log.testlog1# #argv <- list(0.7800058115849);do.call('log', argv) [1] -0.2484539 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ as.integer(log10(200)*100000) } [1] 230102 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ log10(0) } [1] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ log10(1) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ log10(10) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ log10(100) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ log10(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ log10(NaN) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ log10(c(0,1)) } [1] -Inf 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ log10(c(1+1i, -1-1i)) } [1] 0.150515+0.3410941i 0.150515-1.0232823i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ m <- matrix(1:4, nrow=2) ; round( log10(m), digits=5 ) } [,1] [,2] [1,] 0.00000 0.47712 [2,] 0.30103 0.60206 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testLog10# #{ x <- c(a=1, b=10) ; round( c(log(x), log10(x), log2(x)), digits=5 ) } a b a b a b 0.00000 2.30259 0.00000 1.00000 0.00000 3.32193 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testlog101# #argv <- list(c(0.047, 0.013, 0.002, 1e-04, 2.3e-05, 4.5e-06));log10(argv[[1]]); [1] -1.327902 -1.886057 -2.698970 -4.000000 -4.638272 -5.346787 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testlog102# #argv <- list(1.529e+302);log10(argv[[1]]); [1] 302.1844 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testlog103# #argv <- list(structure(7.94649180820227e-05, .Names = 'value'));log10(argv[[1]]); value -4.099825 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testlog104# #argv <- list(c(0.0654707112145738, 0.999999999999999));log10(argv[[1]]); [1] -1.183953e+00 -4.339474e-16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testlog105# #argv <- list(structure(c(160.1, 129.7, 84.8, 120.1, 160.1, 124.9, 84.8, 116.9, 169.7, 140.9, 89.7, 123.3, 187.3, 144.1, 92.9, 120.1, 176.1, 147.3, 89.7, 123.3, 185.7, 155.3, 99.3, 131.3, 200.1, 161.7, 102.5, 136.1, 204.9, 176.1, 112.1, 140.9, 227.3, 195.3, 115.3, 142.5, 244.9, 214.5, 118.5, 153.7, 244.9, 216.1, 188.9, 142.5, 301, 196.9, 136.1, 267.3, 317, 230.5, 152.1, 336.2, 371.4, 240.1, 158.5, 355.4, 449.9, 286.6, 179.3, 403.4, 491.5, 321.8, 177.7, 409.8, 593.9, 329.8, 176.1, 483.5, 584.3, 395.4, 187.3, 485.1, 669.2, 421, 216.1, 509.1, 827.7, 467.5, 209.7, 542.7, 840.5, 414.6, 217.7, 670.8, 848.5, 437, 209.7, 701.2, 925.3, 443.4, 214.5, 683.6, 917.3, 515.5, 224.1, 694.8, 989.4, 477.1, 233.7, 730, 1087, 534.7, 281.8, 787.6, 1163.9, 613.1, 347.4, 782.8), .Tsp = c(1960, 1986.75, 4), class = 'ts'));log10(argv[[1]]); Qtr1 Qtr2 Qtr3 Qtr4 1960 2.204391 2.112940 1.928396 2.079543 1961 2.204391 2.096562 1.928396 2.067815 1962 2.229682 2.148911 1.952792 2.090963 1963 2.272538 2.158664 1.968016 2.079543 1964 2.245759 2.168203 1.952792 2.090963 1965 2.268812 2.191171 1.996949 2.118265 1966 2.301247 2.208710 2.010724 2.133858 1967 2.311542 2.245759 2.049606 2.148911 1968 2.356599 2.290702 2.061829 2.153815 1969 2.388989 2.331427 2.073718 2.186674 1970 2.388989 2.334655 2.276232 2.153815 1971 2.478566 2.294246 2.133858 2.426999 1972 2.501059 2.362671 2.182129 2.526598 1973 2.569842 2.380392 2.200029 2.550717 1974 2.653116 2.457276 2.253580 2.605736 1975 2.691524 2.507586 2.249687 2.612572 1976 2.773713 2.518251 2.245759 2.684396 1977 2.766636 2.597037 2.272538 2.685831 1978 2.825556 2.624282 2.334655 2.706803 1979 2.917873 2.669782 2.321598 2.734560 1980 2.924538 2.617629 2.337858 2.826593 1981 2.928652 2.640481 2.321598 2.845842 1982 2.966283 2.646796 2.331427 2.834802 1983 2.962511 2.712229 2.350442 2.841860 1984 2.995372 2.678609 2.368659 2.863323 1985 3.036230 2.728110 2.449941 2.896306 1986 3.065916 2.787531 2.540830 2.893651 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testlog106# #argv <- list(c(10, 100, 1000, 10000, 1e+05));log10(argv[[1]]); [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log10.testlog107# #argv <- list(structure(numeric(0), .Dim = c(20L, 0L), .Dimnames = list(c('ant', 'bee', 'cat', 'cpl', 'chi', 'cow', 'duc', 'eag', 'ele', 'fly', 'fro', 'her', 'lio', 'liz', 'lob', 'man', 'rab', 'sal', 'spi', 'wha'), NULL)));log10(argv[[1]]); ant bee cat cpl chi cow duc eag ele fly fro her lio liz lob man rab sal spi wha ##com.oracle.truffle.r.test.builtins.TestBuiltin_log1p.testlog1p# #log1p(NA) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log1p.testlog1p# #log1p(NaN) [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_log1p.testlog1p1# #argv <- list(c(-0.160475096572577, -0.953101214495634, -0.329547420118877, -0.234819677566528, -0.108178529791777, -0.0994458210555148, -0.282992873965743, -0.731707656126625, -0.866467764292465, -0.76039953639421, -0.3580569675068, -0.52382260076554, -0.240530699925064, -0.236619747356161, -0.811827419307205, -0.154911720192001, -0.97472580847241, -0.464016625026599, -0.58493655376716, -0.230096919024049));log1p(argv[[1]]); [1] -0.1749191 -3.0597635 -0.3998023 -0.2676438 -0.1144893 -0.1047450 [7] -0.3326695 -1.3156781 -2.0134124 -1.4287825 -0.4432557 -0.7419648 [13] -0.2751354 -0.2699990 -1.6703958 -0.1683142 -3.6779715 -0.6236521 [19] -0.8793239 -0.2614906 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log1p.testlog1p2# #argv <- list(-7e-04);log1p(argv[[1]]); [1] -0.0007002451 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log1p.testlog1p3#Ignored.ReferenceError# #log1p(c(1+1i,-1-1i)) Error in log1p(c(1 + (0+1i), -1 - (0+1i))) : unimplemented complex function ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testLog2# #{ as.integer(log2(6)*1000000) } [1] 2584962 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testLog2# #{ log2(0) } [1] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testLog2# #{ log2(1) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testLog2# #{ log2(2) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testLog2# #{ log2(4) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testLog2# #{ log2(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testLog2# #{ log2(NaN) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testLog2# #{ log2(c(0,1)) } [1] -Inf 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testLog2# #{ log2(c(1+1i, -1-1i)) } [1] 0.5+1.13309i 0.5-3.39927i ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testlog21# #argv <- list(48L);log2(argv[[1]]); [1] 5.584963 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testlog22# #argv <- list(FALSE);log2(argv[[1]]); [1] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testlog23# #argv <- list(2.2250738585072e-308);log2(argv[[1]]); [1] -1022 ##com.oracle.truffle.r.test.builtins.TestBuiltin_log2.testlog25# #argv <- list(2.2250738585072e-308);do.call('log2', argv) [1] -1022 ##com.oracle.truffle.r.test.builtins.TestBuiltin_logical.testlogical1# #argv <- structure(list(length = 0), .Names = 'length');do.call('logical', argv) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ls.basicTests# #e <- new.env(); assign('.x',42,e); assign('y','42',e); ls(envir=e, all.names=FALSE) [1] "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ls.basicTests# #e <- new.env(); assign('.x',42,e); assign('y','42',e); ls(envir=e, all.names=TRUE) [1] ".x" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ls.basicTests# #f <- function(){ x <- 42; a <- 'two'; ls() }; f() [1] "a" "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ls.invalidArgTests# #.Internal(ls(42, TRUE, TRUE)) Error: invalid 'envir' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ .Internal(make.names(42, F)) } Error: non-character names ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("$") } [1] "X." ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("$_", allow_=FALSE) } [1] "X.." ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("...7") } [1] "...7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("..7") } [1] "..7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names(".7") } [1] "X.7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("7") } [1] "X7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("NA_integer_", allow_=FALSE) } [1] "NA.integer." ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("a a") } [1] "a.a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("a_a") } [1] "a_a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("a_a", allow_="a") } Error in make.names("a_a", allow_ = "a") : invalid 'allow_' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("a_a", allow_=7) } [1] "a_a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("a_a", allow_=FALSE) } [1] "a.a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("a_a", allow_=NULL) } Error in make.names("a_a", allow_ = NULL) : invalid 'allow_' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("a_a", allow_=c(7,42)) } [1] "a_a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("a_a", allow_=logical()) } Error in make.names("a_a", allow_ = logical()) : invalid 'allow_' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names("else")} [1] "else." ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNames# #{ make.names(7) } [1] "X7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNamesNonWriteableStringSeq# #make.names(1:10) [1] "X1" "X2" "X3" "X4" "X5" "X6" "X7" "X8" "X9" "X10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNamesNonWriteableStringSeq# #make.names(seq(2)) [1] "X1" "X2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testMakeNamesNonWriteableStringSeq# #make.names(seq_len(1)) [1] "X1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames1# #argv <- list('head', TRUE); .Internal(make.names(argv[[1]], argv[[2]])) [1] "head" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames10# #argv <- list(c('', '', 'bady'), TRUE); .Internal(make.names(argv[[1]], argv[[2]])) [1] "X" "X" "bady" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames11# #argv <- list(character(0), TRUE); .Internal(make.names(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames2# #argv <- list('FALSE', TRUE); .Internal(make.names(argv[[1]], argv[[2]])) [1] "FALSE." ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames3# #argv <- list(c('.Call', '.Call numParameters', '.Fortran', '.Fortran numParameters'), TRUE); .Internal(make.names(argv[[1]], argv[[2]])) [1] ".Call" ".Call.numParameters" ".Fortran" [4] ".Fortran.numParameters" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames4# #argv <- list('..adfl.row.names', TRUE); .Internal(make.names(argv[[1]], argv[[2]])) [1] "..adfl.row.names" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames5# #argv <- list(c('name', 'title', 'other.author'), TRUE); .Internal(make.names(argv[[1]], argv[[2]])) [1] "name" "title" "other.author" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames6# #argv <- list('.2a', TRUE); .Internal(make.names(argv[[1]], argv[[2]])) [1] "X.2a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames7# #argv <- list('', TRUE); .Internal(make.names(argv[[1]], argv[[2]])) [1] "X" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames8# #argv <- list(NA_character_, TRUE); .Internal(make.names(argv[[1]], argv[[2]])) [1] "NA." ##com.oracle.truffle.r.test.builtins.TestBuiltin_makenames.testmakenames9# #argv <- list(c('Subject', 'predict.fixed', 'predict.Subject'), TRUE); .Internal(make.names(argv[[1]], argv[[2]])) [1] "Subject" "predict.fixed" "predict.Subject" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ .Internal(make.unique(NULL, ".")) } Error: 'names' must be a character vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ .Internal(make.unique(c("7", "42"), 42)) } Error: 'sep' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ .Internal(make.unique(c("7", "42"), NULL)) } Error: 'sep' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ .Internal(make.unique(c("7", "42"), c(".", "."))) } Error: 'sep' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ .Internal(make.unique(c("7", "42"), character())) } Error: 'sep' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ .Internal(make.unique(c(7, 42), ".")) } Error: 'names' must be a character vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ make.unique("a") } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ make.unique("a", 1) } Error in make.unique("a", 1) : 'sep' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ make.unique("a", character()) } Error in make.unique("a", character()) : 'sep' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ make.unique(1) } Error in make.unique(1) : 'names' must be a character vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ make.unique(c("a", "a")) } [1] "a" "a.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ make.unique(c("a", "a"), "_") } [1] "a" "a_1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ make.unique(c("a", "a", "a")) } [1] "a" "a.1" "a.2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique# #{ make.unique(character()) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique5# #{ make.unique(paste0('a', 1:10)) } [1] "a1" "a2" "a3" "a4" "a5" "a6" "a7" "a8" "a9" "a10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique5# #{ make.unique(rep('a', 10)) } [1] "a" "a.1" "a.2" "a.3" "a.4" "a.5" "a.6" "a.7" "a.8" "a.9" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique6# #{ make.unique(paste('a', 1:10, sep = '.')) } [1] "a.1" "a.2" "a.3" "a.4" "a.5" "a.6" "a.7" "a.8" "a.9" "a.10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique6# #{ make.unique(paste0('a', 1:10)) } [1] "a1" "a2" "a3" "a4" "a5" "a6" "a7" "a8" "a9" "a10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique7# #{ make.unique(c('a', 'a', 'a.2', 'a'), sep = '.') } [1] "a" "a.1" "a.2" "a.3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique7# #{ make.unique(c('a.1', 'a.2', 'a', 'a'), sep = '.') } [1] "a.1" "a.2" "a" "a.3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique7# #{ make.unique(c('a.2', 'a.2', 'a', 'a', 'a'), sep = '.') } [1] "a.2" "a.2.1" "a" "a.1" "a.3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testMakeUnique7# #{ make.unique(c('a.2', 'a.2', 'a.3', 'a.3', 'a', 'a', 'a'), sep = '.') } [1] "a.2" "a.2.1" "a.3" "a.3.1" "a" "a.1" "a.4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testmakeunique1# #argv <- list(c('A', 'B', 'C', 'D', 'E', 'F'), '.'); .Internal(make.unique(argv[[1]], argv[[2]])) [1] "A" "B" "C" "D" "E" "F" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testmakeunique2# #argv <- list(c('b', 'NA', 'NA'), '.'); .Internal(make.unique(argv[[1]], argv[[2]])) [1] "b" "NA" "NA.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testmakeunique3# #argv <- list(c('1', '2', '3', '6', '7', '7', '7', '8', '8', '10', '11', '12', '12', '12', '15', '15', '16', '17', '19', '20', '21', '21', '23'), '.'); .Internal(make.unique(argv[[1]], argv[[2]])) [1] "1" "2" "3" "6" "7" "7.1" "7.2" "8" "8.1" "10" [11] "11" "12" "12.1" "12.2" "15" "15.1" "16" "17" "19" "20" [21] "21" "21.1" "23" ##com.oracle.truffle.r.test.builtins.TestBuiltin_makeunique.testmakeunique4# #argv <- list(character(0), '.'); .Internal(make.unique(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_mapply.testmapply# #mapply(function(...) 42) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_mapply.testmapply# #mapply(function(x, y) seq_len(x) + y, c(a = 1, b = 2, c = 3), c(A = 10, B = 0, C = -10)) $a [1] 11 $b [1] 1 2 $c [1] -9 -8 -7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mapply.testmapply# #mapply(rep, 1:4, 4:1) [[1]] [1] 1 1 1 1 [[2]] [1] 2 2 2 [[3]] [1] 3 3 [[4]] [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mapply.testmapply# #mapply(rep, times = 1:4, MoreArgs = list(x = 42)) [[1]] [1] 42 [[2]] [1] 42 42 [[3]] [1] 42 42 42 [[4]] [1] 42 42 42 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mapply.testmapply# #word <- function(C, k) paste(rep.int(C, k), collapse = ""); utils::str(mapply(word, LETTERS[1:6], 6:1, SIMPLIFY = FALSE)) List of 6 $ A: chr "AAAAAA" $ B: chr "BBBBB" $ C: chr "CCCC" $ D: chr "DDD" $ E: chr "EE" $ F: chr "F" ##com.oracle.truffle.r.test.builtins.TestBuiltin_mapply.testmapply# #{ mapply(rep, times = 1:4, MoreArgs = list(x = 42)) } [[1]] [1] 42 [[2]] [1] 42 42 [[3]] [1] 42 42 42 [[4]] [1] 42 42 42 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mapply.testmapply# #{ mapply(rep, times = 1:4, x = 4:1) } [[1]] [1] 4 [[2]] [1] 3 3 [[3]] [1] 2 2 2 [[4]] [1] 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mapply.testmapply# #{ mapply(rep.int, 42, MoreArgs = list(4)) } [,1] [1,] 42 [2,] 42 [3,] 42 [4,] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mapply.testmapply1# #argv <- list(.Primitive('c'), list(list(), list(), list()), NULL); .Internal(mapply(argv[[1]], argv[[2]], argv[[3]])) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ fa <- structure(1:2, .Label = c('a', NA), class = 'factor'); fa2 <- structure(1:3, .Label = c('a', NA, 'b'), class = 'factor'); match(fa, fa2) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ fa <- structure(1:2, .Label = c('a', NA), class = 'factor'); match(fa, c('a', NA_character_)) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match("a", factor(c("a", "b", "a"))) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match("abc", c("xyz")) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match("abc", c("xyz"), nomatch=-1) } [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match("hello",c("I", "say", "hello", "world")) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(2,c(1,2,3)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(42, NULL) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(NULL, NULL) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(c("hello", "say"),c("I", "say", "hello", "world")) } [1] 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(c(0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,"NA",NA), c(NA,"NA",1,2,3,4,5,6,7,8,9,10,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9)) } [1] 13 3 4 5 6 7 8 9 10 11 13 3 4 5 6 7 8 9 10 11 13 3 4 5 6 [26] 7 8 9 10 11 13 3 4 5 6 7 8 9 10 11 13 3 4 5 6 7 8 9 10 11 [51] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(c(0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,1L,NA), c(NA,1L,1L,2L,3L,4L,5L,6L,7L,8L,9L,10L,0L,1L,1L,2L,3L,4L,5L,6L,7L,8L,9L,10L,0L,1L,1L,2L,3L,4L,5L,6L)) } [1] 13 2 4 5 6 7 8 9 10 11 13 2 4 5 6 7 8 9 10 11 13 2 4 5 6 [26] 7 8 9 10 11 13 2 4 5 6 7 8 9 10 11 13 2 4 5 6 7 8 9 10 11 [51] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(c(0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9,NaN,NA,1), c(1,NA,NaN,1,2,3,4,5,6,7,8,9,10,0,1,2,3,4,5,6,7,8,9,0,1,2,3,4,5,6,7,8,9)) } [1] 14 1 5 6 7 8 9 10 11 12 14 1 5 6 7 8 9 10 11 12 14 1 5 6 7 [26] 8 9 10 11 12 14 1 5 6 7 8 9 10 11 12 14 1 5 6 7 8 9 10 11 12 [51] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(c(1,2,3,"NA",NA), c(NA,"NA",1,2,3,4,5,6,7,8,9,10)) } [1] 3 4 5 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(c(1,2,3,4,5),c(1,2,1,2)) } [1] 1 2 NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(c(1,2,3,NaN,NA,1), c(1,NA,NaN,1,2,3,4,5,6,7,8,9,10)) } [1] 1 5 6 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(c(1L,2L,3L,1L,NA), c(NA,1L,1L,2L,3L,4L,5L,6L,7L,8L,9L,10L)) } [1] 2 4 5 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(c(7, 42), NULL) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(c(7, 42), NULL, 1L) } [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch#Ignored.ImplementationError# #{ match(c(7, 42), NULL, integer()) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(factor(c("a", "b")), factor(c("c", "b", "a", "b", "c", "a"))) } [1] 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch# #{ match(factor(c("a", "b", "a")), "a") } [1] 1 NA 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('1', 1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('1', 1.1) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('1', 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('1', c(1, 0)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('1', c(1.1, 0)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('1', c(1L, 0L)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('1+0i', 1+0i) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('1+0i', c(1+0i, 0+0i)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('10', as.raw(16)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('10', as.raw(c(16, 17))) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('TRUE', T) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('TRUE', c(T, F)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('a', 'a') } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match('a', c('a', 'b')) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(0, c('1', '0')) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(0, c(1+0i, 0+0i)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(0, c(1, 0)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(0, c(1L, 0L)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(0, c(T, F)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(0L, c(1L, 0L)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(0L, c(T, F)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1+0i, 1+0i) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1+0i, T) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1+0i, c(1+0i, 0+0i)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1+0i, c(T, F)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1, '1') } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1, 1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1, 1+0i) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1, 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1, T) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1.1, '1') } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1.1, 1+0i) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1.1, 1.1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1.1, 1L) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1.1, T) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10+0i, '10') } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10+0i, 10) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10+0i, 10.1) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10+0i, 10L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10+0i, as.raw(16)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10+0i, as.raw(c(16, 17))) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10+0i, c('10', '11')) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10+0i, c(10, 11)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10+0i, c(10.1, 11)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10+0i, c(10L, 11L)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10, as.raw(16)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10, as.raw(c(16, 17))) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10.1, as.raw(16)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10L, as.raw(16)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(10L, as.raw(c(16, 17))) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1L, '1') } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1L, 1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1L, 1+0i) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1L, 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1L, T) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1L, c('1', '0')) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1L, c(1+0i, 0+0i)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(1L, c(1, 0)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(F, c(1+0i, 0+0i)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(F, c(1, 0)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(F, c(1.1, 0)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(F, c(1L, 0L)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(F, c(T,F)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, 'TRUE') } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, 1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, 1+0i) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, 1.1) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, 1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, T) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, as.raw(1)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, as.raw(c(1, 0))) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, c('TRUE', 'FALSE')) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, c(1+0i,0+0i)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(T, c(1L,0L)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(0:255), c(F, T)) } [1] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [26] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [51] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [76] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [101] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [126] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [151] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [176] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [201] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [226] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [251] NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(0:255), complex(real=0:255, imaginary=0)) } [1] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [26] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [51] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [76] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [101] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [126] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [151] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [176] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [201] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [226] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [251] NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(1), T) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(1), as.raw(1)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(1), as.raw(c(1, 0))) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(1), c(T,F)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(16), '10') } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(16), 10) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(16), 10+0i) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(16), 10.1) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(16), 10L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(16), c('10', '11')) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(16), c(10+0i, 11+0i)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(16), c(16, 11)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(16), c(16, 11L)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(1, 0)), T) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(1, 0)), c(T,F)) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(1,0)), as.raw(1)) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(1,0)), as.raw(c(1, 0))) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(16, 17)), '10') } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(16, 17)), 10) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(16, 17)), 10+0i) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(16, 17)), 10.1) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(16, 17)), 10L) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(16, 17)), c('10', '11')) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(16, 17)), c(10+0i, 11+0i)) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(16, 17)), c(10,11)) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(as.raw(c(16, 17)), c(10L,11L)) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('1', '0'), 1) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('1', '0'), 1L) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('1', '1', '-2147483648'), c(1L, 0L, NA_integer_)) } [1] 1 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('1', '1', NA_character_), c(1L, 0L, NA_integer_)) } [1] 1 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('1', '1',NA_character_), c(1, 0, NA)) } [1] 1 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('1+0i', '0+0i'), 1+0i) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('1+0i', '0+0i', NA_character_), c(1+0i, 0+0i, NA_complex_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('10', '11'), as.raw(16)) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('10', '11'), as.raw(c(16, 17))) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('TRUE', 'FALSE'), T) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('TRUE', 'FALSE', '-2147483648'), c(T, F, NA)) } [1] 1 2 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('TRUE', 'FALSE', NA_character_), c(T, F, NA)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('a', 'b'), 'a') } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c('a', 'b', NA_character_), c('a', 'b', NA_character_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1+0i,0+0i), 1+0i) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1+0i,0+0i), T) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1+0i,0+0i, NA_complex_), c(1+0i, 0+0i, NA_complex_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1+0i,0+0i, NA_complex_), c(T, F, NA)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, -2147483648), c(1L, 0L, NA_integer_)) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0), '1') } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0), 1) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0), 1+0i) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0), 1L) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0), T) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0, 2, 3, NA), c(T, F, NA)) } [1] 1 2 NA NA 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0, 2, 3, NA, -1), c(T, T, T, T, NA)) } [1] 1 NA NA NA 5 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0, NA), c('1', '0', NA_character_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0, NA), c(1+0i, 0+0i, NA_complex_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0, NA), c(1, 0, NA)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0, NA), c(1L, 0L, NA_integer_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 0, NA), c(T, F, NA)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 1.1, NA), c(1, 1.1, NA)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 1.1, NA), c(T, F, NA)) } [1] 1 NA 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, 1.1, NA, -2147483648), c(T, F, NA)) } [1] 1 NA 3 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1, NA, 1), c(T, F, NA)) } [1] 1 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1.1, 0), '1') } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1.1, 0), 1+0i) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1.1, 0), 1L) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10+0i,11+0i), '10') } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10+0i,11+0i), 10) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10+0i,11+0i), 10L) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10+0i,11+0i), as.raw(16)) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10+0i,11+0i), as.raw(c(16, 17))) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10+0i,11+0i, NA_complex_), c('10', '11', NA_character_)) } [1] NA NA 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10+0i,11+0i, NA_complex_), c(10, 11, NA)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10+0i,11+0i, NA_complex_), c(10L, 11L, NA_integer_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10, 11), as.raw(16)) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10, 11), as.raw(c(16, 17))) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10.1, 11), as.raw(16)) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10L, 11L), as.raw(16)) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(10L, 11L), as.raw(c(16, 17))) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L, 0L), 1L) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L, 0L), T) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L, 0L, -1L), c(T, F, NA)) } [1] 1 2 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L, 0L, NA_integer_), c(1L, 0L, NA_integer_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L, 0L, NA_integer_), c(T, F, NA)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L,0L), '1') } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L,0L), 1) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L,0L), 1+0i) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L,0L, NA_integer_), c(1, 0, -2147483648)) } [1] 1 2 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L,0L, NA_integer_), c(1, 0, NA)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L,0L,NA_integer_), c('1', '0', NA_character_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(1L,0L,NA_integer_), c(1+0i, 0+0i, NA_complex_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T, F), 1) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T, F), T) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T, F, NA), c(1+0i, 0+0i, NA_complex_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T, F, NA), c(1, 0, -1)) } [1] 1 2 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T, F, NA), c(1, 0, NA)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T, F, NA), c(1L,0L, -1L)) } [1] 1 2 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T, F, NA), c(1L,0L, NA_integer_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T, F, NA), c(T,F, NA)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T,F), 'TRUE') } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T,F), as.raw(1)) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T,F), as.raw(c(1, 0))) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T,F, NA), c('TRUE', 'FALSE', '-1')) } [1] 1 2 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatch2# #{ match(c(T,F, NA), c('TRUE', 'FALSE', NA_character_)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #match(1:3, 3:1) [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #match(1:3, numeric(0)) [1] NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #match(as.character(1:3), as.character(3:1)) [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(c( 1L, 2L, 3L), seq.int(from=1L, to=10L, by=2L)) } [1] 1 NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(c('-2', '-1', '0', '1', '10', '11'),paste('', -1:10, '', sep=''))} [1] NA 1 2 3 12 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(c('-2b', '-1b', '0b', '1b', '10b', '11b'),paste('', -1:10, 'b', sep=''))} [1] NA 1 2 3 12 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(c('1', '2', '3'),paste('', seq(from=1, to=10, by=2), '', sep=''))} [1] 1 NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(c('1b', '2b', '3b'),paste('', seq(from=1, to=10, by=2), 'b', sep=''))} [1] 1 NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(c('a-2b', 'a-1b', 'a0b', 'a1b', 'a10b', 'a11b'),paste('a', -1:10, 'b', sep=''))} [1] NA 1 2 3 12 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(c('a1b', 'a2b', 'a3b'),paste('a', seq(from=1, to=10, by=2), 'b', sep=''))} [1] 1 NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(c(-2L, -1L, 0L, 1L, 10L, 11L), seq.int(from=-1L, to=10L, by=1L)) } [1] NA 1 2 3 12 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(paste('', seq(from=1, to=10, by=1), '', sep=''),paste('', seq(from=1, to=10, by=4), '', sep=''))} [1] 1 NA NA NA 2 NA NA NA 3 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(paste('', seq(from=1, to=10, by=1), 'b', sep=''),paste('', seq(from=1, to=10, by=4), 'b', sep=''))} [1] 1 NA NA NA 2 NA NA NA 3 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(paste('a', seq(from=1, to=10, by=1), 'b', sep=''),paste('a', seq(from=1, to=10, by=4), 'b', sep=''))} [1] 1 NA NA NA 2 NA NA NA 3 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testMatchInSequence# #{ match(seq.int(from=1L, to=10L, by=1L), seq.int(from=1L, to=10L, by=4L)) } [1] 1 NA NA NA 2 NA NA NA 3 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch1# #argv <- list('corMatrix', c('dpoMatrix', 'dsyMatrix', 'ddenseMatrix', 'symmetricMatrix', 'dMatrix', 'denseMatrix', 'compMatrix', 'Matrix', 'mMatrix'), NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch10# #argv <- list(structure(1:27, .Label = c('M16', 'M05', 'M02', 'M11', 'M07', 'M08', 'M03', 'M12', 'M13', 'M14', 'M09', 'M15', 'M06', 'M04', 'M01', 'M10', 'F10', 'F09', 'F06', 'F01', 'F05', 'F07', 'F02', 'F08', 'F03', 'F04', 'F11'), class = c('ordered', 'factor')), structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 7L, 7L, 7L, 7L, 8L, 8L, 8L, 8L, 9L, 9L, 9L, 9L, 10L, 10L, 10L, 10L, 11L, 11L, 11L, 11L, 12L, 12L, 12L, 12L, 13L, 13L, 13L, 13L, 14L, 14L, 14L, 14L, 15L, 15L, 15L, 15L, 16L, 16L, 16L, 16L, 17L, 17L, 17L, 17L, 18L, 18L, 18L, 18L, 19L, 19L, 19L, 19L, 20L, 20L, 20L, 20L, 21L, 21L, 21L, 21L, 22L, 22L, 22L, 22L, 23L, 23L, 23L, 23L, 24L, 24L, 24L, 24L, 25L, 25L, 25L, 25L, 26L, 26L, 26L, 26L, 27L, 27L, 27L, 27L), .Label = c('M16', 'M05', 'M02', 'M11', 'M07', 'M08', 'M03', 'M12', 'M13', 'M14', 'M09', 'M15', 'M06', 'M04', 'M01', 'M10', 'F10', 'F09', 'F06', 'F01', 'F05', 'F07', 'F02', 'F08', 'F03', 'F04', 'F11'), class = c('ordered', 'factor')), NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 5 9 13 17 21 25 29 33 37 41 45 49 53 57 61 65 69 73 [20] 77 81 85 89 93 97 101 105 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch11# #argv <- list('g', 'l', NA_character_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch12# #argv <- list(1:4, 3L, 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch13# #argv <- list(c('0.5', '0.5', '0.5', '0.5', '0.5'), 0.5, NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch14# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch15# #argv <- list(c('May', 'Jun', 'Jul', 'Aug', 'Sep'), c(NA, NaN), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch16# #argv <- list(c(1L, 2L, 4L, 13L, 14L, 15L, 16L, 17L, 18L, 23L), c(23L, 28L), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 0 0 0 0 0 0 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch17# #argv <- list(c('dMatrix', 'nonStructure', 'structure'), c('nonStructure', 'structure'), NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch18# #argv <- list(structure(c(0, 1), .Names = c('Domestic', 'Foreign')), NA_integer_, NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch19# #argv <- list(structure(list(col = 1, cellvp = structure(list(structure(list(x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), width = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), height = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), justification = 'centre', gp = structure(list(), class = 'gpar'), clip = FALSE, xscale = c(0, 1), yscale = c(0, 1), angle = 0, layout = NULL, layout.pos.row = c(1L, 1L), layout.pos.col = c(1L, 1L), valid.just = c(0.5, 0.5), valid.pos.row = c(1L, 1L), valid.pos.col = c(1L, 1L), name = 'GRID.VP.8'), .Names = c('x', 'y', 'width', 'height', 'justification', 'gp', 'clip', 'xscale', 'yscale', 'angle', 'layout', 'layout.pos.row', 'layout.pos.col', 'valid.just', 'valid.pos.row', 'valid.pos.col', 'name'), class = 'viewport'), structure(list(x = structure(1, unit = 'lines', valid.unit = 3L, data = list(NULL), class = 'unit'), y = structure(1, unit = 'lines', valid.unit = 3L, data = list( NULL), class = 'unit'), width = structure(list(fname = '-', arg1 = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), arg2 = structure(list(fname = 'sum', arg1 = structure(c(1, 1), unit = c('lines', 'lines'), valid.unit = c(3L, 3L), data = list(NULL, NULL), class = 'unit'), arg2 = NULL), .Names = c('fname', 'arg1', 'arg2'), class = c('unit.arithmetic', 'unit'))), .Names = c('fname', 'arg1', 'arg2'), class = c('unit.arithmetic', 'unit')), height = structure(list(fname = '-', arg1 = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), arg2 = structure(list(fname = 'sum', arg1 = structure(c(1, 1), unit = c('lines', 'lines'), valid.unit = c(3L, 3L), data = list(NULL, NULL), class = 'unit'), arg2 = NULL), .Names = c('fname', 'arg1', 'arg2'), class = c('unit.arithmetic', 'unit'))), .Names = c('fname', 'arg1', 'arg2'), class = c('unit.arithmetic', 'unit')), justification = c('left', 'bottom'), gp = structure(list(), class = 'gpar'), clip = FALSE, xscale = c(0, 1), yscale = c(0, 1), angle = 0, layout = NULL, layout.pos.row = NULL, layout.pos.col = NULL, valid.just = c(0, 0), valid.pos.row = NULL, valid.pos.col = NULL, name = 'GRID.VP.9'), .Names = c('x', 'y', 'width', 'height', 'justification', 'gp', 'clip', 'xscale', 'yscale', 'angle', 'layout', 'layout.pos.row', 'layout.pos.col', 'valid.just', 'valid.pos.row', 'valid.pos.col', 'name'), class = 'viewport')), class = c('vpStack', 'viewport'))), .Names = c('col', 'cellvp')), c('children', 'childrenOrder'), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch2# #argv <- list(c('ANY', 'abIndex', 'ddenseMatrix', 'diagonalMatrix', 'dsparseMatrix', 'lMatrix', 'nMatrix', 'nsparseVector', 'pMatrix', 'sparseVector'), 'ANY', NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 NA NA NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch20# #argv <- list(structure(c(1, 1, 6, 2, 2, 7, 3, 3, 7, 3, 3, 8, 4, 4, 4, 5), .Dim = c(16L, 1L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16'), 'y')), c(1, 2, 3, 4, 5, 6, 7, 8), NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 1 6 2 2 7 3 3 7 3 3 8 4 4 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch21# #argv <- list(structure(c(0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3, 0, 0, 0, 1, 1, 1, 2, 2, 2, 3, 3, 3), .Tsp = c(1959, 1997.91666667, 12), class = 'ts'), c(0, 1, 2, 3), NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 [38] 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 [75] 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 [112] 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 [149] 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 [186] 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 [223] 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 [260] 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 [297] 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 [334] 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 [371] 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 [408] 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 [445] 1 1 1 2 2 2 3 3 3 4 4 4 1 1 1 2 2 2 3 3 3 4 4 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch22#Ignored.ImplementationError# #argv <- list(c(NA, NA, 3, 4, 5), c(NA, NA, 4, 5), 0L, NA); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 0 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch23# #argv <- list(structure('tools', .Names = 'name'), c('base', 'utils'), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch24# #argv <- list(structure(list(framevp = structure(list(x = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'unit'), width = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), height = structure(1, unit = 'npc', valid.unit = 0L, class = 'unit'), justification = 'centre', gp = structure(list(), class = 'gpar'), clip = FALSE, xscale = c(0, 1), yscale = c(0, 1), angle = 0, layout = structure(list(nrow = 1L, ncol = 1L, widths = structure(list( fname = 'sum', arg1 = structure(c(1, 1, 1), unit = c('lines', 'lines', 'lines'), valid.unit = c(3L, 3L, 3L), data = list(NULL, NULL, NULL), class = 'unit'), arg2 = NULL), .Names = c('fname', 'arg1', 'arg2'), class = c('unit.arithmetic', 'unit')), heights = structure(list(fname = 'sum', arg1 = structure(c(1, 1, 1), unit = c('lines', 'lines', 'lines'), valid.unit = c(3L, 3L, 3L), data = list(NULL, NULL, NULL), class = 'unit'), arg2 = NULL), .Names = c('fname', 'arg1', 'arg2'), class = c('unit.arithmetic', 'unit')), respect = FALSE, valid.respect = 0L, respect.mat = structure(0L, .Dim = c(1L, 1L)), just = 'centre', valid.just = c(0.5, 0.5)), .Names = c('nrow', 'ncol', 'widths', 'heights', 'respect', 'valid.respect', 'respect.mat', 'just', 'valid.just'), class = 'layout'), layout.pos.row = NULL, layout.pos.col = NULL, valid.just = c(0.5, 0.5), valid.pos.row = NULL, valid.pos.col = NULL, name = 'GRID.VP.33'), .Names = c('x', 'y', 'width', 'height', 'justification', 'gp', 'clip', 'xscale', 'yscale', 'angle', 'layout', 'layout.pos.row', 'layout.pos.col', 'valid.just', 'valid.pos.row', 'valid.pos.col', 'name'), class = 'viewport')), .Names = 'framevp'), c('children', 'childrenOrder'), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch25# #argv <- list(' *** Run successfully completed ***', c('', '> ### R code from vignette source \'Design-issues.Rnw\'', '> ', '> ###################################################', '> ### code chunk number 1: preliminarie .... [TRUNCATED] ', '', '> ###################################################', '> ### code chunk number 2: diag-class', '> ###################################################', '> li .... [TRUNCATED] ', 'Loading required package: lattice', '', 'Attaching package: ‘Matrix’', '', 'The following object is masked from ‘package:base’:', '', ' det', '', '', '> (D4 <- Diagonal(4, 10*(1:4)))', '4 x 4 diagonal matrix of class \'ddiMatrix\'', ' [,1] [,2] [,3] [,4]', '[1,] 10 . . .', '[2,] . 20 . .', '[3,] . . 30 .', '[4,] . . . 40', '', '> str(D4)', 'Formal class \'ddiMatrix\' [package \'Matrix\'] with 4 slots', ' ..@ diag : chr \'N\'', ' ..@ Dim : int [1:2] 4 4', ' ..@ Dimnames:List of 2', ' .. ..$ : NULL', ' .. ..$ : NULL', ' ..@ x : num [1:4] 10 20 30 40', '', '> diag(D4)', '[1] 10 20 30 40', '', '> ###################################################', '> ### code chunk number 3: diag-2', '> ###################################################', '> diag(D .... [TRUNCATED] ', '', '> D4', '4 x 4 diagonal matrix of class \'ddiMatrix\'', ' [,1] [,2] [,3] [,4]', '[1,] 11 . . .', '[2,] . 22 . .', '[3,] . . 33 .', '[4,] . . . 44', '', '> ###################################################', '> ### code chunk number 4: unit-diag', '> ###################################################', '> str .... [TRUNCATED] ', 'Formal class \'ddiMatrix\' [package \'Matrix\'] with 4 slots', ' ..@ diag : chr \'U\'', ' ..@ Dim : int [1:2] 3 3', ' ..@ Dimnames:List of 2', ' .. ..$ : NULL', ' .. ..$ : NULL', ' ..@ x : num(0) ', '', '> getClass(\'diagonalMatrix\') ## extending \'denseMatrix\'', 'Virtual Class \'diagonalMatrix\' [package \'Matrix\']', '', 'Slots:', ' ', 'Name: diag Dim Dimnames', 'Class: character integer list', '', 'Extends: ', 'Class \'sparseMatrix\', directly', 'Class \'Matrix\', by class \'sparseMatrix\', distance 2', 'Class \'mMatrix\', by class \'Matrix\', distance 3', '', 'Known Subclasses: \'ddiMatrix\', \'ldiMatrix\'', '', '> ###################################################', '> ### code chunk number 5: Matrix-ex', '> ###################################################', '> (M .... [TRUNCATED] ', '4 x 4 sparse Matrix of class \'dgTMatrix\'', ' ', '[1,] . . 4 .', '[2,] . 1 . .', '[3,] 4 . . .', '[4,] . . . 8', '', '> m <- as(M, \'matrix\')', '', '> (M. <- Matrix(m)) # dsCMatrix (i.e. *symmetric*)', '4 x 4 sparse Matrix of class \'dsCMatrix\'', ' ', '[1,] . . 4 .', '[2,] . 1 . .', '[3,] 4 . . .', '[4,] . . . 8', '', '> ###################################################', '> ### code chunk number 6: sessionInfo', '> ###################################################', '> t .... [TRUNCATED] ', '\\begin{itemize}\\raggedright', ' \\item R version 3.0.1 (2013-05-16), \\verb|x86_64-unknown-linux-gnu|', ' \\item Locale: \\verb|LC_CTYPE=en_US.UTF-8|, \\verb|LC_NUMERIC=C|, \\verb|LC_TIME=en_US.UTF-8|, \\verb|LC_COLLATE=C|, \\verb|LC_MONETARY=en_US.UTF-8|, \\verb|LC_MESSAGES=en_US.UTF-8|, \\verb|LC_PAPER=C|, \\verb|LC_NAME=C|, \\verb|LC_ADDRESS=C|, \\verb|LC_TELEPHONE=C|, \\verb|LC_MEASUREMENT=en_US.UTF-8|, \\verb|LC_IDENTIFICATION=C|', ' \\item Base packages: base, datasets, grDevices, graphics,', ' methods, stats, utils', ' \\item Other packages: Matrix~1.0-12, lattice~0.20-15', ' \\item Loaded via a namespace (and not attached): grid~3.0.1,', ' tools~3.0.1', '\\end{itemize}', '', ' *** Run successfully completed ***', '> proc.time()', ' user system elapsed ', '157.417 4.183 161.773 '), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 115 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch26# #argv <- list(c(NA, NA, NA, NA, NA, NA, NA, NA), c('real', 'double'), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch27# #argv <- list(c('2005-01-01', '2006-01-01', '2007-01-01', '2008-01-01', '2009-01-01'), c(NA, NaN), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch28# #argv <- list(c(NA, NA), c('real', 'double'), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch29# #argv <- list(c('TRUE', 'FALSE', 'TRUE', 'FALSE', 'TRUE', 'FALSE', 'TRUE', 'FALSE', 'TRUE', 'FALSE'), c(FALSE, TRUE), NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 2 1 2 1 2 1 2 1 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch3# #argv <- list(character(0), NA_integer_, NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch30# #argv <- list(c('2005-01-01', '2005-02-01', '2005-03-01', '2005-04-01', '2005-05-01', '2005-06-01', '2005-07-01', '2005-08-01', '2005-09-01', '2005-10-01', '2005-11-01', '2005-12-01', '2006-01-01', '2006-02-01', '2006-03-01', '2006-04-01', '2006-05-01', '2006-06-01', '2006-07-01', '2006-08-01', '2006-09-01', '2006-10-01', '2006-11-01', '2006-12-01', '2007-01-01', '2007-02-01', '2007-03-01', '2007-04-01', '2007-05-01', '2007-06-01', '2007-07-01', '2007-08-01', '2007-09-01', '2007-10-01', '2007-11-01', '2007-12-01', '2008-01-01', '2008-02-01', '2008-03-01', '2008-04-01', '2008-05-01', '2008-06-01', '2008-07-01', '2008-08-01', '2008-09-01', '2008-10-01', '2008-11-01', '2008-12-01', '2009-01-01'), NA_integer_, NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [26] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch31# #argv <- list(c(1, 2, 3, 4, 8, 12), c(1, 2, 3, 4, 8, 12), NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch32# #argv <- list(c('.__C__classA', '.__T__$:base', '.__T__$<-:base', '.__T__[:base', '.__T__plot:graphics', 'plot'), c('.__NAMESPACE__.', '.__S3MethodsTable__.', '.packageName', '.First.lib', '.Last.lib', '.onLoad', '.onAttach', '.onDetach', '.conflicts.OK', '.noGenerics'), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch4# #argv <- list(c('1', '2', NA), NA_real_, NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA NA 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch5# #argv <- list(c(0.00711247435174189, 0.251292124343149, -0.319172743733056, 5.75733114833721e-05, -0.35788385867217, -0.423873493915367, -0.440922191441033, 0.454737405613056, -0.337349081024889, -0.340540089756868, 0.0142999714851724, -0.337349081024889, 0.16929974943645, 0.0119141094780619, 0.0237947544260095, 0.481799107922823, -0.398620160881439, 0.112296211162227, 0.124500575635478, -0.423873493915367, 0.476631055345105, -0.201544176575946, 0.0504435384277691, 0.0142999714851724, 0.0859627732681778, -0.402191440217491, 0.0237947544260095, -0.35788385867217, 0.131606068222389, -0.328335725283617, -0.366873527650917, 0.855944113774621, 0.0506448607016037, -0.540294711232517, 0.365377890605673, 0.122315677921641, 0.122315677921641, 0.476631055345105, 0.0859627732681778, 0.028962807003728, 0.130710526672205, 0.704128425262244, 0.0119141094780619, 0.0506448607016037, 0.0859627732681778, 0.131606068222389, 0.122315677921641, -0.429041546493085, 0.0506448607016037, -0.35788385867217, 0.746844979419744, -0.158827622418446, -0.340540089756868, 0.130710526672205, -0.429041546493085, 0.126579318324608, 0.0119141094780619, 0.251292124343149, -0.283536551482645, 0.107466982896435, 0.586499858105134, -0.402392762491326, -0.85437461044313, 0.133663557186039, -0.328335725283617, 0.124500575635478, 0.0237947544260095, 0.133663557186039, 0.133663557186039, 0.656149860060726, 0.579415619243703, 0.107466982896435, -0.599127482939288, -0.326256982594487, 0.746844979419744, -0.452778727607612, -0.328335725283617, 0.0119141094780619, -0.340540089756868, -0.319172743733056, -0.725390113737062, 0.503481161620698, -0.661275243349858, -0.402392762491326, 0.476631055345105, 0.126579318324608, 0.251292124343149, -0.0874584103134217, 0.107466982896435, -0.201544176575946, 0.0734191385691725), c(-0.85437461044313, -0.725390113737062, -0.661275243349858, -0.599127482939288, -0.540294711232517, -0.452778727607612, -0.440922191441033, -0.429041546493085, -0.423873493915367, -0.402392762491326, -0.402191440217491, -0.398620160881439, -0.366873527650917, -0.35788385867217, -0.340540089756868, -0.337349081024889, -0.328335725283617, -0.326256982594487, -0.319172743733056, -0.283536551482645, -0.201544176575946, -0.158827622418446, -0.0874584103134217, 5.75733114833721e-05, 0.00711247435174189, 0.0119141094780619, 0.0142999714851724, 0.0237947544260095, 0.028962807003728, 0.0504435384277691, 0.0506448607016037, 0.0734191385691725, 0.0859627732681778, 0.107466982896435, 0.112296211162227, 0.122315677921641, 0.124500575635478, 0.126579318324608, 0.130710526672205, 0.131606068222389, 0.133663557186039, 0.16929974943645, 0.251292124343149, 0.365377890605673, 0.454737405613056, 0.476631055345105, 0.481799107922823, 0.503481161620698, 0.579415619243703, 0.586499858105134, 0.656149860060726, 0.704128425262244, 0.746844979419744, 0.855944113774621), NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 25 43 19 24 14 9 7 45 16 15 27 16 42 26 28 47 12 35 37 9 46 21 30 27 33 [26] 11 28 14 40 17 13 54 31 5 44 36 36 46 33 29 39 52 26 31 33 40 36 8 31 14 [51] 53 22 15 39 8 38 26 43 20 34 50 10 1 41 17 37 28 41 41 51 49 34 4 18 53 [76] 6 17 26 15 19 2 48 3 10 46 38 43 23 34 21 32 ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch6# #argv <- list(c('1008', '1011', '1013', '1014', '1015', '1016', '1027', '1028', '1030', '1032', '1051', '1052', '1083', '1093', '1095', '1096', '110', '1102', '111', '1117', '112', '113', '116', '117', '1219', '125', '1250', '1251', '126', '127', '128', '1291', '1292', '1293', '1298', '1299', '130', '1308', '135', '1376', '1377', '1383', '1408', '1409', '141', '1410', '1411', '1413', '1418', '1422', '1438', '1445', '1456', '1492', '2001', '2316', '262', '266', '269', '270', '2708', '2714', '2715', '272', '2728', '2734', '280', '283', '286', '290', '3501', '411', '412', '475', '5028', '5042', '5043', '5044', '5045', '5047', '5049', '5050', '5051', '5052', '5053', '5054', '5055', '5056', '5057', '5058', '5059', '5060', '5061', '5062', '5066', '5067', '5068', '5069', '5070', '5072', '5073', '5115', '5160', '5165', '655', '724', '885', '931', '942', '952', '955', '958', 'c118', 'c168', 'c203', 'c204', 'c266'), NA_integer_, NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [26] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [51] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [76] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [101] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch7# #argv <- list(character(0), c('methods', 'utils', 'XML', 'RCurl'), 0L, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch8# #argv <- list(c('0', '1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15'), NA_real_, NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_match.testmatch9# #argv <- list(c(-1628571, -1628571, -1200000, -1200000, -1057143, -914286, -771429, -771429, -771429, -628571, -628571, -485714, -485714, -485714, -485714, -342857, -342857, -342857, -342857, -2e+05, -2e+05, -2e+05, -2e+05, -57143, -57143, -57143, 85714, 85714, 228571, 228571, 228571, 371429, 371429, 371429, 371429, 514286, 514286, 514286, 657143, 657143, 657143, 657143, 657143, 942857, 1085714, 1228571, 1228571, 1228571, 1228571, 1371429), c(-1628571, -1200000, -1057143, -914286, -771429, -628571, -485714, -342857, -2e+05, -57143, 85714, 228571, 371429, 514286, 657143, 942857, 1085714, 1228571, 1371429), NA_integer_, NULL); .Internal(match(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 1 2 2 3 4 5 5 5 6 6 7 7 7 7 8 8 8 8 9 9 9 9 10 10 [26] 10 11 11 12 12 12 13 13 13 13 14 14 14 15 15 15 15 15 16 17 18 18 18 18 19 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(NULL, NULL) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(NULL, c('a', 'b', 'c')) [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(NULL, c()) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(NULL, c(1, 2, 3)) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(NULL, character()) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(NULL, list()) [[1]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg#Ignored.ImplementationError# #match.arg(c('01'), list(as.raw(1)), T) Error in match.arg(c("01"), list(as.raw(1)), T) : 'arg' should be one of “as.raw(0x01)” ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('1'), c(1), F) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('1'), c(1), T) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('1'), list(1), T) [[1]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('1'), list(c(1, 11), 3, 2)) Error in match.arg(c("1"), list(c(1, 11), 3, 2)) : 'arg' should be one of “c(1, 11)”, “3”, “2” ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('1', '2'), c('1', '2'), F) [1] "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('1', '2'), c(1), T) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('1', '2'), c(1, 2), F) Error in match.arg(c("1", "2"), c(1, 2), F) : 'arg' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('1', '2'), list(1, 2), F) Error in match.arg(c("1", "2"), list(1, 2), F) : 'arg' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('1', '2'), list(1, 2), T) [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('1', 'a'), list(1, 3, 2, 'a'), T) [[1]] [1] 1 [[2]] [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg#Output.IgnoreErrorContext# #match.arg(c('2'), environment(), T) Error in as.character(table) : cannot coerce type 'environment' to vector of type 'character' ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('2'), list(2, environment()), T) [[1]] [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a'), c('a'), T) [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a'), c('b'), T) Error in match.arg(c("a"), c("b"), T) : 'arg' should be one of “b” ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a'), list('a', 'b'), F) [[1]] [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a'), list('a', 'b'), T) [[1]] [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a'), list(an='a', bn='b'), F) $an [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a'), list(an='a', bn='b'), T) $an [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', '1', '2L', '01', 'TRUE', '1+1i'), list('a', 1, 2L, TRUE, 1+1i, 'xxx'), T) [[1]] [1] "a" [[2]] [1] 1 [[3]] [1] TRUE [[4]] [1] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b'), c('a'), F) Error in match.arg(c("a", "b"), c("a"), F) : 'arg' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b'), c('a'), T) [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b'), c('a', 'b'), F) [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b'), c('a', 'b'), T) [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b'), c('b'), T) [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b'), list('a', 'b'), F) Error in match.arg(c("a", "b"), list("a", "b"), F) : 'arg' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b'), list('a', 'b'), T) [[1]] [1] "a" [[2]] [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b', 'c'), c('a', 'b'), T) [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b', 'c'), c('a', 'c'), T) [1] "a" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b', 'c'), c('b'), T) [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b', 'c'), c('b', 'c'), T) [1] "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'b', 'c'), c('c', 'b'), T) [1] "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'c'), list('a', 'b', 'c'), F) Error in match.arg(c("a", "c"), list("a", "b", "c"), F) : 'arg' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'c'), list('a', 'b', 'c'), T) [[1]] [1] "a" [[2]] [1] "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'c'), list(an='a', bn='b', 'c'), T) $an [1] "a" [[2]] [1] "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(c('a', 'c'), list(an='a', bn='b', cn='c'), T) $an [1] "a" $cn [1] "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #match.arg(list('a', 'b'), 'c', T) Error in match.arg(list("a", "b"), "c", T) : 'arg' must be NULL or a character vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ as.character.foo <- function(x) 'bar'; x <- 42; class(x) <- 'foo'; match.arg('ba', x) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-as.raw(c(1, 2)); names(v) <- c('an', 'bn'); match.arg(c('01'), v, F) } an 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-as.raw(c(1, 2)); names(v) <- c('an', 'bn'); match.arg(c('01'), v, T) } an 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c('a', 'b'); names(v) <- c('an', 'bn'); match.arg(c('a', 'b'), v, F) } Error in match.arg(c("a", "b"), v, F) : 'arg' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c('a', 'b'); names(v) <- c('an', 'bn'); match.arg(c('a', 'b'), v, T) } an bn "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c('a', 'b'); names(v) <- c('an', 'bn'); match.arg(c('b'), v, F) } bn "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c('a', 'b'); names(v) <- c('an', 'bn'); match.arg(c('b'), v, T) } bn "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c(1+1i, 2+1i); names(v) <- c('an', 'bn'); match.arg(c('1+1i'), v, F) } an 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c(1+1i, 2+1i); names(v) <- c('an', 'bn'); match.arg(c('1+1i'), v, T) } an 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c(1, 2); names(v) <- c('an', 'bn'); match.arg(c('1'), v, F) } an 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c(1, 2); names(v) <- c('an', 'bn'); match.arg(c('1'), v, T) } an 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c(1L, 2L); names(v) <- c('an', 'bn'); match.arg(c('1'), v, F) } an 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c(1L, 2L); names(v) <- c('an', 'bn'); match.arg(c('1'), v, T) } an 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c(T, F); names(v) <- c('an', 'bn'); match.arg(c('F'), v, F) } bn FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_matcharg.testMatchArg# #{ v<-c(T, F); names(v) <- c('an', 'bn'); match.arg(c('F'), v, T) } bn FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #fn3 <- function(...) { (function(...) match.call(cat, call("cat", "abc", p=3,as.symbol("...")), expand.dots = FALSE))(...) }; fn3(sep=x,lab="b",fill=13) cat(... = pairlist("abc", p = 3, lab = "b"), sep = ..1, fill = 13) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #fn3 <- function(...) { (function(...) match.call(cat, call("cat", "abc", p=3,as.symbol("...")), expand.dots = TRUE))(...) }; fn3(sep=x,lab="b",fill=13) cat("abc", p = 3, lab = "b", sep = ..1, fill = 13) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f <- function(a, ...) { UseMethod('f1', a) };f1.default <- function(a, b=2, c=3, d=4, e=5, ...) { match.call() };f(a=1); f(a=1, b=2); f(a=1, b=2, c=3);f(a=1, b=2, d=4);f(a=1, c=3, d=4, e=5) } f1.default(a = 1, c = 3, d = 4, e = 5) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f <- function(a, b, c, d, e) { UseMethod('f1', a) };f1.default <- function(a, b=2, c=3, d=4, e=5) { match.call() };f(a=1); f(a=1, b=2); f(a=1, b=2, c=3);f(a=1, b=2, d=4);f(a=1, c=3, d=4, e=5) } f1.default(a = 1, c = 3, d = 4, e = 5) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(...) f1(...); f2("a") } [[1]] [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(...) f1(...); f2(c("a")) } [[1]] ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(...) f1(...); f2(c("a"), b="b") } [[1]] ..1 $b [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(...) f1(...); f2(c("a"), c("b")) } [[1]] ..1 [[2]] ..2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(...) f1(...); typeof(f2("a")[[1]]) } [1] "character" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(...) f1(...); typeof(f2(c("a"))[[1]]) } [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(x, ...) f1(x, ...); f2("a") } [[1]] x ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(x, ...) f1(x, ...); f2(c("a")) } [[1]] x ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(x, ...) f1(x, ...); f2(c("a"), c("b")) } [[1]] x [[2]] ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(x, ...) f1(x, ...); f2(c("a"), x="b") } [[1]] x [[2]] ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(x, ...) f1(x, ...); typeof(f2("a")[[1]]) } [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { dots <- match.call(expand.dots = FALSE)$...; dots }; f2<-function(x, ...) f1(x, ...); typeof(f2(c("a"))[[1]]) } [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ f1<-function(...) { match.call(expand.dots=FALSE)$... }; f1() } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fd <- function(...) match.call(); fd() } fd() ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fd <- function(...) match.call(); fd(1, 2) } fd(1, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fd <- function(...) match.call(); fd(x=1,y=2) } fd(x = 1, y = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fd <- function(...) match.call(); fd(y=2, x=1) } fd(y = 2, x = 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdf <- function(...) match.call(expand.dots=F); fdf() } fdf() ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdf <- function(...) match.call(expand.dots=F); fdf(1, 2) } fdf(... = pairlist(1, 2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdf <- function(...) match.call(expand.dots=F); fdf(x=1,y=2) } fdf(... = pairlist(x = 1, y = 2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdf <- function(...) match.call(expand.dots=F); fdf(y=2, x=1) } fdf(... = pairlist(y = 2, x = 1)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdx <- function(x, ...) match.call(); fdx() } fdx() ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdx <- function(x, ...) match.call(); fdx(1, 2) } fdx(x = 1, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdx <- function(x, ...) match.call(); fdx(x=1,y=2) } fdx(x = 1, y = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdx <- function(x, ...) match.call(); fdx(y=2, x=1) } fdx(x = 1, y = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxf <- function(x, ...) match.call(expand.dots=F); fdxf() } fdxf() ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxf <- function(x, ...) match.call(expand.dots=F); fdxf(1, 2) } fdxf(x = 1, ... = pairlist(2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxf <- function(x, ...) match.call(expand.dots=F); fdxf(x=1,y=2) } fdxf(x = 1, ... = pairlist(y = 2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxf <- function(x, ...) match.call(expand.dots=F); fdxf(y=2, x=1) } fdxf(x = 1, ... = pairlist(y = 2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxy <- function(x, ..., y) match.call(); fdxy() } fdxy() ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxy <- function(x, ..., y) match.call(); fdxy(1, 2, 3) } fdxy(x = 1, 2, 3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxy <- function(x, ..., y) match.call(); fdxy(2, 3, x=1) } fdxy(x = 1, 2, 3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxy <- function(x, ..., y) match.call(); fdxy(y=4, 1, 2, 3) } fdxy(x = 1, 2, 3, y = 4) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxy <- function(x, ..., y) match.call(); fdxy(y=4, 2, 3, x=1) } fdxy(x = 1, 2, 3, y = 4) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxyf <- function(x, ..., y) match.call(expand.dots=F); fdxyf() } fdxyf() ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxyf <- function(x, ..., y) match.call(expand.dots=F); fdxyf(1, 2, 3) } fdxyf(x = 1, ... = pairlist(2, 3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxyf <- function(x, ..., y) match.call(expand.dots=F); fdxyf(2, 3, x=1) } fdxyf(x = 1, ... = pairlist(2, 3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxyf <- function(x, ..., y) match.call(expand.dots=F); fdxyf(y=4, 1, 2, 3) } fdxyf(x = 1, ... = pairlist(2, 3), y = 4) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fdxyf <- function(x, ..., y) match.call(expand.dots=F); fdxyf(y=4, 2, 3, x=1) } fdxyf(x = 1, ... = pairlist(2, 3), y = 4) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ foo<-function(...) match.call(expand.dots=F); bar<-function(x) x; y<-42; foo(bar(y), 7) } foo(... = pairlist(bar(y), 7)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fxy <- function(x, y) match.call(); fxy() } fxy() ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fxy <- function(x, y) match.call(); fxy(1, 2) } fxy(x = 1, y = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fxy <- function(x, y) match.call(); fxy(x=1, y=2) } fxy(x = 1, y = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testMatchCall# #{ fxy <- function(x, y) match.call(); fxy(y=2, x=1) } fxy(x = 1, y = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchcall.testS3DispatchAndMatchcall# #{foo.default<-function(a,b,...,c)match.call(); foo<-function(x,...)UseMethod('foo'); foo(2,3,c=4);} foo.default(a = 2, b = 3, c = 4) ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #f <- function() { min <- 1; match.fun('min')}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #f <- function() { min <- 1; match.fun('min', descend=F)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #f <- function() { min <- 1; match.fun('min', descend=T)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #f <- function() { min <- 1; match.fun(as.symbol('min'))}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #f <- function() { min <- 1; match.fun(as.symbol('min'), descend=F)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #f <- function() { min <- 1; match.fun(as.symbol('min'), descend=T)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #f <- function(x) { match.fun(x, descend=T)}; f2 <- function() { min <- max; f(min) }; f2() function (..., na.rm = FALSE) .Primitive("max") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #f <- function(x) { min <- 1; match.fun(x)}; f(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #f <- function(x) { min <- 1; match.fun(x, descend=F)}; f(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #f <- function(x) { min <- 1; match.fun(x, descend=T)}; f(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function() { match.fun('min')}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function() { match.fun('min', descend=F)}; f() Error in match.fun("min", descend = F) : found non-function '1' ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function() { match.fun('min', descend=T)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function() { match.fun(as.raw(100))}; f() Error in match.fun(as.raw(100)) : 'as.raw(100)' is not a function, character or symbol ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function() { match.fun(as.symbol('min'))}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function() { match.fun(as.symbol('min'), descend=F)}; f() Error in match.fun(as.symbol("min"), descend = F) : found non-function '1' ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function() { match.fun(as.symbol('min'), descend=T)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function() { match.fun(c('min'))}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function() { match.fun(c('min', 'max'))}; f() Error in match.fun(c("min", "max")) : 'c("min", "max")' is not a function, character or symbol ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function() { match.fun(c(1L))}; f() Error in match.fun(c(1L)) : 'c(1L)' is not a function, character or symbol ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun#Output.IgnoreErrorContext# #min <- 1; f <- function(min) { match.fun(min)}; f(baz) Error in match.fun(min) : object 'baz' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function(min) { match.fun(min)}; f(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun#Output.IgnoreErrorContext# #min <- 1; f <- function(min) { match.fun(min, descend=F)}; f(baz) Error in match.fun(min, descend = F) : object 'baz' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function(min) { match.fun(min, descend=F)}; f(min) Error in match.fun(min, descend = F) : found non-function '1' ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun#Output.IgnoreErrorContext# #min <- 1; f <- function(min) { match.fun(min, descend=T)}; f(baz) Error in match.fun(min, descend = T) : object 'baz' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function(min) { match.fun(min, descend=T)}; f(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function(x) { match.fun(x)}; f(c('min')) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function(x) { match.fun(x)}; f(c('min', 'max')) Error in match.fun(x) : 'c("min", "max")' is not a function, character or symbol ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function(x) { match.fun(x)}; f(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function(x) { match.fun(x, descend=F)}; f(min) Error in match.fun(x, descend = F) : found non-function '1' ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; f <- function(x) { match.fun(x, descend=T)}; f(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; match.fun('min') function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; match.fun('min', descend=F) Error in match.fun("min", descend = F) : found non-function '1' ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; match.fun('min', descend=T) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; match.fun(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; match.fun(min, descend=F) Error in match.fun(min, descend = F) : found non-function '1' ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- 1; match.fun(min, descend=T) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #min <- function(x) x; f <- function(x) { match.fun(x, descend=T)}; f(min) function(x) x ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #x <- min; f <- function() { min <- 1; match.fun(x)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #x <- min; f <- function() { min <- 1; match.fun(x, descend=F)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #x <- min; f <- function() { min <- 1; match.fun(x, descend=T)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #x <- min; f <- function(x) { min <- 1; match.fun(x, descend=T)}; f2 <- function(max) f(max); f2(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #x <- min; f <- function(x) { min <- 1; match.fun(x, descend=T)}; f2 <- function(y) f(y); f2(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #x <- min; f <- function(x) { min <- function(x) x; match.fun(x, descend=T)}; f(min) function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #x <- min; min <- 1; f <- function() { match.fun(x)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #x <- min; min <- 1; f <- function() { match.fun(x, descend=F)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #x <- min; min <- 1; f <- function() { match.fun(x, descend=T)}; f() function (..., na.rm = FALSE) .Primitive("min") ##com.oracle.truffle.r.test.builtins.TestBuiltin_matchfun.testmatchfun# #{ foo <- function() { myfunc <- function(x) 42; lapply(2, 'myfunc'); }; boo <- function() { myfunc <- function(x) 42; lapply(2, 'myfunc'); }; list(foo = foo(), boo = boo()); } $foo $foo[[1]] [1] 42 $boo $boo[[1]] [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCornerCases# #c(1,2,3) %*% matrix(0, nrow=0, ncol=1) [,1] ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCornerCases# #c(1,2,3) %*% matrix(0, nrow=1, ncol=0) [1,] [2,] [3,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCornerCases# #matrix(0, nrow=0, ncol=1) %*% c(1,2,3) [,1] [,2] [,3] ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCornerCases# #matrix(0, nrow=0, ncol=1) %*% numeric() <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCornerCases# #matrix(0, nrow=1, ncol=0) %*% c(1,2,3) [1,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCornerCases# #matrix(0, nrow=1, ncol=0) %*% numeric() [,1] [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCornerCases# #numeric() %*% matrix(0, nrow=0, ncol=1) [,1] [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCornerCases# #numeric() %*% matrix(0, nrow=1, ncol=0) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCorrectDimnames# #3 %*% c(3,4,5,6) [,1] [,2] [,3] [,4] [1,] 9 12 15 18 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCorrectDimnames# #3L %*% c(3L,4L,5L,6L) [,1] [,2] [,3] [,4] [1,] 9 12 15 18 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCorrectDimnames# #NA %*% c(3,4,5,6) [,1] [,2] [,3] [,4] [1,] NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCorrectDimnames# #NA %*% c(3L,4L,5L,6L) [,1] [,2] [,3] [,4] [1,] NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCorrectDimnames# #c(1+2i) %*% c(3,4,5,6) [,1] [,2] [,3] [,4] [1,] 3+6i 4+8i 5+10i 6+12i ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCorrectDimnames# #c(NA+2i) %*% c(3,4,5,6) [,1] [,2] [,3] [,4] [1,] NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCorrectDimnames# #m1 <- matrix(1:6,3,2,dimnames=list(c('a','b','c'),c('c1','c2')));m2 <- matrix(c(3,4),2,1,dimnames=list(c('a2','b2'),c('col'))); m1 %*% m2; col a 19 b 26 c 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCorrectDimnames# #vec <- c(1,2); names(vec) <- c('a','b'); mat <- matrix(c(8,3),1,2,dimnames=list('row',c('c1','c2'))); vec %*% mat; c1 c2 [1,] 8 3 [2,] 16 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matmul.testMatmulCorrectDimnames# #x <- matrix(c(1,1,1,1,2,3), 3, 2); dimnames(x) <- list(c(1,2,3),c('','x')); coeff <- c(0,1); names(coeff) <- c('a', 'b'); x %*% coeff; [,1] 1 1 2 2 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testMatrixCharIndexing# #foo <- function(a, b) a[b]; m <- matrix(1:6, ncol=3, byrow=T, dimnames=list(letters[1:2], LETTERS[1:3])); foo(m, matrix(c(1,1, 1,2), ncol=2, byrow=T)); foo(m, c(1,1)); [1] 1 2 [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testMatrixCharIndexing# #m <- matrix(1:6, ncol=3, dimnames = list(letters[1:2], LETTERS[1:3])); indalpha <- matrix(c('a', 'A', 'b', 'B'), ncol=2, byrow=TRUE); indalphaNA <- indalpha; indalphaNA[1,2] <- NA; m[indalphaNA] [1] NA 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testMatrixCharIndexing# #m <- matrix(1:6, ncol=3, dimnames = list(letters[1:2], LETTERS[1:3])); indalpha <- matrix(c('a', 'B'), ncol=2, byrow=TRUE); m[indalpha] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testMatrixFastPath# #matrix(1,ncol=NULL, nrow=NULL) Error in matrix(1, ncol = NULL, nrow = NULL) : non-numeric matrix extent ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testMatrixFastPath# #matrix(1:9,,3) [,1] [,2] [,3] [1,] 1 4 7 [2,] 2 5 8 [3,] 3 6 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix1# #argv <- list(NA_real_, 1L, 5L, FALSE, list('Residuals', c('Df', 'Sum Sq', 'Mean Sq', 'F value', 'Pr(>F)')), FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) Df Sum Sq Mean Sq F value Pr(>F) Residuals NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix10# #argv <- list(c(1, 1, 1, 1, 1, 1), 1, 1, FALSE, NULL, TRUE, TRUE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [1,] 1 [2,] 1 [3,] 1 [4,] 1 [5,] 1 [6,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix11# #argv <- list(c(420.223016031624, 290.609964753365, 290.609964753365, 200), 2, 2, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [1,] 420.223 290.61 [2,] 290.610 200.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix12# #argv <- list(1:4, 1, 2, FALSE, NULL, TRUE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix13#Output.MissingWarning# #argv <- list(c(0, 0, 0, 0), 4L, 0L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1,] [2,] [3,] [4,] Warning message: data length exceeds size of matrix ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix13# #matrix(1:4, 2, 1) [,1] [1,] 1 [2,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix13#Output.MissingWarning# #matrix(1:4, 4, 0) [1,] [2,] [3,] [4,] Warning message: In matrix(1:4, 4, 0) : data length exceeds size of matrix ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix14# #argv <- list(0+0i, 7L, 2L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [1,] 0+0i 0+0i [2,] 0+0i 0+0i [3,] 0+0i 0+0i [4,] 0+0i 0+0i [5,] 0+0i 0+0i [6,] 0+0i 0+0i [7,] 0+0i 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix15# #argv <- list(0L, 1L, 2L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [1,] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix16# #argv <- list(0, 12L, 12L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [1,] 0 0 0 0 0 0 0 0 0 0 0 0 [2,] 0 0 0 0 0 0 0 0 0 0 0 0 [3,] 0 0 0 0 0 0 0 0 0 0 0 0 [4,] 0 0 0 0 0 0 0 0 0 0 0 0 [5,] 0 0 0 0 0 0 0 0 0 0 0 0 [6,] 0 0 0 0 0 0 0 0 0 0 0 0 [7,] 0 0 0 0 0 0 0 0 0 0 0 0 [8,] 0 0 0 0 0 0 0 0 0 0 0 0 [9,] 0 0 0 0 0 0 0 0 0 0 0 0 [10,] 0 0 0 0 0 0 0 0 0 0 0 0 [11,] 0 0 0 0 0 0 0 0 0 0 0 0 [12,] 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix17# #argv <- list(NA, 240, 4L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [1,] NA NA NA NA [2,] NA NA NA NA [3,] NA NA NA NA [4,] NA NA NA NA [5,] NA NA NA NA [6,] NA NA NA NA [7,] NA NA NA NA [8,] NA NA NA NA [9,] NA NA NA NA [10,] NA NA NA NA [11,] NA NA NA NA [12,] NA NA NA NA [13,] NA NA NA NA [14,] NA NA NA NA [15,] NA NA NA NA [16,] NA NA NA NA [17,] NA NA NA NA [18,] NA NA NA NA [19,] NA NA NA NA [20,] NA NA NA NA [21,] NA NA NA NA [22,] NA NA NA NA [23,] NA NA NA NA [24,] NA NA NA NA [25,] NA NA NA NA [26,] NA NA NA NA [27,] NA NA NA NA [28,] NA NA NA NA [29,] NA NA NA NA [30,] NA NA NA NA [31,] NA NA NA NA [32,] NA NA NA NA [33,] NA NA NA NA [34,] NA NA NA NA [35,] NA NA NA NA [36,] NA NA NA NA [37,] NA NA NA NA [38,] NA NA NA NA [39,] NA NA NA NA [40,] NA NA NA NA [41,] NA NA NA NA [42,] NA NA NA NA [43,] NA NA NA NA [44,] NA NA NA NA [45,] NA NA NA NA [46,] NA NA NA NA [47,] NA NA NA NA [48,] NA NA NA NA [49,] NA NA NA NA [50,] NA NA NA NA [51,] NA NA NA NA [52,] NA NA NA NA [53,] NA NA NA NA [54,] NA NA NA NA [55,] NA NA NA NA [56,] NA NA NA NA [57,] NA NA NA NA [58,] NA NA NA NA [59,] NA NA NA NA [60,] NA NA NA NA [61,] NA NA NA NA [62,] NA NA NA NA [63,] NA NA NA NA [64,] NA NA NA NA [65,] NA NA NA NA [66,] NA NA NA NA [67,] NA NA NA NA [68,] NA NA NA NA [69,] NA NA NA NA [70,] NA NA NA NA [71,] NA NA NA NA [72,] NA NA NA NA [73,] NA NA NA NA [74,] NA NA NA NA [75,] NA NA NA NA [76,] NA NA NA NA [77,] NA NA NA NA [78,] NA NA NA NA [79,] NA NA NA NA [80,] NA NA NA NA [81,] NA NA NA NA [82,] NA NA NA NA [83,] NA NA NA NA [84,] NA NA NA NA [85,] NA NA NA NA [86,] NA NA NA NA [87,] NA NA NA NA [88,] NA NA NA NA [89,] NA NA NA NA [90,] NA NA NA NA [91,] NA NA NA NA [92,] NA NA NA NA [93,] NA NA NA NA [94,] NA NA NA NA [95,] NA NA NA NA [96,] NA NA NA NA [97,] NA NA NA NA [98,] NA NA NA NA [99,] NA NA NA NA [100,] NA NA NA NA [101,] NA NA NA NA [102,] NA NA NA NA [103,] NA NA NA NA [104,] NA NA NA NA [105,] NA NA NA NA [106,] NA NA NA NA [107,] NA NA NA NA [108,] NA NA NA NA [109,] NA NA NA NA [110,] NA NA NA NA [111,] NA NA NA NA [112,] NA NA NA NA [113,] NA NA NA NA [114,] NA NA NA NA [115,] NA NA NA NA [116,] NA NA NA NA [117,] NA NA NA NA [118,] NA NA NA NA [119,] NA NA NA NA [120,] NA NA NA NA [121,] NA NA NA NA [122,] NA NA NA NA [123,] NA NA NA NA [124,] NA NA NA NA [125,] NA NA NA NA [126,] NA NA NA NA [127,] NA NA NA NA [128,] NA NA NA NA [129,] NA NA NA NA [130,] NA NA NA NA [131,] NA NA NA NA [132,] NA NA NA NA [133,] NA NA NA NA [134,] NA NA NA NA [135,] NA NA NA NA [136,] NA NA NA NA [137,] NA NA NA NA [138,] NA NA NA NA [139,] NA NA NA NA [140,] NA NA NA NA [141,] NA NA NA NA [142,] NA NA NA NA [143,] NA NA NA NA [144,] NA NA NA NA [145,] NA NA NA NA [146,] NA NA NA NA [147,] NA NA NA NA [148,] NA NA NA NA [149,] NA NA NA NA [150,] NA NA NA NA [151,] NA NA NA NA [152,] NA NA NA NA [153,] NA NA NA NA [154,] NA NA NA NA [155,] NA NA NA NA [156,] NA NA NA NA [157,] NA NA NA NA [158,] NA NA NA NA [159,] NA NA NA NA [160,] NA NA NA NA [161,] NA NA NA NA [162,] NA NA NA NA [163,] NA NA NA NA [164,] NA NA NA NA [165,] NA NA NA NA [166,] NA NA NA NA [167,] NA NA NA NA [168,] NA NA NA NA [169,] NA NA NA NA [170,] NA NA NA NA [171,] NA NA NA NA [172,] NA NA NA NA [173,] NA NA NA NA [174,] NA NA NA NA [175,] NA NA NA NA [176,] NA NA NA NA [177,] NA NA NA NA [178,] NA NA NA NA [179,] NA NA NA NA [180,] NA NA NA NA [181,] NA NA NA NA [182,] NA NA NA NA [183,] NA NA NA NA [184,] NA NA NA NA [185,] NA NA NA NA [186,] NA NA NA NA [187,] NA NA NA NA [188,] NA NA NA NA [189,] NA NA NA NA [190,] NA NA NA NA [191,] NA NA NA NA [192,] NA NA NA NA [193,] NA NA NA NA [194,] NA NA NA NA [195,] NA NA NA NA [196,] NA NA NA NA [197,] NA NA NA NA [198,] NA NA NA NA [199,] NA NA NA NA [200,] NA NA NA NA [201,] NA NA NA NA [202,] NA NA NA NA [203,] NA NA NA NA [204,] NA NA NA NA [205,] NA NA NA NA [206,] NA NA NA NA [207,] NA NA NA NA [208,] NA NA NA NA [209,] NA NA NA NA [210,] NA NA NA NA [211,] NA NA NA NA [212,] NA NA NA NA [213,] NA NA NA NA [214,] NA NA NA NA [215,] NA NA NA NA [216,] NA NA NA NA [217,] NA NA NA NA [218,] NA NA NA NA [219,] NA NA NA NA [220,] NA NA NA NA [221,] NA NA NA NA [222,] NA NA NA NA [223,] NA NA NA NA [224,] NA NA NA NA [225,] NA NA NA NA [226,] NA NA NA NA [227,] NA NA NA NA [228,] NA NA NA NA [229,] NA NA NA NA [230,] NA NA NA NA [231,] NA NA NA NA [232,] NA NA NA NA [233,] NA NA NA NA [234,] NA NA NA NA [235,] NA NA NA NA [236,] NA NA NA NA [237,] NA NA NA NA [238,] NA NA NA NA [239,] NA NA NA NA [240,] NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix18# #argv <- list(c(1448665, 18316380, 77.4, 139.8, 2251281, 26424236, 120.3, 201.7, NA, NA, 1835812, 22608335, 98.1, 172.5), 2L, 7L, FALSE, list(c('Ncells', 'Vcells'), c('used', '(Mb)', 'gc trigger', '(Mb)', 'limit (Mb)', 'max used', '(Mb)')), FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) used (Mb) gc trigger (Mb) limit (Mb) max used (Mb) Ncells 1448665 77.4 2251281 120.3 NA 1835812 98.1 Vcells 18316380 139.8 26424236 201.7 NA 22608335 172.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix19# #argv <- list(c('315.45', '363.01', '405.02', '443.06', '478.09', '510.72'), 1L, 1, TRUE, list('1979', c('Jan', 'Feb', 'Mar', 'Apr', 'May', 'Jun')), FALSE, TRUE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) Jan Feb Mar Apr May Jun 1979 "315.45" "363.01" "405.02" "443.06" "478.09" "510.72" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix2# #argv <- list(c(NA, 'a', 'b', '10', NA, NA, 'd', '12', NA, NA, NA, '14'), 1, 4, TRUE, NULL, TRUE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [1,] NA "a" "b" "10" [2,] NA NA "d" "12" [3,] NA NA NA "14" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix20# #argv <- list('', 0L, 0L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix21# #argv <- list(character(0), 0L, 2L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix22# #argv <- list(raw(0), 0L, 0L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix23# #argv <- list(character(0), 0L, 17L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [,14] [,15] [,16] [,17] ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix24# #argv <- list(c(TRUE, FALSE, FALSE, TRUE), 2L, 2L, TRUE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [1,] TRUE FALSE [2,] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix25# #argv <- list(c(0.342020143325669, 0, -0.939692620785908, 0, 1, 0, 0.939692620785908, 0, 0.342020143325669), 3, 3, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [1,] 0.3420201 0 0.9396926 [2,] 0.0000000 1 0.0000000 [3,] -0.9396926 0 0.3420201 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix26# #argv <- list(NA_integer_, 1L, 1L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [1,] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix27# #argv <- list(numeric(0), 1, 1L, FALSE, NULL, TRUE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix28# #argv <- list(NA_complex_, 5L, 1L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [1,] NA [2,] NA [3,] NA [4,] NA [5,] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix29# #argv <- list(NA_character_, 4L, 17L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [,14] [1,] NA NA NA NA NA NA NA NA NA NA NA NA NA NA [2,] NA NA NA NA NA NA NA NA NA NA NA NA NA NA [3,] NA NA NA NA NA NA NA NA NA NA NA NA NA NA [4,] NA NA NA NA NA NA NA NA NA NA NA NA NA NA [,15] [,16] [,17] [1,] NA NA NA [2,] NA NA NA [3,] NA NA NA [4,] NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix3# #argv <- list(NA, 0L, 0L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix30# #argv <- list(c(2.8421709430404e-14, 0, 0, 0, 0, 0, 0, -4.44089209850063e-16, 0, 0, 0, 0, 0, 0, 4.44089209850063e-16, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 7.105427357601e-15), 6L, 6L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [,5] [,6] [1,] 2.842171e-14 0.000000e+00 0.000000e+00 0 0 0.000000e+00 [2,] 0.000000e+00 -4.440892e-16 0.000000e+00 0 0 0.000000e+00 [3,] 0.000000e+00 0.000000e+00 4.440892e-16 0 0 0.000000e+00 [4,] 0.000000e+00 0.000000e+00 0.000000e+00 0 0 0.000000e+00 [5,] 0.000000e+00 0.000000e+00 0.000000e+00 0 0 0.000000e+00 [6,] 0.000000e+00 0.000000e+00 0.000000e+00 0 0 7.105427e-15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix31# #argv <- list(structure(integer(0), .Dim = c(0L, 2L), .Dimnames = list(NULL, c('row', 'col'))), 0, 2, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix32# #argv <- list(c(24.2407407407407, 22.3953488372093, 24.4761904761905, 25.625, 24.3518518518519, 30.8333333333333, 30.8333333333333, 30.8333333333333, 24.2037037037037, 30.5, 30.5, 30.5, 24.4444444444444, 30.8571428571429, 30.8571428571429, 30.8571428571429, 24.2037037037037, 30.5, 30.5, 30.5, 24.2407407407407, 31.4545454545455, 31.4545454545455, 31.4545454545455, 24.8333333333333, 30.7857142857143, 30.7857142857143, 30.7857142857143, 24.7777777777778, 31.1428571428571, 31.1428571428571, 31.1428571428571, 24.2407407407407, 31.4545454545455, 31.4545454545455, 31.4545454545455, 24.2407407407407, 31.4545454545455, 31.4545454545455, 31.4545454545455, 24.2037037037037, 30.5, 30.5, 30.5, 24.5185185185185, 30.6428571428571, 30.6428571428571, 30.6428571428571, 24.8333333333333, 31.2857142857143, 31.2857142857143, 31.2857142857143, 24.8333333333333, 22.75, 20.5789473684211, 20.5789473684211, 24.5185185185185, 22.375, 24.4, 23.5833333333333, 24.8148148148148, 22.4615384615385, 20.2222222222222, 20.2222222222222, 24.4444444444444, 22.2, 24.05, 24.05, 24.3518518518519, 30.8333333333333, 30.8333333333333, 30.8333333333333, 24.8148148148148, 22.4615384615385, 24.3809523809524, 25.5714285714286, 24.8333333333333, 22.575, 24.3333333333333, 23.5384615384615, 24.4444444444444, 22.2, 24.05, 24.05, 24.3518518518519, 30.8333333333333, 30.8333333333333, 30.8333333333333, 24.2037037037037, 22.4047619047619, 24.4761904761905, 24.4761904761905, 24.8148148148148, 22.4615384615385, 24.3809523809524, 25.5714285714286, 24.8148148148148, 22.4615384615385, 24.3809523809524, 25.5714285714286, 24.3518518518519, 22.5, 20.695652173913, 20.695652173913, 24.2407407407407, 22.3953488372093, 24.4761904761905, 25.625, 24.5185185185185, 22.375, 24.4, 23.5833333333333, 24.2407407407407, 22.3953488372093, 24.4761904761905, 23.7692307692308, 24.4444444444444, 22.2, 24.05, 24.05, 24.5185185185185, 22.375, 20.35, 20.35, 24.5185185185185, 22.375, 24.4, 23.5833333333333, 24.7777777777778, 22.55, 24.65, 26, 24.8148148148148, 30.9333333333333, 30.9333333333333, 30.9333333333333, 24.7777777777778, 22.55, 24.65, 23.9230769230769, 24.8333333333333, 22.575, 24.3333333333333, 23.5384615384615, 24.7777777777778, 22.55, 24.65, 23.9230769230769, 24.8333333333333, 22.575, 20.6315789473684, 20.6315789473684, 24.8333333333333, 22.75, 24.7142857142857, 24.7142857142857, 24.8333333333333, 22.75, 24.7142857142857, 24.7142857142857, 24.8148148148148, 22.4615384615385, 20.2222222222222, 20.2222222222222, 24.2037037037037, 22.4047619047619, 20.3333333333333, 20.3333333333333, 24.7777777777778, 22.55, 20.45, 20.45, 24.8148148148148, 22.4615384615385, 20.2222222222222, 20.2222222222222, 24.3518518518519, 22.5, 24.6842105263158, 24.6842105263158, 24.8148148148148, 22.4615384615385, 20.2222222222222, 20.2222222222222, 24.4444444444444, 22.2, 20.35, 20.35, 24.2037037037037, 22.4047619047619, 24.4761904761905, 24.4761904761905, 24.5185185185185, 22.375, 20.35, 20.35, 24.8148148148148, 22.4615384615385, 20.2222222222222, 20.2222222222222, 24.8148148148148, 22.4615384615385, 20.2222222222222, 20.2222222222222, 24.3518518518519, 22.5, 20.695652173913, 20.695652173913, 24.8148148148148, 22.4615384615385, 20.2222222222222, 20.2222222222222, 24.8333333333333, 22.575, 20.6315789473684, 20.6315789473684, 24.7777777777778, 22.55, 20.45, 20.45, 24.8333333333333, 22.75, 20.5789473684211, 20.5789473684211, 24.8333333333333, 22.575, 20.6315789473684, 20.6315789473684, 24.8333333333333, 22.75, 20.5789473684211, 20.5789473684211, 24.4444444444444, 22.2, 20.35, 20.35, 24.8148148148148, 22.4615384615385, 20.2222222222222, 20.2222222222222), 60L, 1, TRUE, list(c('Eagle Summit 4', 'Ford Escort 4', 'Ford Festiva 4', 'Honda Civic 4', 'Mazda Protege 4', 'Mercury Tracer 4', 'Nissan Sentra 4', 'Pontiac LeMans 4', 'Subaru Loyale 4', 'Subaru Justy 3', 'Toyota Corolla 4', 'Toyota Tercel 4', 'Volkswagen Jetta 4', 'Chevrolet Camaro V8', 'Dodge Daytona', 'Ford Mustang V8', 'Ford Probe', 'Honda Civic CRX Si 4', 'Honda Prelude Si 4WS 4', 'Nissan 240SX 4', 'Plymouth Laser', 'Subaru XT 4', 'Audi 80 4', 'Buick Skylark 4', 'Chevrolet Beretta 4', 'Chrysler Le Baron V6', 'Ford Tempo 4', 'Honda Accord 4', 'Mazda 626 4', 'Mitsubishi Galant 4', 'Mitsubishi Sigma V6', 'Nissan Stanza 4', 'Oldsmobile Calais 4', 'Peugeot 405 4', 'Subaru Legacy 4', 'Toyota Camry 4', 'Volvo 240 4', 'Acura Legend V6', 'Buick Century 4', 'Chrysler Le Baron Coupe', 'Chrysler New Yorker V6', 'Eagle Premier V6', 'Ford Taurus V6', 'Ford Thunderbird V6', 'Hyundai Sonata 4', 'Mazda 929 V6', 'Nissan Maxima V6', 'Oldsmobile Cutlass Ciera 4', 'Oldsmobile Cutlass Supreme V6', 'Toyota Cressida 6', 'Buick Le Sabre V6', 'Chevrolet Caprice V8', 'Ford LTD Crown Victoria V8', 'Chevrolet Lumina APV V6', 'Dodge Grand Caravan V6', 'Ford Aerostar V6', 'Mazda MPV V6', 'Mitsubishi Wagon 4', 'Nissan Axxess 4', 'Nissan Van 4'), structure(c('0.79767456', '0.28300396', '0.04154257', '0.01132626'), .Names = c('1', '2', '3', '4'))), FALSE, TRUE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) 0.79767456 0.28300396 0.04154257 0.01132626 Eagle Summit 4 24.24074 22.39535 24.47619 25.62500 Ford Escort 4 24.35185 30.83333 30.83333 30.83333 Ford Festiva 4 24.20370 30.50000 30.50000 30.50000 Honda Civic 4 24.44444 30.85714 30.85714 30.85714 Mazda Protege 4 24.20370 30.50000 30.50000 30.50000 Mercury Tracer 4 24.24074 31.45455 31.45455 31.45455 Nissan Sentra 4 24.83333 30.78571 30.78571 30.78571 Pontiac LeMans 4 24.77778 31.14286 31.14286 31.14286 Subaru Loyale 4 24.24074 31.45455 31.45455 31.45455 Subaru Justy 3 24.24074 31.45455 31.45455 31.45455 Toyota Corolla 4 24.20370 30.50000 30.50000 30.50000 Toyota Tercel 4 24.51852 30.64286 30.64286 30.64286 Volkswagen Jetta 4 24.83333 31.28571 31.28571 31.28571 Chevrolet Camaro V8 24.83333 22.75000 20.57895 20.57895 Dodge Daytona 24.51852 22.37500 24.40000 23.58333 Ford Mustang V8 24.81481 22.46154 20.22222 20.22222 Ford Probe 24.44444 22.20000 24.05000 24.05000 Honda Civic CRX Si 4 24.35185 30.83333 30.83333 30.83333 Honda Prelude Si 4WS 4 24.81481 22.46154 24.38095 25.57143 Nissan 240SX 4 24.83333 22.57500 24.33333 23.53846 Plymouth Laser 24.44444 22.20000 24.05000 24.05000 Subaru XT 4 24.35185 30.83333 30.83333 30.83333 Audi 80 4 24.20370 22.40476 24.47619 24.47619 Buick Skylark 4 24.81481 22.46154 24.38095 25.57143 Chevrolet Beretta 4 24.81481 22.46154 24.38095 25.57143 Chrysler Le Baron V6 24.35185 22.50000 20.69565 20.69565 Ford Tempo 4 24.24074 22.39535 24.47619 25.62500 Honda Accord 4 24.51852 22.37500 24.40000 23.58333 Mazda 626 4 24.24074 22.39535 24.47619 23.76923 Mitsubishi Galant 4 24.44444 22.20000 24.05000 24.05000 Mitsubishi Sigma V6 24.51852 22.37500 20.35000 20.35000 Nissan Stanza 4 24.51852 22.37500 24.40000 23.58333 Oldsmobile Calais 4 24.77778 22.55000 24.65000 26.00000 Peugeot 405 4 24.81481 30.93333 30.93333 30.93333 Subaru Legacy 4 24.77778 22.55000 24.65000 23.92308 Toyota Camry 4 24.83333 22.57500 24.33333 23.53846 Volvo 240 4 24.77778 22.55000 24.65000 23.92308 Acura Legend V6 24.83333 22.57500 20.63158 20.63158 Buick Century 4 24.83333 22.75000 24.71429 24.71429 Chrysler Le Baron Coupe 24.83333 22.75000 24.71429 24.71429 Chrysler New Yorker V6 24.81481 22.46154 20.22222 20.22222 Eagle Premier V6 24.20370 22.40476 20.33333 20.33333 Ford Taurus V6 24.77778 22.55000 20.45000 20.45000 Ford Thunderbird V6 24.81481 22.46154 20.22222 20.22222 Hyundai Sonata 4 24.35185 22.50000 24.68421 24.68421 Mazda 929 V6 24.81481 22.46154 20.22222 20.22222 Nissan Maxima V6 24.44444 22.20000 20.35000 20.35000 Oldsmobile Cutlass Ciera 4 24.20370 22.40476 24.47619 24.47619 Oldsmobile Cutlass Supreme V6 24.51852 22.37500 20.35000 20.35000 Toyota Cressida 6 24.81481 22.46154 20.22222 20.22222 Buick Le Sabre V6 24.81481 22.46154 20.22222 20.22222 Chevrolet Caprice V8 24.35185 22.50000 20.69565 20.69565 Ford LTD Crown Victoria V8 24.81481 22.46154 20.22222 20.22222 Chevrolet Lumina APV V6 24.83333 22.57500 20.63158 20.63158 Dodge Grand Caravan V6 24.77778 22.55000 20.45000 20.45000 Ford Aerostar V6 24.83333 22.75000 20.57895 20.57895 Mazda MPV V6 24.83333 22.57500 20.63158 20.63158 Mitsubishi Wagon 4 24.83333 22.75000 20.57895 20.57895 Nissan Axxess 4 24.44444 22.20000 20.35000 20.35000 Nissan Van 4 24.81481 22.46154 20.22222 20.22222 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix33# #argv <- list(c(1+2i, 3-4i, 5+0i, -6+0i), 2L, 2L, TRUE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [1,] 1+2i 3-4i [2,] 5+0i -6+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix34# #argv <- list(NA, 2, 5, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [,5] [1,] NA NA NA NA NA [2,] NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix35# #argv <- list(structure(logical(0), .Dim = c(1L, 0L), .Dimnames = list('r', NULL)), 0L, 0L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix36# #argv <- list(c(0, 0, 0, 0, 0, 0, 4.94065645841247e-324, 0, 0, 0, 0, 0), structure(12L, .Names = '1'), 1L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [1,] 0.000000e+00 [2,] 0.000000e+00 [3,] 0.000000e+00 [4,] 0.000000e+00 [5,] 0.000000e+00 [6,] 0.000000e+00 [7,] 4.940656e-324 [8,] 0.000000e+00 [9,] 0.000000e+00 [10,] 0.000000e+00 [11,] 0.000000e+00 [12,] 0.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix37#Output.MissingWarning# #argv <- list(1:7, 3, 4, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [1,] 1 4 7 3 [2,] 2 5 1 4 [3,] 3 6 2 5 Warning message: data length [7] is not a sub-multiple or multiple of the number of rows [3] ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix38# #argv <- list(c(1, 3, 2, -2, 16, 4, 3, 3, 1, 32, -3, 2, 3, 2, 5, 1, 3, 4, 9, 0, 4, 16, 3, 5, 1, -1, 3, 2, -3, 4, 1, 2, 8, 0, 8, 5, 4, 2, 6, 5, 3, 1, 3, 1), 4L, 4L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [1,] 1 16 1 3 [2,] 3 4 32 2 [3,] 2 3 -3 5 [4,] -2 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix39#Output.MissingWarning# #argv <- list(c(-1, 4, 4, 9, 5, 1, 4, 8, 8, 2, 6, 0, 2, 3, 8, 8, 4, 4, 2, 3, 4, 0, -1, 7, 2, 4, 2, 3, 5, 6, 6, 5, 4, 3, 7, -1, 3, 1, -1, 2, 32, 1, 4, 4), 2L, 5L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [,5] [1,] -1 4 5 4 8 [2,] 4 9 1 8 2 Warning message: data length [44] is not a sub-multiple or multiple of the number of columns [5] ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix4# #argv <- list('foo', 1L, 1, FALSE, list(structure('object', simpleOnly = TRUE), NULL), FALSE, TRUE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] object "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix40# #argv <- list(c(1259, 845, 719, 390, 1360, 1053, 774, 413), 2, 1, TRUE, NULL, FALSE, TRUE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [1,] 1259 845 719 390 [2,] 1360 1053 774 413 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix41# #argv <- list(1:2, 2, 12, TRUE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [1,] 1 2 1 2 1 2 1 2 1 2 1 2 [2,] 1 2 1 2 1 2 1 2 1 2 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix42# #argv <- list(NA_character_, 1L, 17L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [,14] [1,] NA NA NA NA NA NA NA NA NA NA NA NA NA NA [,15] [,16] [,17] [1,] NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix43# #argv <- list(c('', '', '', '', '', '', ' 1', ' 2', ' 3', ' 4', ' 5', ' 6', ' 7', ' 8', ' 9', '10', '', '', '', '', '', '', '', ''), 1, 12, TRUE, list(c('1920', '1921'), c('Jan', 'Feb', 'Mar', 'Apr', 'May', 'Jun', 'Jul', 'Aug', 'Sep', 'Oct', 'Nov', 'Dec')), TRUE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec 1920 "" "" "" "" "" "" " 1" " 2" " 3" " 4" " 5" " 6" 1921 " 7" " 8" " 9" "10" "" "" "" "" "" "" "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix44# #argv <- list(structure(list(a1 = 1:3, a2 = 4:6, a3 = 3.14159265358979, a4 = c('a', 'b', 'c')), .Names = c('a1', 'a2', 'a3', 'a4')), 2, 2, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [1,] Integer,3 3.141593 [2,] Integer,3 Character,3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix5# #argv <- list(c(1, 2, 3, 0, 10, NA), 3, 2, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [1,] 1 0 [2,] 2 10 [3,] 3 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix6# #argv <- list(1:25, 5, 5, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [,4] [,5] [1,] 1 6 11 16 21 [2,] 2 7 12 17 22 [3,] 3 8 13 18 23 [4,] 4 9 14 19 24 [5,] 5 10 15 20 25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix7# #argv <- list('ANY', 2L, 3L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [,2] [,3] [1,] "ANY" "ANY" "ANY" [2,] "ANY" "ANY" "ANY" ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix8# #argv <- list(0L, 1L, 1L, TRUE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [,1] [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_matrix.testmatrix9# #argv <- list(0L, 0L, 0L, FALSE, NULL, FALSE, FALSE); .Internal(matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #max(c(1,NA,2), na.rm=NA) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #max(v<-42) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ is.logical(max(TRUE)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ is.logical(max(TRUE, FALSE)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max("42", "7") } [1] "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max("42", as.character(NA), "7", na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max("42", as.character(NA), "7", na.rm=TRUE) } [1] "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max("42", as.character(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max("42", as.character(NA), na.rm=TRUE) } [1] "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max("hi","abbey","hello") } [1] "hi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max((-1):100) } [1] 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max() } [1] -Inf Warning message: In max() : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(0/0, 1.1) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(0/0, 1.1, NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(123, NA, TRUE, 12, FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(123, NA, TRUE, 12, FALSE, na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(123, NA, TRUE, 12, FALSE, na.rm=TRUE) } [1] 123 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(1:10, 100:200, c(4.0, 5.0)) } [1] 200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(1:10, 100:200, c(4.0, 5.0), c(TRUE,FALSE,NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(2L, 4L) } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(42+42i, 7+7i) } Error in max(42 + (0+42i), 7 + (0+7i)) : invalid 'type' (complex) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(42, as.double(NA), 7, na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(42, as.double(NA), 7, na.rm=TRUE) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(42, as.double(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(42, as.double(NA), na.rm=TRUE) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(42L, as.integer(NA), 7L, na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(42L, as.integer(NA), 7L, na.rm=TRUE) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(42L, as.integer(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(42L, as.integer(NA), na.rm=TRUE) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(NA, 1.1) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(NULL) } [1] -Inf Warning message: In max(NULL) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.character(NA), as.character(NA), "42", "7", na.rm=TRUE) } [1] "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.character(NA), as.character(NA), "42", na.rm=TRUE) } [1] "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.character(NA), as.character(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.character(NA), as.character(NA), na.rm=TRUE) } [1] NA Warning message: In max(as.character(NA), as.character(NA), na.rm = TRUE) : no non-missing arguments, returning NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.character(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.character(NA), na.rm=TRUE) } [1] NA Warning message: In max(as.character(NA), na.rm = TRUE) : no non-missing arguments, returning NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.double(NA), as.double(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.double(NA), as.double(NA), na.rm=TRUE) } [1] -Inf Warning message: In max(as.double(NA), as.double(NA), na.rm = TRUE) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.double(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.double(NA), na.rm=TRUE) } [1] -Inf Warning message: In max(as.double(NA), na.rm = TRUE) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.integer(NA), as.integer(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.integer(NA), as.integer(NA), na.rm=TRUE) } [1] -Inf Warning message: In max(as.integer(NA), as.integer(NA), na.rm = TRUE) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.integer(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.integer(NA), na.rm=TRUE) } [1] -Inf Warning message: In max(as.integer(NA), na.rm = TRUE) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(as.raw(42), as.raw(7)) } Error in max(as.raw(42), as.raw(7)) : invalid 'type' (raw) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(c("hi","abbey","hello")) } [1] "hi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(c(as.character(NA), "foo")) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(character()) } [1] NA Warning message: In max(character()) : no non-missing arguments, returning NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(character(0)) } [1] NA Warning message: In max(character(0)) : no non-missing arguments, returning NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(double()) } [1] -Inf Warning message: In max(double()) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(double(0)) } [1] -Inf Warning message: In max(double(0)) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(integer()) } [1] -Inf Warning message: In max(integer()) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(integer(0)) } [1] -Inf Warning message: In max(integer(0)) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(logical(0)) } [1] -Inf Warning message: In max(logical(0)) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testMaximum# #{ max(seq_len(0)) } [1] -Inf Warning message: In max(seq_len(0)) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax1# #argv <- list(10L, 1L);max(argv[[1]],argv[[2]]); [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax10# #argv <- list(c(FALSE, FALSE));max(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax11# #argv <- list(numeric(0));max(argv[[1]]); [1] -Inf Warning message: In max(argv[[1]]) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax12# #argv <- list(4L, numeric(0));max(argv[[1]],argv[[2]]); [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax13# #argv <- list(6L, numeric(0));max(argv[[1]],argv[[2]]); [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax14# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));max(argv[[1]]); [1] 0.3333332 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax15# #argv <- list(c(1.2e+100, 1.3e+100));max(argv[[1]]); [1] 1.3e+100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax16# #argv <- list(structure(c(11368.8306749654, 11347.7238090355, 11341.9182102121, 11392.4878842821, 11367.3445285107, 11337.9245694652, 11332.0560643654, 11356.4682624019, 11387.6852128883, 11364.9132677, 11391.3319486445, 11374.2254758319, 11347.9708838458, 11353.2031583386, 11333.3748092474, 11323.9154302836, 11373.0896246266, 11330.2228965024, 11354.2399044028, 11367.8070731596, 11392.4287034031, 11357.6915504499, 11356.9044667059, 11335.1409634408, 11375.8374661156, 11354.7726842454, 11358.781884864, 11337.5281579299, 11339.0060699913, 11364.6998397419, 11363.2410538797, 11328.3945066198, 11325.487840571, 11367.9956844538, 11388.0030639744, 11364.8664695648, 11362.2630523606, 11359.821940674, 11391.9566656714, 11358.5349275633, 11370.7951655071, 11365.1078852355, 11339.7208074429, 11341.0716148671, 11374.0516736354, 11354.6799581982, 11335.2588737891, 11375.2688788734, 11330.349134828, 11383.518146432, 11366.0251480173, 11362.0011677193, 11346.0144123337, 11354.7192011815, 11358.0308680837, 11335.6606452791, 11360.0741421962, 11328.2693021996, 11342.4429152855, 11337.8889663466, 11342.9353336683, 11385.6565872063, 11354.2364726327, 11377.5989422849, 11384.6433324409, 11351.9186946652, 11327.4665936357, 11346.4841244179, 11373.6608162634, 11346.6330733448, 11367.1289885738, 11381.8430187805, 11382.9292165297, 11350.3951496719, 11349.6345719923, 11385.6811798196, 11368.1021034038, 11374.8755054101, 11365.3712412571, 11386.2157128048, 11343.5611108569, 11336.3882076922, 11385.0515660313, 11358.2337640012, 11384.3940280117, 11336.2435535709, 11376.0672136671, 11373.7149224868, 11389.0607372806, 11361.3352610911, 11372.8220707406, 11350.2233569878, 11330.0611188328, 11387.9111462012, 11342.8262750218, 11364.340121117, 11330.7252423461, 11381.8354922482, 11345.257457911, 11377.7995935893), class = 'Date'));max(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2001-02-15" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax17# #argv <- list(structure(c(3L, 2L, 1L), .Label = c('A', 'B', 'C'), class = c('ordered', 'factor')));max(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] C Levels: A < B < C ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax18# #argv <- list(structure(c(1338544800L, 1338566400L, 1338588000L, 1338609600L, 1338631200L, 1338652800L, 1338674400L, 1338696000L, 1338717600L, 1338739200L, 1338760800L, 1338782400L, 1338804000L, 1338825600L, 1338847200L, 1338868800L, 1338890400L, 1338912000L, 1338933600L, 1338955200L, 1338976800L, 1338998400L, 1339020000L, 1339041600L), class = c('POSIXct', 'POSIXt'), tzone = ''));max(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2012-06-01 16:00:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax19# #argv <- list(structure(list(c(1L, 2L, 4L), 1:3, c(2L, 1L)), class = c('package_version', 'numeric_version')));max(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] ‘1.2.4’ ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax2# #argv <- list(structure(c(1208822400, 1209168000, 1208822400, 1209168000), class = c('POSIXct', 'POSIXt')));max(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2008-04-26 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax20# #argv <- list(structure(c(1208822400, 1209168000), class = c('POSIXct', 'POSIXt'), tzone = 'GMT'));max(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] "2008-04-26 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax21# #argv <- list(structure(c(13823, NA), class = 'Date'));max(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2007-11-06" ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax22# #argv <- list(structure(c(7L, 4L, 3L), .Dim = 3L, .Dimnames = structure(list(c('0', '1', '5')), .Names = ''), class = 'table'));max(argv[[1]]); [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax23# #argv <- list(structure(c(0, 1, 1, 1, 1), .Names = c('Hair', 'Eye', 'Sex', 'Hair:Eye', 'Hair:Sex')));max(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax24# #argv <- list(structure(c(Inf, Inf, 2.248e+263, Inf, 3.777e+116, 1.128), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.')));max(argv[[1]]); [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax25# #argv <- list(structure(c(-11.3814849918875, -11.9361690778798, 0.562602893455921, 11.5126028934559, 76.2209544348296, -8.66448499188751, -6.94502893455923, -5.28148499188751, -35.7665182531098, 6.35497106544077, -9.20908119253651, -0.898484991887508, -5.59380090589508, -6.12730922120065, -13.3061334505138, 58.6278831800973, -15.1098009058951, -8.29625696322337, -4.07211681990265, 3.7096551514332, 2.60151500811249, 6.24733923742563, -1.33911681990266, -2.14157287723094, -10.5984849918875, -8.12802893455923, 1.30028697944835, -15.7450289345592, 7.20569077879935, -12.6484849918875, 25.1810423201731, -4.42680090589508, -1.90886979448351), .Names = c('Craig Dunain', 'Ben Rha', 'Ben Lomond', 'Goatfell', 'Bens of Jura', 'Cairnpapple', 'Scolty', 'Traprain', 'Lairig Ghru', 'Dollar', 'Lomonds', 'Cairn Table', 'Eildon Two', 'Cairngorm', 'Seven Hills', 'Knock Hill', 'Black Hill', 'Creag Beag', 'Kildcon Hill', 'Meall Ant-Suidhe', 'Half Ben Nevis', 'Cow Hill', 'N Berwick Law', 'Creag Dubh', 'Burnswark', 'Largo Law', 'Criffel', 'Acmony', 'Ben Nevis', 'Knockfarrel', 'Two Breweries', 'Cockleroi', 'Moffat Chase')));max(argv[[1]]); [1] 76.22095 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax26# #argv <- list(c(1, 0.987688340595138, 0.951056516295154, 0.891006524188368, 0.809016994374947, 0.707106781186547, 0.587785252292473, 0.453990499739547, 0.309016994374947, 0.156434465040231, -1.83697019872103e-16, -0.156434465040231, -0.309016994374948, -0.453990499739547, -0.587785252292473, -0.707106781186548, -0.809016994374948, -0.891006524188368, -0.951056516295154, -0.987688340595138, -1, -0.987688340595138, -0.951056516295154, -0.891006524188368, -0.809016994374947, -0.707106781186547, -0.587785252292473, -0.453990499739547, -0.309016994374947, -0.156434465040231, 6.12323399573677e-17, 0.156434465040231, 0.309016994374947, 0.453990499739547, 0.587785252292473, 0.707106781186548, 0.809016994374947, 0.891006524188368, 0.951056516295154, 0.987688340595138, 1, 0.987688340595138, 0.951056516295154, 0.891006524188368, 0.809016994374947, 0.707106781186548, 0.587785252292473, 0.453990499739547, 0.309016994374947, 0.156434465040231, 6.12323399573677e-17, -0.15643446504023, -0.309016994374947, -0.453990499739548, -0.587785252292473, -0.707106781186547, -0.809016994374947, -0.891006524188368, -0.951056516295154, -0.987688340595138, -1, -0.987688340595138, -0.951056516295154, -0.891006524188368, -0.809016994374948, -0.707106781186547, -0.587785252292473, -0.453990499739548, -0.309016994374948, -0.15643446504023, -1.83697019872103e-16, 0.15643446504023, 0.309016994374947, 0.453990499739547, 0.587785252292473, 0.707106781186547, 0.809016994374947, 0.891006524188368, 0.951056516295154, 0.987688340595138, 1, 0.987688340595138, 0.951056516295154, 0.891006524188368, 0.809016994374948, 0.707106781186547, 0.587785252292473, 0.453990499739548, 0.309016994374948, 0.15643446504023, 3.06161699786838e-16, -0.15643446504023, -0.309016994374947, -0.453990499739547, -0.587785252292473, -0.707106781186547, -0.809016994374947, -0.891006524188368, -0.951056516295153, -0.987688340595138, -1));max(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax28# #argv <- structure(list(2, 3, NA, na.rm = TRUE), .Names = c('', '', '', 'na.rm'));do.call('max', argv) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax29# #argv <- list(2, 3, NA);do.call('max', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax3# #argv <- list(5, 1, 0);max(argv[[1]],argv[[2]],argv[[3]]); [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax4# #argv <- list(c(NA, 1, 2, 3, -Inf, NaN, Inf));max(argv[[1]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax5# #max( ); [1] -Inf Warning message: In max() : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax6# #argv <- list(1L, structure(1:10, .Label = c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j'), class = 'factor'));max(argv[[1]],argv[[2]]); [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax7# #argv <- list(1573.05073007216, 1000);max(argv[[1]],argv[[2]]); [1] 1573.051 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax8# #argv <- list(structure(c(6L, 3L, 8L, 4L, 4L, 5L, 7L, 8L, 5L), .Dim = 9L, .Dimnames = structure(list(state.division = c('New England', 'Middle Atlantic', 'South Atlantic', 'East South Central', 'West South Central', 'East North Central', 'West North Central', 'Mountain', 'Pacific')), .Names = 'state.division'), class = 'table'));max(argv[[1]]); [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_max.testmax9# #argv <- list(structure(list(x = c(-1, 1, 1, -1, -1, 1, 1, -1), y = c(-0.701149425287356, -0.701149425287356, -0.701149425287356, -0.701149425287356, 0.701149425287356, 0.701149425287356, 0.701149425287356, 0.701149425287356), z = c(-0.4, -0.4, 0.4, 0.4, -0.4, -0.4, 0.4, 0.4)), .Names = c('x', 'y', 'z'), row.names = c(NA, -8L), class = 'data.frame'));max(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #max.col(structure(c(-Inf, 2, 3, NA, 4, Inf, 6, NA, -2), .Dim = c(3L, 3L)), 'first'); [1] NA NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #max.col(structure(c(-Inf, 2, 3, NA, 4, Inf, 6, NA, -2), .Dim = c(3L, 3L)), 'last'); [1] NA NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #max.col(structure(c(1, 2, 3, NA, 4, 5, 6, NA, -2), .Dim = c(3L, 3L)), 'first'); [1] NA NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #max.col(structure(c(1, 2, 3, NA, 4, 5, 6, NA, -2), .Dim = c(3L, 3L)), 'last'); [1] NA NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #max.col(structure(c(1, 3, 2, 1, 2, 3, 1, 4, 0, 2, 2, 3, 0, 4, 7, 2, 5, 3, 2, 2, 4, 1, 4, 5, 1, 5, 4, 0, 1, 1, 0, 3, 7, -1, 1, 5), .Dim = c(3L, 12L)), 'first'); [1] 4 6 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #max.col(structure(c(1, 3, 2, 1, 2, 3, 1, 4, 0, 2, 2, 3, 0, 4, 7, 2, 5, 3, 2, 2, 4, 1, 4, 5, 1, 5, 4, 0, 1, 1, 0, 3, 7, -1, 1, 5), .Dim = c(3L, 12L)), 'last'); [1] 7 9 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #max.col(structure(c(1, NA, NA, Inf), .Dim = c(2L, 2L)), 'first'); [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #max.col(structure(c(1, NA, NA, Inf), .Dim = c(2L, 2L)), 'last'); [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #{ set.seed(1); max.col(structure(c(-Inf, 2, 3, NA, 4, Inf, 6, NA, -2), .Dim = c(3L, 3L)), 'random'); } [1] NA NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #{ set.seed(1); max.col(structure(c(1, 2, 3, NA, 4, 5, 6, NA, -2), .Dim = c(3L, 3L)), 'random'); } [1] NA NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #{ set.seed(1); max.col(structure(c(1, 3, 2, 1, 2, 3, 1, 4, 0, 2, 2, 3, 0, 4, 7, 2, 5, 3, 2, 2, 4, 1, 4, 5, 1, 5, 4, 0, 1, 1, 0, 3, 7, -1, 1, 5), .Dim = c(3L, 12L)), 'random'); } [1] 4 6 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol# #{ set.seed(1); max.col(structure(c(1, NA, NA, Inf), .Dim = c(2L, 2L)), 'random'); } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol1# #argv <- list(structure(c(80.2, 17, 15, 12, 9.96, 22.2, 83.1, 45.1, 6, 9, 84.84, 22.2, 92.5, 39.7, 5, 5, 93.4, 20.2, 85.8, 36.5, 12, 7, 33.77, 20.3, 76.9, 43.5, 17, 15, 5.16, 20.6, 76.1, 35.3, 9, 7, 90.57, 26.6, 83.8, 70.2, 16, 7, 92.85, 23.6, 92.4, 67.8, 14, 8, 97.16, 24.9, 82.4, 53.3, 12, 7, 97.67, 21, 82.9, 45.2, 16, 13, 91.38, 24.4, 87.1, 64.5, 14, 6, 98.61, 24.5, 64.1, 62, 21, 12, 8.52, 16.5, 66.9, 67.5, 14, 7, 2.27, 19.1, 68.9, 60.7, 19, 12, 4.43, 22.7, 61.7, 69.3, 22, 5, 2.82, 18.7, 68.3, 72.6, 18, 2, 24.2, 21.2, 71.7, 34, 17, 8, 3.3, 20, 55.7, 19.4, 26, 28, 12.11, 20.2, 54.3, 15.2, 31, 20, 2.15, 10.8, 65.1, 73, 19, 9, 2.84, 20, 65.5, 59.8, 22, 10, 5.23, 18, 65, 55.1, 14, 3, 4.52, 22.4, 56.6, 50.9, 22, 12, 15.14, 16.7, 57.4, 54.1, 20, 6, 4.2, 15.3, 72.5, 71.2, 12, 1, 2.4, 21, 74.2, 58.1, 14, 8, 5.23, 23.8, 72, 63.5, 6, 3, 2.56, 18, 60.5, 60.8, 16, 10, 7.72, 16.3, 58.3, 26.8, 25, 19, 18.46, 20.9, 65.4, 49.5, 15, 8, 6.1, 22.5, 75.5, 85.9, 3, 2, 99.71, 15.1, 69.3, 84.9, 7, 6, 99.68, 19.8, 77.3, 89.7, 5, 2, 100, 18.3, 70.5, 78.2, 12, 6, 98.96, 19.4, 79.4, 64.9, 7, 3, 98.22, 20.2, 65, 75.9, 9, 9, 99.06, 17.8, 92.2, 84.6, 3, 3, 99.46, 16.3, 79.3, 63.1, 13, 13, 96.83, 18.1, 70.4, 38.4, 26, 12, 5.62, 20.3, 65.7, 7.7, 29, 11, 13.79, 20.5, 72.7, 16.7, 22, 13, 11.22, 18.9, 64.4, 17.6, 35, 32, 16.92, 23, 77.6, 37.6, 15, 7, 4.97, 20, 67.6, 18.7, 25, 7, 8.65, 19.5, 35, 1.2, 37, 53, 42.34, 18, 44.7, 46.6, 16, 29, 50.43, 18.2, 42.8, 27.7, 22, 29, 58.33, 19.3), .Dim = c(6L, 47L), .Dimnames = list(c('Fertility', 'Agriculture', 'Examination', 'Education', 'Catholic', 'Infant.Mortality'), c('Courtelary', 'Delemont', 'Franches-Mnt', 'Moutier', 'Neuveville', 'Porrentruy', 'Broye', 'Glane', 'Gruyere', 'Sarine', 'Veveyse', 'Aigle', 'Aubonne', 'Avenches', 'Cossonay', 'Echallens', 'Grandson', 'Lausanne', 'La Vallee', 'Lavaux', 'Morges', 'Moudon', 'Nyone', 'Orbe', 'Oron', 'Payerne', 'Paysd\'enhaut', 'Rolle', 'Vevey', 'Yverdon', 'Conthey', 'Entremont', 'Herens', 'Martigwy', 'Monthey', 'St Maurice', 'Sierre', 'Sion', 'Boudry', 'La Chauxdfnd', 'Le Locle', 'Neuchatel', 'Val de Ruz', 'ValdeTravers', 'V. De Geneve', 'Rive Droite', 'Rive Gauche'))), 1L); .Internal(max.col(argv[[1]], argv[[2]])) [1] 3 33 45 45 33 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol2# #argv <- list(structure(c(0.0140185568997224, 0.0152950000405453, 0.013933189413423, 0.0141545247888734, 0.0144656253644622, 0.0138841285101751, 0.014995293880605, 0.0135531935867069, 0.0136464824425927, 0.0139216121812551, 0.0150015663096977, 0.0141230892456885, 0.013614290948012, 0.0169498879707739, 0.0167919904349555, 0.0164281655519131, 0.0145450130659148, 0.0154935322596005, 0.0140566103751186, 0.0137862479562347, 0.0138916844301758, 0.0144143878263478, 0.0153699249520618, 0.0156955405518398, 0.0143684930741837, 0.991123944314599, 0.772371856665358, 0.998388573397845, 0.997744681008954, 0.935000528851613, 0.995759465226583, 0.998319991897437, 0.998446741491899, 0.997291233910865, 0.998453850443283, 0.449550979690061, 0.99765492178392, 0.0744670889060699, 0.997953251276348, 0.998367231220745, 0.998303801028119, 0.996490251221358, 0.987068752837462, 0.963362766144961, 0.997745619693091, 0.998180187351627, 0.995230116685749, 0.99834615324817, 0.998224606721368, 0.998138182928866, 0.000101796455995556, 0.0169548122668949, 0.00010041243364593, 0.994976075194857, 0.000116262428296307, 0.000266333816370553, 0.000213420942072358, 0.000150164062855871, 9.91852669694001e-05, 0.962237984681016, 0.000109709045973819, 0.363503438381572, 0.000165884012322677, 0.000404227768170316, 0.000101407372837694, 0.000138346452367636, 0.76867700377653, 0.000101067307394145, 0.000798310678132636, 0.439735407970107, 0.000105640126458538, 0.000103729730504055, 0.000157422658078269, 0.00062878104546921, 0.000140302481934868, 0.987636544924171, 0.986762198204236, 0.987695606647598, 0.987542563977846, 0.987328468487257, 0.987729584212166, 0.986966061808917, 0.987959390267427, 0.987894530108167, 0.987703622276188, 0.986961786481457, 0.987564327481863, 0.987916920251847, 0.98565103396999, 0.98575611086066, 0.985998830615913, 0.98727397408636, 0.986627618096195, 0.987610242071539, 0.987797448350422, 0.987724349638781, 0.987363673212559, 0.986711269247982, 0.986491053812255, 0.987395229430566, 0.0127450421932153, 0.00673790924500044, 0.0168765170487183, 0.015797380803532, 0.00875985277873091, 0.0142537568101031, 0.0172964637554702, 0.0177648866573519, 0.0158550778308362, 0.0172334564486378, 0.00522951225361075, 0.016267073149734, 0.00347221059583105, 0.0218803200901225, 0.0183403081414579, 0.0180163362514856, 0.0146261930363668, 0.0119682371438135, 0.00971509310832369, 0.0157071233034631, 0.017455515535567, 0.0139105878597395, 0.0174050248646065, 0.0173796025035352, 0.0168918350504782, 0.00106971573173608, 0.0026383344434856, 0.00106703814487522, 0.0135614845327103, 0.0010949673490627, 0.00126684800065677, 0.0012190851300456, 0.00114670950680761, 0.00106469628452917, 0.00946684926508704, 0.00108427378412549, 0.00489096395354091, 0.00116581741675497, 0.00136406369196257, 0.00106938597766297, 0.00112914854449728, 0.00664571845549644, 0.00106837166942789, 0.00153810249624049, 0.0051794966429432, 0.00107683746869901, 0.00107356047093305, 0.00115632815053843, 0.001475874716352, 0.00113310775095649, 0.000705529701133523, 0.000706190813132159, 0.000705483416292851, 0.000705607277564461, 0.000705767694047911, 0.000705456690994395, 0.000706040550884142, 0.000705277731844386, 0.000705325918720134, 0.00070547711802582, 0.000706043725519247, 0.000705586003991082, 0.000705308033747408, 0.000706976814055453, 0.000706900888924168, 0.000706734153004456, 0.000705809204506355, 0.000706288779684405, 0.000705550244606539, 0.000705403095546089, 0.000705460812978617, 0.000705740784771567, 0.000706233802920496, 0.000706387215078423, 0.000705716602186515, 0.00537527373619432, 0.193553056279976, 0.000869791621482113, 0.00126068143747944, 0.0477132994644455, 0.00247011263414166, 0.000876993026210466, 0.000793804652755058, 0.00147446124252569, 0.000818798505743392, 0.527720370257185, 0.0012613575859543, 0.931485133910046, 0.000794860447953985, 0.000799403966921179, 0.000843774285071599, 0.00203097055872496, 0.00804383321163345, 0.0255537088264535, 0.00126855734163029, 0.000930853589102135, 0.00281671019786704, 0.000858777960111907, 0.000915470358337216, 0.000986308498091386, 0.999944492377256, 0.98624753604171, 0.999945310582066, 0.00303527549384713, 0.999935958318038, 0.99984366374275, 0.999876760118408, 0.999915533835607, 0.999946031942947, 0.0270168111120999, 0.999939809617296, 0.622685795280626, 0.999906081646851, 0.999754847875723, 0.999944697838299, 0.999922757726417, 0.198924025871316, 0.99994491987507, 0.99948964681356, 0.539122196215121, 0.999942224996369, 0.999943338667082, 0.999911124821608, 0.999605022779117, 0.999921489451661), .Dim = c(75L, 3L), .Dimnames = list( NULL, c('c', 's', 'v'))), 1L); .Internal(max.col(argv[[1]], argv[[2]])) [1] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 1 1 1 1 1 1 1 1 1 1 3 1 3 [39] 1 1 1 1 1 1 1 1 1 1 1 1 3 3 3 1 3 3 3 3 3 1 3 3 3 3 3 3 1 3 3 3 3 3 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_maxcol.testmaxcol3# #argv <- list(structure(list(), .Dim = 0:1), 1L); .Internal(max.col(argv[[1]], argv[[2]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testMean# #{ mean(c(1+2i))} [1] 1+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testMean# #{ mean(c(1+2i, 2+3i))} [1] 1.5+2.5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testMean# #{ mean(c(1+2i,1+3i,1+45i))} [1] 1+16.66667i ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testMean# #{ mean(c(1,2,3,4,5)) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testMean# #{ mean(c(1,2,3,4,5))} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testMean# #{ mean(c(2,4))} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testMean# #{ mean(c(2L,4L,3L))} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testMean# #{ mean(c(5,5,5,5,5)) } [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testMean# #{ mean(c(TRUE, FALSE))} [1] 0.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testMean# #{ mean(c(TRUE, TRUE))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean1# #argv <- list(c(95.4489970123773, 98.5489970123773, 98.5489970123773, 98.5489970123773, 98.5489970123773, 98.5489970123773)); .Internal(mean(argv[[1]])) [1] 98.03233 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean10# #argv <- list(c(TRUE, FALSE, TRUE, TRUE)); .Internal(mean(argv[[1]])) [1] 0.75 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean11# #argv <- list(structure(c(103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662, 103.87323943662), .Names = c('2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72'))); .Internal(mean(argv[[1]])) [1] 103.8732 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean12# #argv <- list(c(-1.12778377684043, -12820.0784261145, -21650982809.6744, -473300382255715392, -6.08456909882282e+25, -3.04622557026196e+34, -4.60125024792566e+43, -1.76183826972506e+53, -1.5069799345972e+63, -2.61556777274611e+73, -8.54170618068872e+83, -4.9383857330861e+94, -4.80716085942859e+105, -7.55412056676629e+116, -1.84898368353639e+128, -6.83535188151783e+139, -3.71562599613334e+151, -2.90089508183654e+163, -3.18582547396557e+175, -4.83110332887119e+187, -9.94902790498679e+199, -2.74100158340596e+212, -9.96611412047338e+224, -4.72336572671053e+237, -2.88514442494869e+250, -2.24780296109123e+263, -2.21240023126594e+276, -2.72671165723473e+289, -4.17369555651928e+302, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf)); .Internal(mean(argv[[1]])) [1] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean13# #argv <- list(1:10); .Internal(mean(argv[[1]])) [1] 5.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean14# #argv <- list(c(-2.16610675289233, 2.16610675289233)); .Internal(mean(argv[[1]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean15# #argv <- list(c(-Inf, Inf)); .Internal(mean(argv[[1]])) [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean16# #argv <- list(numeric(0)); .Internal(mean(argv[[1]])) [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean17# #argv <- list(c(1.77635683940025e-15, 7.105427357601e-14, 4.54747350886464e-13, 4.54747350886464e-13, 1.81898940354586e-12, 7.27595761418343e-12, 7.27595761418343e-12, 1.45519152283669e-11, 2.91038304567337e-11, 5.82076609134674e-11)); .Internal(mean(argv[[1]])) [1] 1.192166e-11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean19# #argv <- structure(list(x = structure(c(31, NA, NA, 31), units = 'days', class = 'difftime'), na.rm = TRUE), .Names = c('x', 'na.rm'));do.call('mean', argv) Time difference of 31 days ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean2# #argv <- list(c(0.104166666666667, 0.285714285714286, 0.285714285714286, NA)); .Internal(mean(argv[[1]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean20# #argv <- structure(list(x = c(TRUE, FALSE, TRUE, TRUE)), .Names = 'x');do.call('mean', argv) [1] 0.75 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean21# #argv <- structure(list(x = c(0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 50), trim = 0.5), .Names = c('x', 'trim'));do.call('mean', argv) [1] 5.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean22# #argv <- structure(list(x = structure(c(2L, 1L, 2L, 2L), .Label = c('FALSE', 'TRUE'), class = 'factor')), .Names = 'x');do.call('mean', argv) [1] NA Warning message: In mean.default(x = c(2L, 1L, 2L, 2L)) : argument is not numeric or logical: returning NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean23# #argv <- structure(list(x = c(83.7010937038573, 61.9895951152624, 259.87035947113, 58.4906618904788, 24.7573173158259, 27.3459081536165, 286.404145870861, 31.5386609266279, 11.4645558243349, 48.261763556938, 24.118141168773, 25.3079966732443)), .Names = 'x');do.call('mean', argv) [1] 78.60418 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean3# #argv <- list(structure(c(59.8164361195774, 16.3642182644146, 111.747292631572, 33.1308121255244, 111.087966260681, 17.8530570409338, 109.920202428016, 21.131775457295, 0, 0, 16.3642182644146, 161.535939255833, 37.6748802609012, 67.2883398244609, 38.6252764993654, 76.8303935707398, 28.4778348377214, 75.3935967432183, 0, 0, 111.747292631572, 37.6748802609012, 398.433064545232, 41.228743361535, 56.6580728922266, 34.5026155985806, 59.292325604515, 36.0412835987832, 0, 0, 33.1308121255244, 67.2883398244609, 41.228743361535, 1176.45954558834, 42.4165944769534, 69.928075668575, 32.9974365646273, 68.4061187132491, 0, 0, 111.087966260681, 38.6252764993654, 56.6580728922266, 42.4165944769534, 1738.19143232074, 35.3995546471346, 61.6125843485971, 37.0026062612778, 0, 0, 17.8530570409338, 76.8303935707398, 34.5026155985806, 69.928075668575, 35.3995546471346, 3334.81773597237, 25.0719711616328, 77.7527739510622, 0, 0, 109.920202428016, 28.4778348377214, 59.292325604515, 32.9974365646273, 61.6125843485971, 25.0719711616328, 3310.21623403309, 26.7939833992556, 0, 0, 21.131775457295, 75.3935967432183, 36.0412835987832, 68.4061187132491, 37.0026062612778, 77.7527739510622, 26.7939833992556, 6145.64636329227, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Dim = c(10L, 10L))); .Internal(mean(argv[[1]])) [1] 192.2638 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean4# #argv <- list(structure(c(36, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 33, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 40, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 28, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 50, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 47, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 31, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 55, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 38, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 42), .Dim = c(10L, 10L), .Dimnames = list(c('a1', 'a2', 'a3', 'a4', 'a5', 'a6', 'a7', 'a8', 'a9', 'a10'), c('a1', 'a2', 'a3', 'a4', 'a5', 'a6', 'a7', 'a8', 'a9', 'a10')))); .Internal(mean(argv[[1]])) [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean5# #argv <- list(c(FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE)); .Internal(mean(argv[[1]])) [1] 0.45 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean6# #argv <- list(c(-0.207917278019599, -0.0833690664718293, 0.878133487533042, 0.070508391424576, 0.460916205989202, 0.497850478229239, 0.400771450594052, 0.400771450594052, -0.380471001012383, -0.686852851893526, 1.25381492106993, 0.821581081637487, -0.402884835299076, 0.821581081637487, 0.11068271594512, -0.560475646552213, 1.55870831414912, -0.686852851893526, -1.26539635156826, 1.55870831414912, 0.11068271594512, 1.20796199830499, 0.153373117836515, -0.694706978920513, -0.466655353623219, 0.821581081637487, -1.06782370598685, 0.779965118336318, -0.402884835299076, -1.68669331074241, 0.460916205989202, -0.295071482992271, -0.207917278019599, 0.460916205989202, 1.25381492106993, -0.0833690664718293, 0.359813827057364, -1.06782370598685, 1.71506498688328, 0.11068271594512, 0.837787044494525, 1.78691313680308, 0.426464221476814, -0.0833690664718293, 0.426464221476814, -1.26506123460653, 0.688640254100091, 0.878133487533042, 0.497850478229239, -0.217974914658295)); .Internal(mean(argv[[1]])) [1] 0.1999497 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean7# #argv <- list(1.47130567537631e-314); .Internal(mean(argv[[1]])) [1] 1.471306e-314 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean8# #argv <- list(4.9306115419259e+108); .Internal(mean(argv[[1]])) [1] 4.930612e+108 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mean.testmean9# #argv <- list(structure(c(2134, 1863, 1877, 1877, 1492, 1249, 1280, 1131, 1209, 1492, 1621, 1846, 2103, 2137, 2153, 1833, 1403, 1288, 1186, 1133, 1053, 1347, 1545, 2066, 2020, 2750, 2283, 1479, 1189, 1160, 1113, 970, 999, 1208, 1467, 2059, 2240, 1634, 1722, 1801, 1246, 1162, 1087, 1013, 959, 1179, 1229, 1655, 2019, 2284, 1942, 1423, 1340, 1187, 1098, 1004, 970, 1140, 1110, 1812, 2263, 1820, 1846, 1531, 1215, 1075, 1056, 975), .Tsp = c(1974, 1979.58333333333, 12), class = 'ts')); .Internal(mean(argv[[1]])) [1] 1515.471 ##com.oracle.truffle.r.test.builtins.TestBuiltin_meanPOSIXct.testmeanPOSIXct1# #argv <- structure(list(x = structure(1412795929.08562, class = c('POSIXct', 'POSIXt'))), .Names = 'x');do.call('mean.POSIXct', argv) [1] "2014-10-08 19:18:49 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_meandefault.testmeandefault1# #argv <- structure(list(x = structure(c(2L, 1L, 2L, 2L), .Label = c('FALSE', 'TRUE'), class = 'factor')), .Names = 'x');do.call('mean.default', argv) [1] NA Warning message: In mean.default(x = c(2L, 1L, 2L, 2L)) : argument is not numeric or logical: returning NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_meandifftime.testmeandifftime1# #argv <- structure(list(x = structure(c(31, NA, NA, 31), units = 'days', class = 'difftime'), na.rm = TRUE), .Names = c('x', 'na.rm'));do.call('mean.difftime', argv) Time difference of 31 days ##com.oracle.truffle.r.test.builtins.TestBuiltin_memDecompress.testmemDecompress1#Ignored.Unimplemented# #argv <- structure(list(from = as.raw(c(253, 55, 122, 88, 90, 0, 0, 1, 105, 34, 222, 54, 2, 0, 33, 1, 28, 0, 0, 0, 16, 207, 88, 204, 224, 7, 207, 0, 28, 93, 0, 24, 140, 130, 182, 196, 17, 52, 92, 78, 225, 221, 115, 179, 63, 98, 20, 119, 183, 90, 101, 43, 5, 112, 179, 75, 69, 222, 0, 0, 155, 136, 185, 16, 0, 1, 52, 208, 15, 0, 0, 0, 105, 254, 40, 141, 62, 48, 13, 139, 2, 0, 0, 0, 0, 1, 89, 90)), type = 'xz', asChar = TRUE), .Names = c('from', 'type', 'asChar'));do.call('memDecompress', argv) [1] "12345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890" ##com.oracle.truffle.r.test.builtins.TestBuiltin_merge.testExamplesFromHelp# #x <- data.frame(k1 = c(NA,NA,3,4,5), k2 = c(1,NA,NA,4,5), data = 1:5);y <- data.frame(k1 = c(NA,2,NA,4,5), k2 = c(NA,NA,3,4,5), data = 1:5);merge(x, y, by = 'k1') k1 k2.x data.x k2.y data.y 1 4 4 4 4 4 2 5 5 5 5 5 3 NA 1 1 NA 1 4 NA 1 1 3 3 5 NA NA 2 NA 1 6 NA NA 2 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_merge.testExamplesFromHelp#Ignored.ImplementationError# #x <- data.frame(k1 = c(NA,NA,3,4,5), k2 = c(1,NA,NA,4,5), data = 1:5);y <- data.frame(k1 = c(NA,2,NA,4,5), k2 = c(NA,NA,3,4,5), data = 1:5);merge(x, y, by = 'k2', incomparables = NA) k2 k1.x data.x k1.y data.y 1 4 4 4 4 4 2 5 5 5 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_merge.testExamplesFromHelp# #x <- data.frame(k1 = c(NA,NA,3,4,5), k2 = c(1,NA,NA,4,5), data = 1:5);y <- data.frame(k1 = c(NA,2,NA,4,5), k2 = c(NA,NA,3,4,5), data = 1:5);merge(x, y, by = c('k1','k2')) k1 k2 data.x data.y 1 4 4 4 4 2 5 5 5 5 3 NA NA 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_merge.testmerge1# #argv <- list(c(0L, 0L, 0L, 0L, 0L), 0L, FALSE, TRUE); .Internal(merge(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) $xi integer(0) $yi integer(0) $x.alone NULL $y.alone [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_merge.testmerge2# #argv <- list(c(0L, 0L, 0L, 0L, 0L), 0L, TRUE, FALSE); .Internal(merge(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) $xi integer(0) $yi integer(0) $x.alone [1] 1 2 3 4 5 $y.alone NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_merge.testmerge3# #argv <- list(c(0L, 0L, 0L, 3L, 4L), c(0L, 0L, 0L, 3L, 4L), FALSE, FALSE); .Internal(merge(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) $xi [1] 4 5 $yi [1] 4 5 $x.alone NULL $y.alone NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_merge.testmerge5# #argv <- structure(list(x = structure(list(gender = structure(c(1L, 1L, 2L), .Label = c('F', 'M'), class = 'factor'), age = c(20, 30, 40), filename = structure(1:3, .Label = c('q1.csv', 'q2.csv', 'q3.csv'), class = 'factor')), .Names = c('gender', 'age', 'filename'), row.names = c(NA, -3L), class = 'data.frame'), y = structure(list(effsize = c(3.5, 2, 1.7), constraint = c(0.40625, 0.5, 0.882), outdegree = c(4, 2, 2), indegree = c(4, 2, 3), efficiency = c(0.625, 0.5, 0.444444444444444), hierarchy = c(0, 0, 0.333333333333333), centralization = c(0.833333333333333, 1, 0.333333333333333), gden = c(0.5, 0.666666666666667, 0.666666666666667), ego.gden = c(0.166666666666667, 0, 0.5), filename = structure(1:3, .Label = c('q1.csv', 'q2.csv', 'q3.csv'), class = 'factor')), .Names = c('effsize', 'constraint', 'outdegree', 'indegree', 'efficiency', 'hierarchy', 'centralization', 'gden', 'ego.gden', 'filename'), row.names = c('q1.csv', 'q2.csv', 'q3.csv'), class = 'data.frame'), by = 'filename'), .Names = c('x', 'y', 'by'));do.call('merge', argv) filename gender age effsize constraint outdegree indegree efficiency 1 q1.csv F 20 3.5 0.40625 4 4 0.6250000 2 q2.csv F 30 2.0 0.50000 2 2 0.5000000 3 q3.csv M 40 1.7 0.88200 2 3 0.4444444 hierarchy centralization gden ego.gden 1 0.0000000 0.8333333 0.5000000 0.1666667 2 0.0000000 1.0000000 0.6666667 0.0000000 3 0.3333333 0.3333333 0.6666667 0.5000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ a<- 1; b <- "2"; mget(c("a", "b"), mode=c("numeric", "character")) } $a [1] 1 $b [1] "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ a<- 1; b <- 2; f <- function() { mget(c("a", "b"), inherits=TRUE)}; f() } $a [1] 1 $b [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ a<- 1; b <- 2; mget(c("a", "b")) } $a [1] 1 $b [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ a<- 1; b <- 2; mget(c("a", "b"), mode="numeric") } $a [1] 1 $b [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ a<- 1; b <- 2; mget(c('a', 'b'), envir=1) } Error in mget(c("a", "b"), envir = 1) : second argument must be an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ a<- 1; mget(c("a", "b"), ifnotfound=list(100)) } $a [1] 1 $b [1] 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ b <- 2; f <- function() { mget(c("a", "b"), ifnotfound=list(100), inherits=TRUE)}; f() } $a [1] 100 $b [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ mget("_foo_", ifnotfound=list(function(x) "bar")) } $`_foo_` [1] "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ mget(c("a", "b"), ifnotfound=list(100, 200)) } $a [1] 100 $b [1] 200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ x<-mget("_foo_", ifnotfound=list(function(x) sys.call(0))); print(x[[1]][[1]]); print(x[[1]][[2]]) } function(x) sys.call(0) [1] "_foo_" ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGet# #{ x<-mget("_foo_", ifnotfound=list(function(x) sys.call(1))); list(x[[1]][[1]], x[[1]][[2]], x[[1]][[3]][[1]], x[[1]][[3]][[2]][[1]], x[[1]][[3]][[2]][[2]], x[[1]][[3]][[2]][[3]]) } [[1]] mget [[2]] [1] "_foo_" [[3]] list [[4]] `function` [[5]] [[5]]$x [[6]] sys.call(1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGetWithVarArgs# #{ find_args <- function(...) !vapply(mget('...', envir = parent.frame()), function(x) identical(x, quote(expr = )), logical(1));func <- function(...) find_args(...);func(); } ... FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testMGetWithVarArgs# #{ find_args <- function(...) !vapply(mget('...', envir = parent.frame()), function(x) identical(x, quote(expr = )), logical(1));func <- function(...) find_args(...);func(a=3); } ... TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testWithIfnotfound# #mget('abc', ifnotfound = 'a') $abc [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testWithIfnotfound# #mget('abc', ifnotfound = NA) $abc [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testWithIfnotfound# #mget('abc', ifnotfound = NA_complex_) $abc [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testWithIfnotfound# #mget('abc', ifnotfound = c('a1', 'b1')) Error in mget("abc", ifnotfound = c("a1", "b1")) : wrong length for 'ifnotfound' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testWithIfnotfound# #mget('abc', ifnotfound = list(`[`)) $abc [1] "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testWithIfnotfound# #mget('abc', ifnotfound = list(function(x) cat('NOT FOUND', x, '\n'))) NOT FOUND abc $abc NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testWithIfnotfound# #mget('abc', ifnotfound = list(function(x, y = 'default value') cat('NOT FOUND', x, ',', y, '\n'))) NOT FOUND abc , default value $abc NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testWithIfnotfound# #mget(c('a', 'b'), ifnotfound = c('a1', 'b1')) $a [1] "a1" $b [1] "b1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_mget.testWithIfnotfound# #mget(c('a', 'b'), ifnotfound = new.env()) Error in mget(c("a", "b"), ifnotfound = new.env()) : environments cannot be coerced to other types ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #min(c(1,NA,2), na.rm=NA) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ is.logical(min(TRUE)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ is.logical(min(TRUE, FALSE)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ max(c(1,2,0/0)) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min("42", "7") } [1] "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min("42", as.character(NA), "7", na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min("42", as.character(NA), "7", na.rm=TRUE) } [1] "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min("42", as.character(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min("42", as.character(NA), na.rm=TRUE) } [1] "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min("hi","abbey","hello") } [1] "abbey" ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min("hi",100) } [1] "100" ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min((-1):100) } [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min() } [1] Inf Warning message: In min() : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(0/0, 1.1) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(0/0, 1.1, NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(1:10, 100:200, c(4.0, -5.0)) } [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(1:10, 100:200, c(4.0, 5.0), c(TRUE,FALSE,NA)) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(2L, 4L) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(42+42i, 7+7i) } Error in min(42 + (0+42i), 7 + (0+7i)) : invalid 'type' (complex) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(42, as.double(NA), 7, na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(42, as.double(NA), 7, na.rm=TRUE) } [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(42, as.double(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(42, as.double(NA), na.rm=TRUE) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(42L, as.integer(NA), 7L, na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(42L, as.integer(NA), 7L, na.rm=TRUE) } [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(42L, as.integer(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(42L, as.integer(NA), na.rm=TRUE) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(NA, 1.1) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(NULL) } [1] Inf Warning message: In min(NULL) : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.character(NA), as.character(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.character(NA), as.character(NA), na.rm=TRUE) } [1] NA Warning message: In min(as.character(NA), as.character(NA), na.rm = TRUE) : no non-missing arguments, returning NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.character(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.character(NA), na.rm=TRUE) } [1] NA Warning message: In min(as.character(NA), na.rm = TRUE) : no non-missing arguments, returning NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.double(NA), as.double(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.double(NA), as.double(NA), na.rm=TRUE) } [1] Inf Warning message: In min(as.double(NA), as.double(NA), na.rm = TRUE) : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.double(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.double(NA), na.rm=TRUE) } [1] Inf Warning message: In min(as.double(NA), na.rm = TRUE) : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.integer(NA), as.integer(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.integer(NA), as.integer(NA), na.rm=TRUE) } [1] Inf Warning message: In min(as.integer(NA), as.integer(NA), na.rm = TRUE) : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.integer(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.integer(NA), na.rm=TRUE) } [1] Inf Warning message: In min(as.integer(NA), na.rm = TRUE) : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(as.raw(42), as.raw(7)) } Error in min(as.raw(42), as.raw(7)) : invalid 'type' (raw) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(c("hi","abbey","hello")) } [1] "abbey" ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(c(1,2,0/0)) } [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(c(as.character(NA), "foo")) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(character()) } [1] NA Warning message: In min(character()) : no non-missing arguments, returning NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(character(0)) } [1] NA Warning message: In min(character(0)) : no non-missing arguments, returning NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(double()) } [1] Inf Warning message: In min(double()) : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(double(0)) } [1] Inf Warning message: In min(double(0)) : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(integer()) } [1] Inf Warning message: In min(integer()) : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testMinimum# #{ min(integer(0)) } [1] Inf Warning message: In min(integer(0)) : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testSideEffect# #{ x <- c(10, 2, 3); f <- function() { x[1] <<- 1 ; 4 }; min(x, f())} [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin1# #argv <- list(c(10L, 1L));min(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin10# #argv <- list(c(2.00256647265648e-308, 2.22284878464869e-308, 2.22507363599982e-308, 2.2250738585072e-308, 2.22507408101459e-308, 2.22729893236571e-308, 2.44758124435792e-308));min(argv[[1]]); [1] 2.002566e-308 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin11# #argv <- list(c(FALSE, FALSE));min(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin12# #argv <- list(c(2, 13954490295224484, 9.73638996997572e+31, 6.79331796732739e+47, 4.73986448237219e+63, 3.30711964599708e+79, 2.30745845026066e+95, 1.60997032753976e+111, 1.12331576556267e+127, 7.83764947450857e+142, 5.46852017646992e+158, 3.8155205865895e+174, 2.66218224983966e+190, 1.85746981847535e+206, 1.29600222777925e+222, 9.04252525506755e+237, 6.30919154580821e+253, 4.40207760983472e+269, 3.07143746426322e+285, 2.14301721437253e+301));min(argv[[1]]); [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin13# #min( ); [1] Inf Warning message: In min() : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin14# #argv <- list(structure(c(13823, NA), class = 'Date'));min(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2007-11-06" ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin15# #argv <- list(structure(c(1208822400, 1209168000), class = c('POSIXct', 'POSIXt'), tzone = 'GMT'));min(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] "2008-04-22 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin16# #argv <- list(3L, 7);min(argv[[1]],argv[[2]]); [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin17# #argv <- list(c(-7, -5.6, -4.2, -2.8, -1.4, 0, 1.4, 2.8, 4.2, 5.6, 7));min(argv[[1]]); [1] -7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin18# #argv <- list(c(4.5241870901798, 0.211646098116025, 1.86003798801034e-43));min(argv[[1]]); [1] 1.860038e-43 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin19# #argv <- list(structure(c(-0.562441486309934, -0.588967592535822, 0.0277608937997097, 0.568074124752969, 3.89980510825846, -0.428174866497729, -0.343990813420242, -0.260996370058754, -2.31774610938305, 0.314764947225063, -0.455124436264437, -0.0444006414474544, -0.27748974692001, -0.303134023269405, -0.670168347915028, 2.92643313367, -0.749546667806845, -0.410394401887929, -0.203261263063707, 0.1847365997012, 0.128559671155683, 0.313558179929332, -0.0668425264405297, -0.106427678524531, -0.523747793519006, -0.402585404761851, 0.0642079595716389, -0.779859286629166, 0.356484381211739, -0.625053119472271, 1.31547628490512, -0.21959878152752, -0.102402088986461), .Names = c('Craig Dunain', 'Ben Rha', 'Ben Lomond', 'Goatfell', 'Bens of Jura', 'Cairnpapple', 'Scolty', 'Traprain', 'Lairig Ghru', 'Dollar', 'Lomonds', 'Cairn Table', 'Eildon Two', 'Cairngorm', 'Seven Hills', 'Knock Hill', 'Black Hill', 'Creag Beag', 'Kildcon Hill', 'Meall Ant-Suidhe', 'Half Ben Nevis', 'Cow Hill', 'N Berwick Law', 'Creag Dubh', 'Burnswark', 'Largo Law', 'Criffel', 'Acmony', 'Ben Nevis', 'Knockfarrel', 'Two Breweries', 'Cockleroi', 'Moffat Chase')));min(argv[[1]]); [1] -2.317746 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin2# #argv <- list(structure(c(0.25069599964819, 0.252830784944624), .Dim = 1:2));min(argv[[1]]); [1] 0.250696 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin20# #argv <- list(numeric(0));min(argv[[1]]); [1] Inf Warning message: In min(argv[[1]]) : no non-missing arguments to min; returning Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin22# #argv <- list(2, 3, NA);do.call('min', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin3# #argv <- list(c(-3.37619548064471, -3.28575139573497, -3.19530731082523, -3.10486322591549, -3.01441914100575, -2.923975056096, -2.83353097118626, -2.74308688627652, -2.65264280136678, -2.56219871645704, -2.4717546315473, -2.38131054663755, -2.29086646172781, -2.20042237681807, -2.10997829190833, -2.01953420699859, -1.92909012208884, -1.8386460371791, -1.74820195226936, -1.65775786735962, -1.56731378244988, -1.47686969754013, -1.38642561263039, -1.29598152772065, -1.20553744281091, -1.11509335790117, -1.02464927299142, -0.934205188081682, -0.84376110317194, -0.753317018262198, -0.662872933352456, -0.572428848442715, -0.481984763532973, -0.39154067862323, -0.301096593713489, -0.210652508803747, -0.120208423894005, -0.029764338984263, 0.0606797459254791, 0.151123830835221, 0.241567915744963, 0.332012000654705, 0.422456085564447, 0.512900170474189, 0.603344255383931, 0.693788340293673, 0.784232425203414, 0.874676510113156, 0.965120595022898, 1.05556467993264, 1.14600876484238, 1.23645284975212, 1.32689693466187, 1.41734101957161, 1.50778510448135, 1.59822918939109, 1.68867327430083, 1.77911735921058, 1.86956144412032, 1.96000552903006, 2.0504496139398, 2.14089369884954, 2.23133778375928, 2.32178186866903, 2.41222595357877, 2.50267003848851, 2.59311412339825, 2.68355820830799, 2.77400229321774, 2.86444637812748, 2.95489046303722, 3.04533454794696, 3.1357786328567, 3.22622271776645, 3.31666680267619, 3.40711088758593, 3.49755497249567, 3.58799905740541, 3.67844314231516, 3.7688872272249, 3.85933131213464, 3.94977539704438, 4.04021948195412, 4.13066356686387, 4.22110765177361, 4.31155173668335, 4.40199582159309, 4.49243990650283, 4.58288399141258, 4.67332807632232, 4.76377216123206, 4.8542162461418, 4.94466033105154, 5.03510441596129, 5.12554850087103, 5.21599258578077, 5.30643667069051, 5.39688075560025, 5.48732484051, 5.57776892541974, 5.66821301032948, 5.75865709523922, 5.84910118014896, 5.9395452650587, 6.02998934996845, 6.12043343487819, 6.21087751978793, 6.30132160469767, 6.39176568960741, 6.48220977451716, 6.5726538594269, 6.66309794433664, 6.75354202924638, 6.84398611415612, 6.93443019906586, 7.02487428397561, 7.11531836888535, 7.20576245379509, 7.29620653870483, 7.38665062361457, 7.47709470852432, 7.56753879343406, 7.6579828783438, 7.74842696325354, 7.83887104816328, 7.92931513307303, 8.01975921798277, 8.11020330289251));min(argv[[1]]); [1] -3.376195 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin4# #argv <- list(c(NA, 1, 2, 3, -Inf, NaN, Inf));min(argv[[1]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin5# #argv <- list(structure(list(c(1L, 2L, 4L), 1:3, c(2L, 1L)), class = c('package_version', 'numeric_version')));min(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] ‘1.2.3’ ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin6# #argv <- list(structure(c(1338544800L, 1338566400L, 1338588000L, 1338609600L, 1338631200L, 1338652800L, 1338674400L, 1338696000L, 1338717600L, 1338739200L, 1338760800L, 1338782400L, 1338804000L, 1338825600L, 1338847200L, 1338868800L, 1338890400L, 1338912000L, 1338933600L, 1338955200L, 1338976800L, 1338998400L, 1339020000L, 1339041600L), class = c('POSIXct', 'POSIXt'), tzone = ''));min(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2012-06-01 10:00:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin7# #argv <- list(1.234e+100);min(argv[[1]]); [1] 1.234e+100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin8# #argv <- list(structure(c(3L, 2L, 1L), .Label = c('A', 'B', 'C'), class = c('ordered', 'factor')));min(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] B Levels: A < B < C ##com.oracle.truffle.r.test.builtins.TestBuiltin_min.testmin9# #argv <- list(structure(c(11368.8306749654, 11347.7238090355, 11341.9182102121, 11392.4878842821, 11367.3445285107, 11337.9245694652, 11332.0560643654, 11356.4682624019, 11387.6852128883, 11364.9132677, 11391.3319486445, 11374.2254758319, 11347.9708838458, 11353.2031583386, 11333.3748092474, 11323.9154302836, 11373.0896246266, 11330.2228965024, 11354.2399044028, 11367.8070731596, 11392.4287034031, 11357.6915504499, 11356.9044667059, 11335.1409634408, 11375.8374661156, 11354.7726842454, 11358.781884864, 11337.5281579299, 11339.0060699913, 11364.6998397419, 11363.2410538797, 11328.3945066198, 11325.487840571, 11367.9956844538, 11388.0030639744, 11364.8664695648, 11362.2630523606, 11359.821940674, 11391.9566656714, 11358.5349275633, 11370.7951655071, 11365.1078852355, 11339.7208074429, 11341.0716148671, 11374.0516736354, 11354.6799581982, 11335.2588737891, 11375.2688788734, 11330.349134828, 11383.518146432, 11366.0251480173, 11362.0011677193, 11346.0144123337, 11354.7192011815, 11358.0308680837, 11335.6606452791, 11360.0741421962, 11328.2693021996, 11342.4429152855, 11337.8889663466, 11342.9353336683, 11385.6565872063, 11354.2364726327, 11377.5989422849, 11384.6433324409, 11351.9186946652, 11327.4665936357, 11346.4841244179, 11373.6608162634, 11346.6330733448, 11367.1289885738, 11381.8430187805, 11382.9292165297, 11350.3951496719, 11349.6345719923, 11385.6811798196, 11368.1021034038, 11374.8755054101, 11365.3712412571, 11386.2157128048, 11343.5611108569, 11336.3882076922, 11385.0515660313, 11358.2337640012, 11384.3940280117, 11336.2435535709, 11376.0672136671, 11373.7149224868, 11389.0607372806, 11361.3352610911, 11372.8220707406, 11350.2233569878, 11330.0611188328, 11387.9111462012, 11342.8262750218, 11364.340121117, 11330.7252423461, 11381.8354922482, 11345.257457911, 11377.7995935893), class = 'Date'));min(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2001-01-25" ##com.oracle.truffle.r.test.builtins.TestBuiltin_minus_Date.testminus_Date1# #argv <- structure(list(e1 = structure(14580, class = 'Date'), e2 = structure(1, units = 'days', class = 'difftime')), .Names = c('e1', 'e2'));do.call('-.Date', argv) [1] "2009-12-01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing#Ignored.ImplementationError# #f <- function(x,y,z){print(missing(x)); g(x)}; g <- function(a){a}; a <- quote(f(1,2,))[[4]]; f(a,1,2) [1] TRUE Error in g(x) : argument "a" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing#Ignored.ImplementationError# #f <- function(x,y,z){print(missing(x)); g(x)}; g <- function(a){a}; f(,1,2) [1] TRUE Error in g(x) : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(...) { g(...) } ; g <- function(b=2) { missing(b) } ; f() } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(...) { missing(..2) } ; f(x + z, a * b) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a = 2 + 3) { a; missing(a) } ; f() } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a = 2 + 3) { missing(a) } ; f() } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a = 2) { g(a) } ; g <- function(b) { missing(b) } ; f() } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a = z) { g(a) } ; g <- function(b) { missing(b) } ; f() } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a = z) { missing(a) } ; f() } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a = z, z) { g(a) } ; g <- function(b) { missing(b) } ; f() } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a) { g <- function(b) { before <- missing(b) ; a <<- 2 ; after <- missing(b) ; c(before, after) } ; g(a) } ; f() } [1] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a) { g(a) } ; g <- function(b) { missing(b) } ; f() } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a) { g(a) } ; g <- function(b=2) { missing(b) } ; f() } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a) { missing("a") }; f(); f(1) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a,b,c) { missing(b) } ; f(1,,2) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(a,b,c,d,e,env) (length(objects(env, all.names = TRUE, pattern = "^[.]__[CTA]_"))); f2 <- function(env) (length(objects(env, all.names = TRUE, pattern = "^[.]__[CTA]_"))); f(); f2() } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(x = y, y = x) { g(x, y) } ; g <- function(x, y) { missing(x) } ; f() } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(x) { missing(x) } ; f(a) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(x) { print(missing(x)) ; g(x) } ; g <- function(y=1) { print(missing(y)) ; h(y) } ; h <- function(z) { print(missing(z)) ; z } ; f() } [1] TRUE [1] TRUE [1] TRUE Error in h(y) : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(x) { print(missing(x)); g(x) }; g <- function(y=3) { print(missing(y)); k(y) }; k <- function(l=4) { print(missing(l)); l }; f() } [1] TRUE [1] TRUE [1] TRUE Error in k(y) : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(x) { print(missing(x)); g(x) }; g <- function(y=3) { print(missing(y)); k(y) }; k <- function(l=4) { print(missing(l)); l }; f(1) } [1] FALSE [1] FALSE [1] FALSE [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(x) {print(missing(x)); g(x)}; g <- function(y=2) {print(missing(y)); y}; f() } [1] TRUE [1] TRUE Error in g(x) : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ f <- function(x) {print(missing(x)); g(x)}; g <- function(y=2) {print(missing(y)); y}; f(1) } [1] FALSE [1] FALSE [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ g <- function(a, b, c) { b } ; f <- function(a,b,c) { g(a,b=2,c) } ; f(1,,2) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ k <- function(x=2,y) { xx <- x; yy <- y; print(missing(x)); print(missing(xx)); print(missing(yy)); print(missing(yy))}; k() } Error in k() : argument "y" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_missing.testMissing# #{ k <- function(x=2,y) { xx <- x; yy <- y; print(missing(x)); print(missing(xx)); print(missing(yy)); print(missing(yy))}; k(y=1) } [1] TRUE [1] FALSE [1] FALSE [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_mode.testmode1# #argv <- structure(list(x = NA_real_), .Names = 'x');do.call('mode', argv) [1] "numeric" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testLNames# #{ x <- quote(plot(x = age, y = weight)); names(x) } [1] "" "x" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #names(pairlist(1,2,3)) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #names(pairlist(a=1,2,q=3)) [1] "a" "" "q" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #names(pairlist(a=3, b=4)) [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #v <- parse(text="useDynLib(digest, digest_impl=digest)"); names(v[[1]][3]) [1] "digest_impl" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #v <- parse(text="useDynLib(digest, digest_impl=digest)"); names(v[[1]][[3]]) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #{ e <- new.env(); names(e) <- c('a'); } Error in names(e) <- c("a") : names() applied to a non-vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #{ symNames <- c("foobar", "bar"); names(symNames) = symNames; names(names(symNames)); } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #{ x <- c(10, 20); names(x) <- c('ahoj', 'svete'); y <- c(1,2); z <- choose(x,y); names(z)[[1]] <- 'onlyinz'; names(x) } [1] "ahoj" "svete" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #{ x <- parse(text='x+y')[[1]]; names(x) <- c('a','b','c'); names(x); } [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #{ x<-c(1,2,3); dim(x)<-3; dimnames(x)<-list(c(11,12,13)); names(x) } [1] "11" "12" "13" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testNames# #{ y<-c(d="e"); attr(y, "foo")<-"foo"; x<-c(42); names(x)<-y; attributes(names(x)) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames1# #argv <- list(structure(list(size = 113, isdir = FALSE, mode = structure(436L, class = 'octmode'), mtime = structure(1395082088.72988, class = c('POSIXct', 'POSIXt')), ctime = structure(1395082088.72988, class = c('POSIXct', 'POSIXt')), atime = structure(1395082088.77388, class = c('POSIXct', 'POSIXt')), uid = 1001L, gid = 1001L, uname = 'roman', grname = 'roman'), .Names = c('size', 'isdir', 'mode', 'mtime', 'ctime', 'atime', 'uid', 'gid', 'uname', 'grname'), class = 'data.frame', row.names = '/tmp/RtmptPgrXI/file55711ba85492'));names(argv[[1]]); [1] "size" "isdir" "mode" "mtime" "ctime" "atime" "uid" "gid" [9] "uname" "grname" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames10# #argv <- list(structure(list(A = c(1L, NA, 1L), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA, NA, NA), E = c(FALSE, NA, TRUE), F = structure(c(1L, NA, 2L), .Label = c('abc', 'def'), class = 'factor')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')));names(argv[[1]]); [1] "A" "B" "C" "D" "E" "F" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames11# #argv <- list(structure(c(NA, NA, NA, NA, NA, 1L, 2L), .Label = c('Ripley', 'Venables & Smith'), class = 'factor'));names(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames12# #argv <- list(structure(list(V1 = c(-1L, -2L, 1L, 2L, 3L, 4L, 5L), V2 = c(-3L, -4L, 6L, 7L, 8L, 9L, 10L), V3 = c(-5L, -6L, 11L, 12L, 13L, 14L, 15L), V4 = c(-7L, -8L, 16L, 17L, 18L, 19L, 20L), V5 = c(-9L, -10L, 21L, 22L, 23L, 24L, 25L)), .Names = c('V1', 'V2', 'V3', 'V4', 'V5'), row.names = c(NA, 7L), class = 'data.frame'));names(argv[[1]]); [1] "V1" "V2" "V3" "V4" "V5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames13# #argv <- list(structure(list(Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551), GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962), .Names = c('Employed', 'GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year'), class = 'data.frame', row.names = 1947:1962, terms = quote(Employed ~ GNP.deflator + GNP + Unemployed + Armed.Forces + Population + Year)));names(argv[[1]]); [1] "Employed" "GNP.deflator" "GNP" "Unemployed" "Armed.Forces" [6] "Population" "Year" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames14# #argv <- list(structure(list(ii = 1:10, xx = c(-9.42477796076938, -6.28318530717959, -3.14159265358979, 0, 3.14159265358979, 6.28318530717959, 9.42477796076938, 12.5663706143592, 15.707963267949, 18.8495559215388)), .Names = c('ii', 'xx')));names(argv[[1]]); [1] "ii" "xx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames15# #argv <- list(structure(list(`cbind(X, M)` = structure(c(68, 42, 37, 24, 66, 33, 47, 23, 63, 29, 57, 19, 42, 30, 52, 43, 50, 23, 55, 47, 53, 27, 49, 29), .Dim = c(12L, 2L), .Dimnames = list(NULL, c('X', 'M'))), M.user = structure(c(1L, 1L, 2L, 2L, 1L, 1L, 2L, 2L, 1L, 1L, 2L, 2L), .Label = c('N', 'Y'), class = 'factor'), Temp = structure(c(2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L), .Label = c('High', 'Low'), class = 'factor'), Soft = structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L), .Label = c('Hard', 'Medium', 'Soft'), class = 'factor')), .Names = c('cbind(X, M)', 'M.user', 'Temp', 'Soft'), class = 'data.frame', row.names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), terms = quote(cbind(X, M) ~ M.user + Temp + Soft)));names(argv[[1]]); [1] "cbind(X, M)" "M.user" "Temp" "Soft" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames16# #argv <- list(structure(list(), .Names = character(0)));names(argv[[1]]); character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames17# #argv <- list(c(1281L, 1283L));names(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames18# #argv <- list(structure(list(itemBullet = '• '), .Names = 'itemBullet'));names(argv[[1]]); [1] "itemBullet" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames19# #argv <- list(structure(list(srcfile = c('/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils', '/home/lzhao/hg/r-instrumented/library/utils/R/utils'), frow = c(2417L, 2417L, 2418L, 2418L, 2420L, 2420L, 2422L, 2422L, 2423L, 2424L, 2426L, 2426L, 2426L, 2426L), lrow = c(2417L, 2417L, 2419L, 2419L, 2421L, 2421L, 2422L, 2422L, 2434L, 2425L, 2433L, 2433L, 2433L, 2433L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 14L), class = 'data.frame'));names(argv[[1]]); [1] "srcfile" "frow" "lrow" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames2# #argv <- list(list(character(0), numeric(0), numeric(0), complex(0), integer(0), logical(0), character(0)));names(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames20# #argv <- list(c(-21.222245139688+176.377752294836i, -21.222245139688-176.377752294836i, 61.0965873274464+76.7794305756989i, 61.0965873274464-76.7794305756989i, -11.748684375517+0i));names(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames21# #argv <- list(structure(list(a = 1), .Dim = 1L, .Dimnames = list('a')));names(argv[[1]]); [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames22# #argv <- list(structure(list(`Surv(time, status)` = structure(c(9, 1, 1, 6, 6, 8, 1, 1, 0, 1, 1, 0), .Dim = c(6L, 2L), .Dimnames = list(NULL, c('time', 'status')), class = 'Surv', type = 'right'), x = c(0, 1, 1, 1, 0, 0)), .Names = c('Surv(time, status)', 'x'), class = 'data.frame', row.names = c(1L, 3L, 4L, 5L, 6L, 7L)));names(argv[[1]]); [1] "Surv(time, status)" "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames23# #argv <- list(structure(list(xlev = structure(list(), .Names = character(0))), .Names = 'xlev'));names(argv[[1]]); [1] "xlev" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames24# #argv <- list(structure(c(0.434200949779115, NA, 0.907914219551846, 0.907914219551846, 0.907914219551846, 0.434200949779115, 0.434200949779115), .Names = c('1', NA, '3', '4', '5', '6', '7')));names(argv[[1]]); [1] "1" NA "3" "4" "5" "6" "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames25# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0));names(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames26# #argv <- list(structure(c(3.22711508258913, 3.17840134153376, 3.17811325231463, 3.14144977340047, 3.21272015441784, 3.17926446433903, 3.19284611518884, 3.21218760440396, 3.19838213000829, 3.21827285357145, 3.33284226699435, 3.33203427702752, 3.24353410183206, 3.24674470972384, 3.23477029516092, 3.19256745333655, 3.19728055812562, 3.18184358794477, 3.25647720624168, 3.25527250510331, 3.23527587668705, 3.30276370847298, 3.35063560825895, 3.39410130204004, 3.30749603791321, 3.21879799811174, 3.22865695810894, 3.21031851982623, 3.25647720624168, 3.24204423936955, 3.25406445291434, 3.28465628278852, 3.20924684875337, 3.29928933408768, 3.34888872307144, 3.34084054981233, 3.31806333496276, 3.24748226067705, 3.26363606858811, 3.19562294358694, 3.29578694025161, 3.2678754193189, 3.29336255471145, 3.22762964957101, 3.24993175663419, 3.29578694025161, 3.37966803403365, 3.42390091852842, 3.32159843046534, 3.29292029960001, 3.22453306260609, 3.28802553538836, 3.30168094929358, 3.25839780409551, 3.30362797638389, 3.28148788794008, 3.31889771462749, 3.31806333496276, 3.32592595577147, 3.33243845991561, 3.20628604441243, 3.17695898058691, 3.18977095634687, 3.14050804303818, 3.23829706787539, 3.25478968739721, 3.25017594808393, 3.27577190016493, 3.30189771719521, 3.3174364965351, 3.32056168019524, 3.31196566036837, 3.1978316933289, 3.13225968953104, 3.21801004298436, 3.14050804303818, 3.18155777386279, 3.15259407792747, 3.15896526038341, 3.18836592606315, 3.21906033244886, 3.19340290306242, 3.27989498001164, 3.34222522936079, 3.16820274684263, 3.21879799811174, 3.14829409743475, 3.14457420760962, 3.1846914308176, 3.11693964655076, 3.18355453361886, 3.12287092286444, 3.21138755293686, 3.24254142829838, 3.29181268746712, 3.35679046035172, 3.2169572073611, 3.14643813528577, 3.14952701375435, 3.14705767102836, 3.14426277376199, 3.18184358794477, 3.18412335423967, 3.21563756343506, 3.18041263283832, 3.22659990520736, 3.30102999566398, 3.34537373055909, 3.29136885045158, 3.16494737262184, 3.19395897801919, 3.16405529189345, 3.16016829295851, 3.21005084987514, 3.21932250841934, 3.2143138974244, 3.21563756343506, 3.22608411597582, 3.31175386105575, 3.35449260058944, 3.25839780409551, 3.15986784709257, 3.24600590407603, 3.1646502159343, 3.19200959265367, 3.15563963375978, 3.15442397311465, 3.1914510144649, 3.21616590228599, 3.21827285357145, 3.30449052777349, 3.34380233316165, 3.22141423784234, 3.13385812520333, 3.17782497186468, 3.13353890837022, 3.16226561429802, 3.18241465243455, 3.16435285578444, 3.19089171692217, 3.18977095634687, 3.26173854735254, 3.2397998184471, 3.28802553538836, 3.16849748352303, 3.16375752398196, 3.18808437371494, 3.14736710779379, 3.18241465243455, 3.14144977340047, 3.21510858105309, 3.17897694729317, 3.22556771343947, 3.28735377271475, 3.27137687189407, 3.23704079137919, 3.16316137497702, 3.15986784709257, 3.16316137497702, 3.13513265137677, 3.17231096852195, 3.19256745333655, 3.17260293120986, 3.22634208716363, 3.20248831706009, 3.26717172840301, 3.30059548388996, 3.31785448933147), .Tsp = c(1969, 1982.91666666667, 12), class = 'ts'));names(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames27# #argv <- list(structure(list(object = structure(3.14159265358979, comment = 'Start with pi'), slots = 'comment', dataPart = TRUE, class = structure('classPrototypeDef', package = 'methods')), .Names = c('object', 'slots', 'dataPart', 'class')));names(argv[[1]]); [1] "object" "slots" "dataPart" "class" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames28# #argv <- list(list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('#ifdef', '\\Sexpr', 'build', 'install', 'render'))));names(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames29# #argv <- list(structure(list(zz = complex(0)), .Names = 'zz'));names(argv[[1]]); [1] "zz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames3# #argv <- list(structure(list(), .Names = character(0), row.names = integer(0), class = 'data.frame'));names(argv[[1]]); character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames31# #argv <- list(list(structure(list(srcfile = c('/home/lzhao/tmp/RtmpTzriDZ/R.INSTALL30d4108a07be/mgcv/R/gam.fit3.r', '/home/lzhao/tmp/RtmpTzriDZ/R.INSTALL30d4108a07be/mgcv/R/gam.fit3.r'), frow = c(1287L, 1289L), lrow = c(1287L, 1289L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2, class = 'data.frame'), structure(list(srcfile = '/home/lzhao/tmp/RtmpTzriDZ/R.INSTALL30d4108a07be/mgcv/R/gam.fit3.r', frow = 1289L, lrow = 1289L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L), class = 'data.frame')));names(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames32# #argv <- list(structure(list(trace = 0, fnscale = 1, parscale = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1), ndeps = c(0.001, 0.001, 0.001, 0.001, 0.001, 0.001, 0.001, 0.001, 0.001, 0.001, 0.001), maxit = 100L, abstol = -Inf, reltol = 1.49011611938477e-08, alpha = 1, beta = 0.5, gamma = 2, REPORT = 10, type = 1, lmm = 5, factr = 1e+07, pgtol = 0, tmax = 10, temp = 10), .Names = c('trace', 'fnscale', 'parscale', 'ndeps', 'maxit', 'abstol', 'reltol', 'alpha', 'beta', 'gamma', 'REPORT', 'type', 'lmm', 'factr', 'pgtol', 'tmax', 'temp')));names(argv[[1]]); [1] "trace" "fnscale" "parscale" "ndeps" "maxit" "abstol" [7] "reltol" "alpha" "beta" "gamma" "REPORT" "type" [13] "lmm" "factr" "pgtol" "tmax" "temp" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames33# #argv <- list(structure(list(Df = c(NA, 0L), Deviance = c(NA, 0), `Resid. Df` = c(10L, 10L), `Resid. Dev` = c(2.74035772634541, 2.74035772634541)), .Names = c('Df', 'Deviance', 'Resid. Df', 'Resid. Dev'), row.names = c('NULL', 'x'), class = c('anova', 'data.frame'), heading = 'Analysis of Deviance Table\n\nModel: gaussian, link: identity\n\nResponse: y\n\nTerms added sequentially (first to last)\n\n'));names(argv[[1]]); [1] "Df" "Deviance" "Resid. Df" "Resid. Dev" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames34# #argv <- list(structure(c(100, -1e-13, Inf, -Inf, NaN, 3.14159265358979, NA), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')));names(argv[[1]]); [1] " 100" "-1e-13" " Inf" "-Inf" " NaN" "3.14" " NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames35# #argv <- list(structure(list(y = c(-0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861), x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE), z = 1:10), .Names = c('y', 'x', 'z'), class = 'data.frame', row.names = c(NA, 10L), terms = quote(y ~ x * z)));names(argv[[1]]); [1] "y" "x" "z" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames36# #argv <- list(structure(c(2671, 6.026e+77, 3.161e+152, 3.501e+299, 2.409e+227, 1.529e+302), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.'), class = 'table'));names(argv[[1]]); [1] "Min." "1st Qu." "Median" "Mean" "3rd Qu." "Max." ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames37# #argv <- list(structure(list(surname = structure(c('McNeil', 'Ripley', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'AsIs'), nationality = structure(c('Australia', 'UK', 'UK', 'US', 'US', 'Australia'), class = 'AsIs'), deceased = structure(c('no', 'no', 'no', 'no', 'yes', 'no'), class = 'AsIs'), title = structure(c('Interactive Data Analysis', 'Spatial Statistics', 'Stochastic Simulation', 'LISP-STAT', 'Exploratory Data Analysis', 'Modern Applied Statistics ...'), class = 'AsIs'), other.author = structure(c(NA, NA, NA, NA, NA, 'Ripley'), class = 'AsIs')), .Names = c('surname', 'nationality', 'deceased', 'title', 'other.author')));names(argv[[1]]); [1] "surname" "nationality" "deceased" "title" "other.author" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames38# #argv <- list(structure(list(head = logical(0)), .Names = 'head', class = 'data.frame', row.names = integer(0)));names(argv[[1]]); [1] "head" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames4# #argv <- list(structure(list(A = NULL, B = NULL, `NA` = NULL), .Names = c('A', 'B', NA)));names(argv[[1]]); [1] "A" "B" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames6# #argv <- list(structure(list(groups = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('1', '2', '3'), class = 'factor')), .Names = 'groups'));names(argv[[1]]); [1] "groups" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames7# #argv <- list(structure(1:20, .Tsp = c(1, 20, 1), class = 'ts'));names(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames8# #argv <- list(structure(c(12L, 120L, 116L), .Dim = 3L, .Dimnames = structure(list(c('0-5yrs', '6-11yrs', '12+ yrs')), .Names = ''), class = 'table'));names(argv[[1]]); [1] "0-5yrs" "6-11yrs" "12+ yrs" ##com.oracle.truffle.r.test.builtins.TestBuiltin_names.testnames9# #argv <- list(structure(list(sec = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), min = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), hour = c(20L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 20L, 20L, 20L, 20L, 19L, 19L, 19L, 20L, 20L, 20L, 19L, 20L, 19L, 19L, 19L, 20L), mday = c(30L, 31L, 31L, 31L, 31L, 31L, 31L, 31L, 31L, 30L, 30L, 30L, 30L, 31L, 31L, 31L, 30L, 30L, 30L, 31L, 30L, 31L, 31L, 31L, 30L), mon = c(5L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 5L, 5L, 5L, 5L, 11L, 11L, 11L, 5L, 5L, 5L, 11L, 5L, 11L, 11L, 11L, 5L), year = c(72L, 72L, 73L, 74L, 75L, 76L, 77L, 78L, 79L, 81L, 82L, 83L, 85L, 87L, 89L, 90L, 92L, 93L, 94L, 95L, 97L, 98L, 105L, 108L, 112L), wday = c(5L, 0L, 1L, 2L, 3L, 5L, 6L, 0L, 1L, 2L, 3L, 4L, 0L, 4L, 0L, 1L, 2L, 3L, 4L, 0L, 1L, 4L, 6L, 3L, 6L), yday = c(181L, 365L, 364L, 364L, 364L, 365L, 364L, 364L, 364L, 180L, 180L, 180L, 180L, 364L, 364L, 364L, 181L, 180L, 180L, 364L, 180L, 364L, 364L, 365L, 181L), isdst = c(1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 1L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt'), tzone = c('', 'EST', 'EDT')));names(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testAsCharacterConversion# #{ as.character.namesAssignCls <- function(x) x+1; x <- 1; names(x) <- structure(2, class='namesAssignCls'); names(x) } [1] "3" attr(,"class") [1] "namesAssignCls" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testAsCharacterConversion# #{ as.character.namesAssignCls <- function(x) x+1; x <- c(3,6); names(x) <- structure(2, class='namesAssignCls'); names(x) } [1] "3" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- 1:2; names(x) <- 1; names(x) } [1] "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- 1:2; names(x) <- structure(1, names=c('q'), abc=3); names(x) } [1] "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- 1:2; names(x) <- structure(c(1,2), names=c('q','r'), abc=3); names(x) } [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- as.pairlist(list(1,2)); names(x) <- 1; names(x) } [1] "1" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- as.pairlist(list(1,2)); names(x) <- structure(1, names=c('q'), abc=3); names(x) } [1] "1" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- as.pairlist(list(1,2)); names(x) <- structure(c(1,2), names=c('q','r'), abc=3); names(x) } [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- c(3,9); names(x) <- 1; names(x) } [1] "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- c(3,9); names(x) <- structure(1, names=c('q'), abc=3); names(x) } [1] "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- c(3,9); names(x) <- structure(c(1,2), names=c('q','r'), abc=3); names(x) } [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- quote(foo(3)); names(x) <- 1; names(x) } [1] "1" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- quote(foo(3)); names(x) <- structure(1, names=c('q'), abc=3); names(x) } [1] "1" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testTheSameAsInAttrAssignTests# #{ x <- quote(foo(3)); names(x) <- structure(c(1,2), names=c('q','r'), abc=3); names(x) } [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateDimnamesDifferentSize# #{ l <- list(1,2,3); names(l) <- list('a','b'); l } $a [1] 1 $b [1] 2 $ [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateDimnamesDifferentSize# #{ l <- list(1,2,3); names(l) <- list('a','b','c','d'); l } Error in names(l) <- list("a", "b", "c", "d") : 'names' attribute [4] must be the same length as the vector [3] ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateDimnamesPairlist# #{ l <- vector('pairlist',2); names(l)<-c('a','b'); l; } $a NULL $b NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ names(NULL) <- 'a'} Error in names(NULL) <- "a" : invalid (NULL) left side of assignment ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ names(NULL) <- NULL} Error in names(NULL) <- NULL : invalid (NULL) left side of assignment ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ nnnull <- NULL; names(nnnull) <- 'a'; nnnull} Error in names(nnnull) <- "a" : attempt to set an attribute on NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ nnnull <- NULL; names(nnnull) <- nnnull; nnnull} NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- 1:2 ; names(x) <- c("hello"); names(x) } [1] "hello" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- 1:2 ; names(x) <- c("hello", "hi"); names(x) } [1] "hello" "hi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- 1:2; names(x) <- c("A", "B") ; abs(x) } A B 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- 1:2; names(x) <- c("A", "B") ; y <- c(1,2,3,4) ; names(y) <- c("X", "Y", "Z") ; x + y } X Y Z 2 4 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- 1:2; names(x) <- c("hello", "hi") ; x } hello hi 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- c(1,2) ; names(x) <- c("hello"); names(x) } [1] "hello" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- c(1,2) ; names(x) <- c("hello", "hi"); names(x) } [1] "hello" "hi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- c(1,2); names(x) <- c("A", "B") ; x + 1 } A B 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- c(1,2); names(x) <- c("hello", "hi") ; x } hello hi 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- c(1,9); names(x) <- c("hello","hi") ; is.na(x) } hello hi FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- c(1,9); names(x) <- c("hello","hi") ; sqrt(x) } hello hi 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- c(1,NA); names(x) <- c("hello","hi") ; cumsum(x) } hello hi 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- c(1,NA); names(x) <- c(NA,"hi") ; cumsum(x) } hi 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- quote(plot(x = age, y = weight)); names(x)<- c("", "a", "b"); x} plot(a = age, b = weight) ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- quote(plot(x = age, y = weight)); names(x)<- c("", "a", "b", "d")} Error in names(x) <- c("", "a", "b", "d") : 'names' attribute [4] must be the same length as the vector [3] ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x <- quote(plot(x = age, y = weight)); x$x <- "random"; x} plot(x = "random", y = weight) ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-7; attr(x, "foo")<-"a"; attr(x, "bar")<-42; attributes(x) } $foo [1] "a" $bar [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-c("a", "", "bbb", "", "c"); names(x)<-1:4; x } 1 2 3 4 "a" "" "bbb" "" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-c(1, 2); attr(x, "names")<-c("a", "b"); names(x)<-NULL; attributes(x) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-c(1, 2); attr(x, "names")<-c("a", "b"); x } a b 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-c(1, 2); names(x)<-42; x } 42 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-c(1, 2); names(x)<-c("a", "b"); attr(x, "names")<-NULL; x } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-c(1, 2); names(x)<-c(TRUE, FALSE); x } TRUE FALSE 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-c(1,2); attr(x, "names") <- 42:45; x } Error in attr(x, "names") <- 42:45 : 'names' attribute [4] must be the same length as the vector [2] ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-c(1,2); names(x) <- 42:44; x } Error in names(x) <- 42:44 : 'names' attribute [3] must be the same length as the vector [2] ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-list(1,2); names(x)<-42:43; x } $`42` [1] 1 $`43` [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-list(1,2); names(x)<-c("a","$"); x } $a [1] 1 $`$` [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-list(1,2); names(x)<-c("a","b"); x } $a [1] 1 $b [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ x<-list(1,2); names(x)<-c("a",NA); x } $a [1] 1 $ [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ z <- c(a=1, b=2) ; names(z) <- NULL ; z } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNames# #{ { x <- quote(plot(x = age, y = weight)); names(x)<- c('b', 'd')}; names(x) } [1] "b" "d" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testUpdateNamesByFactors# #{ x <- c(1,2,1,3); f <- factor(x, labels = c("a","b","c")); names(x)<-f; x; } a b a c 1 2 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign1# #argv <- list(structure(list(happy = c('a', 'b', 'c', 'd'), sad = c('A', 'B', 'C', 'D', 'E', 'F')), .Names = c('happy', 'sad')), value = c('happy', 'sad'));`names<-`(argv[[1]],argv[[2]]); $happy [1] "a" "b" "c" "d" $sad [1] "A" "B" "C" "D" "E" "F" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign10# #argv <- list(structure(list(), .Names = character(0)), character(0));`names<-`(argv[[1]],argv[[2]]); named list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign11# #argv <- list(structure(list(save.object = NULL, panel.error = NULL, drop.unused.levels = NULL, default.theme = NULL, legend.bbox = NULL, banking = NULL, default.args = NULL, axis.padding = NULL, skip.boundary.labels = NULL, interaction.sep = NULL, panel.contourplot = NULL, panel.levelplot = NULL, panel.levelplot.raster = NULL, panel.parallel = NULL, panel.densityplot = NULL, panel.splom = NULL, panel.wireframe = NULL, panel.dotplot = NULL, panel.qq = NULL, panel.stripplot = NULL, panel.xyplot = NULL, panel.qqmath = NULL, panel.barchart = NULL, panel.bwplot = NULL, panel.histogram = NULL, panel.cloud = NULL, panel.pairs = NULL, prepanel.default.bwplot = NULL, prepanel.default.cloud = NULL, prepanel.default.densityplot = NULL, prepanel.default.histogram = NULL, prepanel.default.levelplot = NULL, prepanel.default.parallel = NULL, prepanel.default.qq = NULL, prepanel.default.qqmath = NULL, prepanel.default.splom = NULL, prepanel.default.xyplot = NULL, prepanel.default.dotplot = NULL, prepanel.default.barchart = NULL, prepanel.default.wireframe = NULL, prepanel.default.contourplot = NULL, axis.units = NULL, layout.heights = NULL, layout.widths = NULL, highlight.gpar = NULL), .Names = c('save.object', 'panel.error', 'drop.unused.levels', 'default.theme', 'legend.bbox', 'banking', 'default.args', 'axis.padding', 'skip.boundary.labels', 'interaction.sep', 'panel.contourplot', 'panel.levelplot', 'panel.levelplot.raster', 'panel.parallel', 'panel.densityplot', 'panel.splom', 'panel.wireframe', 'panel.dotplot', 'panel.qq', 'panel.stripplot', 'panel.xyplot', 'panel.qqmath', 'panel.barchart', 'panel.bwplot', 'panel.histogram', 'panel.cloud', 'panel.pairs', 'prepanel.default.bwplot', 'prepanel.default.cloud', 'prepanel.default.densityplot', 'prepanel.default.histogram', 'prepanel.default.levelplot', 'prepanel.default.parallel', 'prepanel.default.qq', 'prepanel.default.qqmath', 'prepanel.default.splom', 'prepanel.default.xyplot', 'prepanel.default.dotplot', 'prepanel.default.barchart', 'prepanel.default.wireframe', 'prepanel.default.contourplot', 'axis.units', 'layout.heights', 'layout.widths', 'highlight.gpar')), value = c('save.object', 'panel.error', 'drop.unused.levels', 'default.theme', 'legend.bbox', 'banking', 'default.args', 'axis.padding', 'skip.boundary.labels', 'interaction.sep', 'panel.contourplot', 'panel.levelplot', 'panel.levelplot.raster', 'panel.parallel', 'panel.densityplot', 'panel.splom', 'panel.wireframe', 'panel.dotplot', 'panel.qq', 'panel.stripplot', 'panel.xyplot', 'panel.qqmath', 'panel.barchart', 'panel.bwplot', 'panel.histogram', 'panel.cloud', 'panel.pairs', 'prepanel.default.bwplot', 'prepanel.default.cloud', 'prepanel.default.densityplot', 'prepanel.default.histogram', 'prepanel.default.levelplot', 'prepanel.default.parallel', 'prepanel.default.qq', 'prepanel.default.qqmath', 'prepanel.default.splom', 'prepanel.default.xyplot', 'prepanel.default.dotplot', 'prepanel.default.barchart', 'prepanel.default.wireframe', 'prepanel.default.contourplot', 'axis.units', 'layout.heights', 'layout.widths', 'highlight.gpar'));`names<-`(argv[[1]],argv[[2]]); $save.object NULL $panel.error NULL $drop.unused.levels NULL $default.theme NULL $legend.bbox NULL $banking NULL $default.args NULL $axis.padding NULL $skip.boundary.labels NULL $interaction.sep NULL $panel.contourplot NULL $panel.levelplot NULL $panel.levelplot.raster NULL $panel.parallel NULL $panel.densityplot NULL $panel.splom NULL $panel.wireframe NULL $panel.dotplot NULL $panel.qq NULL $panel.stripplot NULL $panel.xyplot NULL $panel.qqmath NULL $panel.barchart NULL $panel.bwplot NULL $panel.histogram NULL $panel.cloud NULL $panel.pairs NULL $prepanel.default.bwplot NULL $prepanel.default.cloud NULL $prepanel.default.densityplot NULL $prepanel.default.histogram NULL $prepanel.default.levelplot NULL $prepanel.default.parallel NULL $prepanel.default.qq NULL $prepanel.default.qqmath NULL $prepanel.default.splom NULL $prepanel.default.xyplot NULL $prepanel.default.dotplot NULL $prepanel.default.barchart NULL $prepanel.default.wireframe NULL $prepanel.default.contourplot NULL $axis.units NULL $layout.heights NULL $layout.widths NULL $highlight.gpar NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign12# #argv <- list(structure(c(100, -1e-13, Inf, -Inf, NaN, 3.14159265358979, NA), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')), value = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA'));`names<-`(argv[[1]],argv[[2]]); 100 -1e-13 Inf -Inf NaN 1.000000e+02 -1.000000e-13 Inf -Inf NaN 3.14 NA 3.141593e+00 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign13# #argv <- list(structure(list(A = 0:10, B = 10:20, `NA` = 20:30), .Names = c('A', 'B', NA), row.names = c(NA, -11L), class = 'data.frame'), value = c('A', 'B', NA));`names<-`(argv[[1]],argv[[2]]); A B NA 1 0 10 20 2 1 11 21 3 2 12 22 4 3 13 23 5 4 14 24 6 5 15 25 7 6 16 26 8 7 17 27 9 8 18 28 10 9 19 29 11 10 20 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign15# #argv <- list(structure(list(surname = structure(c(5L, 6L, 4L, 3L, 3L, 1L, 2L), .Label = c('McNeil', 'R Core', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), title = structure(c(2L, 5L, 4L, 6L, 7L, 3L, 1L), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA, 1L, NA, NA, NA, NA, 2L), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('surname', 'title', 'other.author'), row.names = c(NA, -7L), class = 'data.frame'), value = c('surname', 'title', 'other.author'));`names<-`(argv[[1]],argv[[2]]); surname title other.author 1 Tukey Exploratory Data Analysis 2 Venables Modern Applied Statistics ... Ripley 3 Tierney LISP-STAT 4 Ripley Spatial Statistics 5 Ripley Stochastic Simulation 6 McNeil Interactive Data Analysis 7 R Core An Introduction to R Venables & Smith ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign16# #argv <- list(structure(1:3, .Names = c('foo', 'bar', 'baz')), value = c('foo', 'bar', 'baz'));`names<-`(argv[[1]],argv[[2]]); foo bar baz 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign17# #argv <- list(structure(c(1+1i, 1.2+10i), .Names = c('a', 'b')), value = c('a', 'b'));`names<-`(argv[[1]],argv[[2]]); a b 1.0+ 1i 1.2+10i ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign18# #argv <- list(structure(c(67L, 34L), .Dim = 2L, .Dimnames = list(c('\'actual\'', 'virtual')), class = 'table'), value = c('\'actual\'', 'virtual'));`names<-`(argv[[1]],argv[[2]]); 'actual' virtual 67 34 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign2# #argv <- list(structure(list(population = c(3615, 365, 2212, 2110, 21198, 2541, 3100, 579, 8277, 4931, 868, 813, 11197, 5313, 2861, 2280, 3387, 3806, 1058, 4122, 5814, 9111, 3921, 2341, 4767, 746, 1544, 590, 812, 7333, 1144, 18076, 5441, 637, 10735, 2715, 2284, 11860, 931, 2816, 681, 4173, 12237, 1203, 472, 4981, 3559, 1799, 4589, 376), income = c(3624, 6315, 4530, 3378, 5114, 4884, 5348, 4809, 4815, 4091, 4963, 4119, 5107, 4458, 4628, 4669, 3712, 3545, 3694, 5299, 4755, 4751, 4675, 3098, 4254, 4347, 4508, 5149, 4281, 5237, 3601, 4903, 3875, 5087, 4561, 3983, 4660, 4449, 4558, 3635, 4167, 3821, 4188, 4022, 3907, 4701, 4864, 3617, 4468, 4566), illiteracy = c(2.1, 1.5, 1.8, 1.9, 1.1, 0.7, 1.1, 0.9, 1.3, 2, 1.9, 0.6, 0.9, 0.7, 0.5, 0.6, 1.6, 2.8, 0.7, 0.9, 1.1, 0.9, 0.6, 2.4, 0.8, 0.6, 0.6, 0.5, 0.7, 1.1, 2.2, 1.4, 1.8, 0.8, 0.8, 1.1, 0.6, 1, 1.3, 2.3, 0.5, 1.7, 2.2, 0.6, 0.6, 1.4, 0.6, 1.4, 0.7, 0.6), life.exp = c(69.05, 69.31, 70.55, 70.66, 71.71, 72.06, 72.48, 70.06, 70.66, 68.54, 73.6, 71.87, 70.14, 70.88, 72.56, 72.58, 70.1, 68.76, 70.39, 70.22, 71.83, 70.63, 72.96, 68.09, 70.69, 70.56, 72.6, 69.03, 71.23, 70.93, 70.32, 70.55, 69.21, 72.78, 70.82, 71.42, 72.13, 70.43, 71.9, 67.96, 72.08, 70.11, 70.9, 72.9, 71.64, 70.08, 71.72, 69.48, 72.48, 70.29), murder = c(15.1, 11.3, 7.8, 10.1, 10.3, 6.8, 3.1, 6.2, 10.7, 13.9, 6.2, 5.3, 10.3, 7.1, 2.3, 4.5, 10.6, 13.2, 2.7, 8.5, 3.3, 11.1, 2.3, 12.5, 9.3, 5, 2.9, 11.5, 3.3, 5.2, 9.7, 10.9, 11.1, 1.4, 7.4, 6.4, 4.2, 6.1, 2.4, 11.6, 1.7, 11, 12.2, 4.5, 5.5, 9.5, 4.3, 6.7, 3, 6.9), hs.grad = c(41.3, 66.7, 58.1, 39.9, 62.6, 63.9, 56, 54.6, 52.6, 40.6, 61.9, 59.5, 52.6, 52.9, 59, 59.9, 38.5, 42.2, 54.7, 52.3, 58.5, 52.8, 57.6, 41, 48.8, 59.2, 59.3, 65.2, 57.6, 52.5, 55.2, 52.7, 38.5, 50.3, 53.2, 51.6, 60, 50.2, 46.4, 37.8, 53.3, 41.8, 47.4, 67.3, 57.1, 47.8, 63.5, 41.6, 54.5, 62.9), frost = c(20, 152, 15, 65, 20, 166, 139, 103, 11, 60, 0, 126, 127, 122, 140, 114, 95, 12, 161, 101, 103, 125, 160, 50, 108, 155, 139, 188, 174, 115, 120, 82, 80, 186, 124, 82, 44, 126, 127, 65, 172, 70, 35, 137, 168, 85, 32, 100, 149, 173), area = c(50708, 566432, 113417, 51945, 156361, 103766, 4862, 1982, 54090, 58073, 6425, 82677, 55748, 36097, 55941, 81787, 39650, 44930, 30920, 9891, 7826, 56817, 79289, 47296, 68995, 145587, 76483, 109889, 9027, 7521, 121412, 47831, 48798, 69273, 40975, 68782, 96184, 44966, 1049, 30225, 75955, 41328, 262134, 82096, 9267, 39780, 66570, 24070, 54464, 97203), region = structure(c(2L, 4L, 4L, 2L, 4L, 4L, 1L, 2L, 2L, 2L, 4L, 4L, 3L, 3L, 3L, 3L, 2L, 2L, 1L, 2L, 1L, 3L, 3L, 2L, 3L, 4L, 3L, 4L, 1L, 1L, 4L, 1L, 2L, 3L, 3L, 2L, 4L, 1L, 1L, 2L, 3L, 2L, 2L, 4L, 1L, 2L, 4L, 2L, 3L, 4L), .Label = c('Northeast', 'South', 'North Central', 'West'), class = 'factor')), .Names = c('population', 'income', 'illiteracy', 'life.exp', 'murder', 'hs.grad', 'frost', 'area', 'region'), row.names = c('Alabama', 'Alaska', 'Arizona', 'Arkansas', 'California', 'Colorado', 'Connecticut', 'Delaware', 'Florida', 'Georgia', 'Hawaii', 'Idaho', 'Illinois', 'Indiana', 'Iowa', 'Kansas', 'Kentucky', 'Louisiana', 'Maine', 'Maryland', 'Massachusetts', 'Michigan', 'Minnesota', 'Mississippi', 'Missouri', 'Montana', 'Nebraska', 'Nevada', 'New Hampshire', 'New Jersey', 'New Mexico', 'New York', 'North Carolina', 'North Dakota', 'Ohio', 'Oklahoma', 'Oregon', 'Pennsylvania', 'Rhode Island', 'South Carolina', 'South Dakota', 'Tennessee', 'Texas', 'Utah', 'Vermont', 'Virginia', 'Washington', 'West Virginia', 'Wisconsin', 'Wyoming'), class = 'data.frame'), value = c('population', 'income', 'illiteracy', 'life.exp', 'murder', 'hs.grad', 'frost', 'area', 'region'));`names<-`(argv[[1]],argv[[2]]); population income illiteracy life.exp murder hs.grad frost Alabama 3615 3624 2.1 69.05 15.1 41.3 20 Alaska 365 6315 1.5 69.31 11.3 66.7 152 Arizona 2212 4530 1.8 70.55 7.8 58.1 15 Arkansas 2110 3378 1.9 70.66 10.1 39.9 65 California 21198 5114 1.1 71.71 10.3 62.6 20 Colorado 2541 4884 0.7 72.06 6.8 63.9 166 Connecticut 3100 5348 1.1 72.48 3.1 56.0 139 Delaware 579 4809 0.9 70.06 6.2 54.6 103 Florida 8277 4815 1.3 70.66 10.7 52.6 11 Georgia 4931 4091 2.0 68.54 13.9 40.6 60 Hawaii 868 4963 1.9 73.60 6.2 61.9 0 Idaho 813 4119 0.6 71.87 5.3 59.5 126 Illinois 11197 5107 0.9 70.14 10.3 52.6 127 Indiana 5313 4458 0.7 70.88 7.1 52.9 122 Iowa 2861 4628 0.5 72.56 2.3 59.0 140 Kansas 2280 4669 0.6 72.58 4.5 59.9 114 Kentucky 3387 3712 1.6 70.10 10.6 38.5 95 Louisiana 3806 3545 2.8 68.76 13.2 42.2 12 Maine 1058 3694 0.7 70.39 2.7 54.7 161 Maryland 4122 5299 0.9 70.22 8.5 52.3 101 Massachusetts 5814 4755 1.1 71.83 3.3 58.5 103 Michigan 9111 4751 0.9 70.63 11.1 52.8 125 Minnesota 3921 4675 0.6 72.96 2.3 57.6 160 Mississippi 2341 3098 2.4 68.09 12.5 41.0 50 Missouri 4767 4254 0.8 70.69 9.3 48.8 108 Montana 746 4347 0.6 70.56 5.0 59.2 155 Nebraska 1544 4508 0.6 72.60 2.9 59.3 139 Nevada 590 5149 0.5 69.03 11.5 65.2 188 New Hampshire 812 4281 0.7 71.23 3.3 57.6 174 New Jersey 7333 5237 1.1 70.93 5.2 52.5 115 New Mexico 1144 3601 2.2 70.32 9.7 55.2 120 New York 18076 4903 1.4 70.55 10.9 52.7 82 North Carolina 5441 3875 1.8 69.21 11.1 38.5 80 North Dakota 637 5087 0.8 72.78 1.4 50.3 186 Ohio 10735 4561 0.8 70.82 7.4 53.2 124 Oklahoma 2715 3983 1.1 71.42 6.4 51.6 82 Oregon 2284 4660 0.6 72.13 4.2 60.0 44 Pennsylvania 11860 4449 1.0 70.43 6.1 50.2 126 Rhode Island 931 4558 1.3 71.90 2.4 46.4 127 South Carolina 2816 3635 2.3 67.96 11.6 37.8 65 South Dakota 681 4167 0.5 72.08 1.7 53.3 172 Tennessee 4173 3821 1.7 70.11 11.0 41.8 70 Texas 12237 4188 2.2 70.90 12.2 47.4 35 Utah 1203 4022 0.6 72.90 4.5 67.3 137 Vermont 472 3907 0.6 71.64 5.5 57.1 168 Virginia 4981 4701 1.4 70.08 9.5 47.8 85 Washington 3559 4864 0.6 71.72 4.3 63.5 32 West Virginia 1799 3617 1.4 69.48 6.7 41.6 100 Wisconsin 4589 4468 0.7 72.48 3.0 54.5 149 Wyoming 376 4566 0.6 70.29 6.9 62.9 173 area region Alabama 50708 South Alaska 566432 West Arizona 113417 West Arkansas 51945 South California 156361 West Colorado 103766 West Connecticut 4862 Northeast Delaware 1982 South Florida 54090 South Georgia 58073 South Hawaii 6425 West Idaho 82677 West Illinois 55748 North Central Indiana 36097 North Central Iowa 55941 North Central Kansas 81787 North Central Kentucky 39650 South Louisiana 44930 South Maine 30920 Northeast Maryland 9891 South Massachusetts 7826 Northeast Michigan 56817 North Central Minnesota 79289 North Central Mississippi 47296 South Missouri 68995 North Central Montana 145587 West Nebraska 76483 North Central Nevada 109889 West New Hampshire 9027 Northeast New Jersey 7521 Northeast New Mexico 121412 West New York 47831 Northeast North Carolina 48798 South North Dakota 69273 North Central Ohio 40975 North Central Oklahoma 68782 South Oregon 96184 West Pennsylvania 44966 Northeast Rhode Island 1049 Northeast South Carolina 30225 South South Dakota 75955 North Central Tennessee 41328 South Texas 262134 South Utah 82096 West Vermont 9267 Northeast Virginia 39780 South Washington 66570 West West Virginia 24070 South Wisconsin 54464 North Central Wyoming 97203 West ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign3# #argv <- list(structure(list(`Sepal Length` = c(5.1, 4.9, 4.7, 4.6, 5, 5.4, 4.6, 5, 4.4, 4.9, 5.4, 4.8, 4.8, 4.3, 5.8, 5.7, 5.4, 5.1, 5.7, 5.1, 5.4, 5.1, 4.6, 5.1, 4.8, 5, 5, 5.2, 5.2, 4.7, 4.8, 5.4, 5.2, 5.5, 4.9, 5, 5.5, 4.9, 4.4, 5.1, 5, 4.5, 4.4, 5, 5.1, 4.8, 5.1, 4.6, 5.3, 5, 7, 6.4, 6.9, 5.5, 6.5, 5.7, 6.3, 4.9, 6.6, 5.2, 5, 5.9, 6, 6.1, 5.6, 6.7, 5.6, 5.8, 6.2, 5.6, 5.9, 6.1, 6.3, 6.1, 6.4, 6.6, 6.8, 6.7, 6, 5.7, 5.5, 5.5, 5.8, 6, 5.4, 6, 6.7, 6.3, 5.6, 5.5, 5.5, 6.1, 5.8, 5, 5.6, 5.7, 5.7, 6.2, 5.1, 5.7, 6.3, 5.8, 7.1, 6.3, 6.5, 7.6, 4.9, 7.3, 6.7, 7.2, 6.5, 6.4, 6.8, 5.7, 5.8, 6.4, 6.5, 7.7, 7.7, 6, 6.9, 5.6, 7.7, 6.3, 6.7, 7.2, 6.2, 6.1, 6.4, 7.2, 7.4, 7.9, 6.4, 6.3, 6.1, 7.7, 6.3, 6.4, 6, 6.9, 6.7, 6.9, 5.8, 6.8, 6.7, 6.7, 6.3, 6.5, 6.2, 5.9), `Sepal Width` = c(3.5, 3, 3.2, 3.1, 3.6, 3.9, 3.4, 3.4, 2.9, 3.1, 3.7, 3.4, 3, 3, 4, 4.4, 3.9, 3.5, 3.8, 3.8, 3.4, 3.7, 3.6, 3.3, 3.4, 3, 3.4, 3.5, 3.4, 3.2, 3.1, 3.4, 4.1, 4.2, 3.1, 3.2, 3.5, 3.6, 3, 3.4, 3.5, 2.3, 3.2, 3.5, 3.8, 3, 3.8, 3.2, 3.7, 3.3, 3.2, 3.2, 3.1, 2.3, 2.8, 2.8, 3.3, 2.4, 2.9, 2.7, 2, 3, 2.2, 2.9, 2.9, 3.1, 3, 2.7, 2.2, 2.5, 3.2, 2.8, 2.5, 2.8, 2.9, 3, 2.8, 3, 2.9, 2.6, 2.4, 2.4, 2.7, 2.7, 3, 3.4, 3.1, 2.3, 3, 2.5, 2.6, 3, 2.6, 2.3, 2.7, 3, 2.9, 2.9, 2.5, 2.8, 3.3, 2.7, 3, 2.9, 3, 3, 2.5, 2.9, 2.5, 3.6, 3.2, 2.7, 3, 2.5, 2.8, 3.2, 3, 3.8, 2.6, 2.2, 3.2, 2.8, 2.8, 2.7, 3.3, 3.2, 2.8, 3, 2.8, 3, 2.8, 3.8, 2.8, 2.8, 2.6, 3, 3.4, 3.1, 3, 3.1, 3.1, 3.1, 2.7, 3.2, 3.3, 3, 2.5, 3, 3.4, 3), `Petal Length` = c(1.4, 1.4, 1.3, 1.5, 1.4, 1.7, 1.4, 1.5, 1.4, 1.5, 1.5, 1.6, 1.4, 1.1, 1.2, 1.5, 1.3, 1.4, 1.7, 1.5, 1.7, 1.5, 1, 1.7, 1.9, 1.6, 1.6, 1.5, 1.4, 1.6, 1.6, 1.5, 1.5, 1.4, 1.5, 1.2, 1.3, 1.4, 1.3, 1.5, 1.3, 1.3, 1.3, 1.6, 1.9, 1.4, 1.6, 1.4, 1.5, 1.4, 4.7, 4.5, 4.9, 4, 4.6, 4.5, 4.7, 3.3, 4.6, 3.9, 3.5, 4.2, 4, 4.7, 3.6, 4.4, 4.5, 4.1, 4.5, 3.9, 4.8, 4, 4.9, 4.7, 4.3, 4.4, 4.8, 5, 4.5, 3.5, 3.8, 3.7, 3.9, 5.1, 4.5, 4.5, 4.7, 4.4, 4.1, 4, 4.4, 4.6, 4, 3.3, 4.2, 4.2, 4.2, 4.3, 3, 4.1, 6, 5.1, 5.9, 5.6, 5.8, 6.6, 4.5, 6.3, 5.8, 6.1, 5.1, 5.3, 5.5, 5, 5.1, 5.3, 5.5, 6.7, 6.9, 5, 5.7, 4.9, 6.7, 4.9, 5.7, 6, 4.8, 4.9, 5.6, 5.8, 6.1, 6.4, 5.6, 5.1, 5.6, 6.1, 5.6, 5.5, 4.8, 5.4, 5.6, 5.1, 5.1, 5.9, 5.7, 5.2, 5, 5.2, 5.4, 5.1), `Petal Width` = c(0.2, 0.2, 0.2, 0.2, 0.2, 0.4, 0.3, 0.2, 0.2, 0.1, 0.2, 0.2, 0.1, 0.1, 0.2, 0.4, 0.4, 0.3, 0.3, 0.3, 0.2, 0.4, 0.2, 0.5, 0.2, 0.2, 0.4, 0.2, 0.2, 0.2, 0.2, 0.4, 0.1, 0.2, 0.2, 0.2, 0.2, 0.1, 0.2, 0.2, 0.3, 0.3, 0.2, 0.6, 0.4, 0.3, 0.2, 0.2, 0.2, 0.2, 1.4, 1.5, 1.5, 1.3, 1.5, 1.3, 1.6, 1, 1.3, 1.4, 1, 1.5, 1, 1.4, 1.3, 1.4, 1.5, 1, 1.5, 1.1, 1.8, 1.3, 1.5, 1.2, 1.3, 1.4, 1.4, 1.7, 1.5, 1, 1.1, 1, 1.2, 1.6, 1.5, 1.6, 1.5, 1.3, 1.3, 1.3, 1.2, 1.4, 1.2, 1, 1.3, 1.2, 1.3, 1.3, 1.1, 1.3, 2.5, 1.9, 2.1, 1.8, 2.2, 2.1, 1.7, 1.8, 1.8, 2.5, 2, 1.9, 2.1, 2, 2.4, 2.3, 1.8, 2.2, 2.3, 1.5, 2.3, 2, 2, 1.8, 2.1, 1.8, 1.8, 1.8, 2.1, 1.6, 1.9, 2, 2.2, 1.5, 1.4, 2.3, 2.4, 1.8, 1.8, 2.1, 2.4, 2.3, 1.9, 2.3, 2.5, 2.3, 1.9, 2, 2.3, 1.8), Species = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('setosa', 'versicolor', 'virginica'), class = 'factor')), .Names = c('Sepal Length', 'Sepal Width', 'Petal Length', 'Petal Width', 'Species'), row.names = c(NA, -150L), class = 'data.frame'), value = c('Sepal Length', 'Sepal Width', 'Petal Length', 'Petal Width', 'Species'));`names<-`(argv[[1]],argv[[2]]); Sepal Length Sepal Width Petal Length Petal Width Species 1 5.1 3.5 1.4 0.2 setosa 2 4.9 3.0 1.4 0.2 setosa 3 4.7 3.2 1.3 0.2 setosa 4 4.6 3.1 1.5 0.2 setosa 5 5.0 3.6 1.4 0.2 setosa 6 5.4 3.9 1.7 0.4 setosa 7 4.6 3.4 1.4 0.3 setosa 8 5.0 3.4 1.5 0.2 setosa 9 4.4 2.9 1.4 0.2 setosa 10 4.9 3.1 1.5 0.1 setosa 11 5.4 3.7 1.5 0.2 setosa 12 4.8 3.4 1.6 0.2 setosa 13 4.8 3.0 1.4 0.1 setosa 14 4.3 3.0 1.1 0.1 setosa 15 5.8 4.0 1.2 0.2 setosa 16 5.7 4.4 1.5 0.4 setosa 17 5.4 3.9 1.3 0.4 setosa 18 5.1 3.5 1.4 0.3 setosa 19 5.7 3.8 1.7 0.3 setosa 20 5.1 3.8 1.5 0.3 setosa 21 5.4 3.4 1.7 0.2 setosa 22 5.1 3.7 1.5 0.4 setosa 23 4.6 3.6 1.0 0.2 setosa 24 5.1 3.3 1.7 0.5 setosa 25 4.8 3.4 1.9 0.2 setosa 26 5.0 3.0 1.6 0.2 setosa 27 5.0 3.4 1.6 0.4 setosa 28 5.2 3.5 1.5 0.2 setosa 29 5.2 3.4 1.4 0.2 setosa 30 4.7 3.2 1.6 0.2 setosa 31 4.8 3.1 1.6 0.2 setosa 32 5.4 3.4 1.5 0.4 setosa 33 5.2 4.1 1.5 0.1 setosa 34 5.5 4.2 1.4 0.2 setosa 35 4.9 3.1 1.5 0.2 setosa 36 5.0 3.2 1.2 0.2 setosa 37 5.5 3.5 1.3 0.2 setosa 38 4.9 3.6 1.4 0.1 setosa 39 4.4 3.0 1.3 0.2 setosa 40 5.1 3.4 1.5 0.2 setosa 41 5.0 3.5 1.3 0.3 setosa 42 4.5 2.3 1.3 0.3 setosa 43 4.4 3.2 1.3 0.2 setosa 44 5.0 3.5 1.6 0.6 setosa 45 5.1 3.8 1.9 0.4 setosa 46 4.8 3.0 1.4 0.3 setosa 47 5.1 3.8 1.6 0.2 setosa 48 4.6 3.2 1.4 0.2 setosa 49 5.3 3.7 1.5 0.2 setosa 50 5.0 3.3 1.4 0.2 setosa 51 7.0 3.2 4.7 1.4 versicolor 52 6.4 3.2 4.5 1.5 versicolor 53 6.9 3.1 4.9 1.5 versicolor 54 5.5 2.3 4.0 1.3 versicolor 55 6.5 2.8 4.6 1.5 versicolor 56 5.7 2.8 4.5 1.3 versicolor 57 6.3 3.3 4.7 1.6 versicolor 58 4.9 2.4 3.3 1.0 versicolor 59 6.6 2.9 4.6 1.3 versicolor 60 5.2 2.7 3.9 1.4 versicolor 61 5.0 2.0 3.5 1.0 versicolor 62 5.9 3.0 4.2 1.5 versicolor 63 6.0 2.2 4.0 1.0 versicolor 64 6.1 2.9 4.7 1.4 versicolor 65 5.6 2.9 3.6 1.3 versicolor 66 6.7 3.1 4.4 1.4 versicolor 67 5.6 3.0 4.5 1.5 versicolor 68 5.8 2.7 4.1 1.0 versicolor 69 6.2 2.2 4.5 1.5 versicolor 70 5.6 2.5 3.9 1.1 versicolor 71 5.9 3.2 4.8 1.8 versicolor 72 6.1 2.8 4.0 1.3 versicolor 73 6.3 2.5 4.9 1.5 versicolor 74 6.1 2.8 4.7 1.2 versicolor 75 6.4 2.9 4.3 1.3 versicolor 76 6.6 3.0 4.4 1.4 versicolor 77 6.8 2.8 4.8 1.4 versicolor 78 6.7 3.0 5.0 1.7 versicolor 79 6.0 2.9 4.5 1.5 versicolor 80 5.7 2.6 3.5 1.0 versicolor 81 5.5 2.4 3.8 1.1 versicolor 82 5.5 2.4 3.7 1.0 versicolor 83 5.8 2.7 3.9 1.2 versicolor 84 6.0 2.7 5.1 1.6 versicolor 85 5.4 3.0 4.5 1.5 versicolor 86 6.0 3.4 4.5 1.6 versicolor 87 6.7 3.1 4.7 1.5 versicolor 88 6.3 2.3 4.4 1.3 versicolor 89 5.6 3.0 4.1 1.3 versicolor 90 5.5 2.5 4.0 1.3 versicolor 91 5.5 2.6 4.4 1.2 versicolor 92 6.1 3.0 4.6 1.4 versicolor 93 5.8 2.6 4.0 1.2 versicolor 94 5.0 2.3 3.3 1.0 versicolor 95 5.6 2.7 4.2 1.3 versicolor 96 5.7 3.0 4.2 1.2 versicolor 97 5.7 2.9 4.2 1.3 versicolor 98 6.2 2.9 4.3 1.3 versicolor 99 5.1 2.5 3.0 1.1 versicolor 100 5.7 2.8 4.1 1.3 versicolor 101 6.3 3.3 6.0 2.5 virginica 102 5.8 2.7 5.1 1.9 virginica 103 7.1 3.0 5.9 2.1 virginica 104 6.3 2.9 5.6 1.8 virginica 105 6.5 3.0 5.8 2.2 virginica 106 7.6 3.0 6.6 2.1 virginica 107 4.9 2.5 4.5 1.7 virginica 108 7.3 2.9 6.3 1.8 virginica 109 6.7 2.5 5.8 1.8 virginica 110 7.2 3.6 6.1 2.5 virginica 111 6.5 3.2 5.1 2.0 virginica 112 6.4 2.7 5.3 1.9 virginica 113 6.8 3.0 5.5 2.1 virginica 114 5.7 2.5 5.0 2.0 virginica 115 5.8 2.8 5.1 2.4 virginica 116 6.4 3.2 5.3 2.3 virginica 117 6.5 3.0 5.5 1.8 virginica 118 7.7 3.8 6.7 2.2 virginica 119 7.7 2.6 6.9 2.3 virginica 120 6.0 2.2 5.0 1.5 virginica 121 6.9 3.2 5.7 2.3 virginica 122 5.6 2.8 4.9 2.0 virginica 123 7.7 2.8 6.7 2.0 virginica 124 6.3 2.7 4.9 1.8 virginica 125 6.7 3.3 5.7 2.1 virginica 126 7.2 3.2 6.0 1.8 virginica 127 6.2 2.8 4.8 1.8 virginica 128 6.1 3.0 4.9 1.8 virginica 129 6.4 2.8 5.6 2.1 virginica 130 7.2 3.0 5.8 1.6 virginica 131 7.4 2.8 6.1 1.9 virginica 132 7.9 3.8 6.4 2.0 virginica 133 6.4 2.8 5.6 2.2 virginica 134 6.3 2.8 5.1 1.5 virginica 135 6.1 2.6 5.6 1.4 virginica 136 7.7 3.0 6.1 2.3 virginica 137 6.3 3.4 5.6 2.4 virginica 138 6.4 3.1 5.5 1.8 virginica 139 6.0 3.0 4.8 1.8 virginica 140 6.9 3.1 5.4 2.1 virginica 141 6.7 3.1 5.6 2.4 virginica 142 6.9 3.1 5.1 2.3 virginica 143 5.8 2.7 5.1 1.9 virginica 144 6.8 3.2 5.9 2.3 virginica 145 6.7 3.3 5.7 2.5 virginica 146 6.7 3.0 5.2 2.3 virginica 147 6.3 2.5 5.0 1.9 virginica 148 6.5 3.0 5.2 2.0 virginica 149 6.2 3.4 5.4 2.3 virginica 150 5.9 3.0 5.1 1.8 virginica ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign4# #argv <- list(structure(list(y = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962, Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551)), .Names = c('y', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year', 'Employed'), row.names = 1947:1962, class = 'data.frame'), value = c('y', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year', 'Employed'));`names<-`(argv[[1]],argv[[2]]); y GNP Unemployed Armed.Forces Population Year Employed 1947 83.0 234.289 235.6 159.0 107.608 1947 60.323 1948 88.5 259.426 232.5 145.6 108.632 1948 61.122 1949 88.2 258.054 368.2 161.6 109.773 1949 60.171 1950 89.5 284.599 335.1 165.0 110.929 1950 61.187 1951 96.2 328.975 209.9 309.9 112.075 1951 63.221 1952 98.1 346.999 193.2 359.4 113.270 1952 63.639 1953 99.0 365.385 187.0 354.7 115.094 1953 64.989 1954 100.0 363.112 357.8 335.0 116.219 1954 63.761 1955 101.2 397.469 290.4 304.8 117.388 1955 66.019 1956 104.6 419.180 282.2 285.7 118.734 1956 67.857 1957 108.4 442.769 293.6 279.8 120.445 1957 68.169 1958 110.8 444.546 468.1 263.7 121.950 1958 66.513 1959 112.6 482.704 381.3 255.2 123.366 1959 68.655 1960 114.2 502.601 393.1 251.4 125.368 1960 69.564 1961 115.7 518.173 480.6 257.2 127.852 1961 69.331 1962 116.9 554.894 400.7 282.7 130.081 1962 70.551 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign5# #argv <- list(c(-3.21402130636699, 101.08748330158, -8.50234284659562), value = NULL);`names<-`(argv[[1]],argv[[2]]); [1] -3.214021 101.087483 -8.502343 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign6# #argv <- list(structure(1:3, .Names = c(NA, 'b', NA)), value = c(NA, 'b'));`names<-`(argv[[1]],argv[[2]]); b 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign7# #argv <- list(structure(c(3.14159265358979e-10, 0.0314159265358979, 3.14159265358979, 31.4159265358979, 314.159265358979, 314159265.358979, 3.14159265358979e+20), .Names = c('3.14e-10', '0.0314', '3.14', '31.4', '314', '3.14e+08', '3.14e+20')), value = c('3.14e-10', '0.0314', '3.14', '31.4', '314', '3.14e+08', '3.14e+20'));`names<-`(argv[[1]],argv[[2]]); 3.14e-10 0.0314 3.14 31.4 314 3.14e+08 3.141593e-10 3.141593e-02 3.141593e+00 3.141593e+01 3.141593e+02 3.141593e+08 3.14e+20 3.141593e+20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign8# #argv <- list(structure(c('variable1', 'variable2'), .Names = c('variable1', 'variable2')), value = c('variable1', 'variable2'));`names<-`(argv[[1]],argv[[2]]); variable1 variable2 "variable1" "variable2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_namesassign.testnamesassign9# #argv <- list(structure(c(NA, FALSE, TRUE), .Names = c(NA, 'FALSE', 'TRUE')), value = c(NA, 'FALSE', 'TRUE'));`names<-`(argv[[1]],argv[[2]]); FALSE TRUE NA FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nargs.testNargs# #{ f <- function (a, b, c) { nargs() }; f() } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nargs.testNargs# #{ f <- function (a, b, c) { nargs() }; f(,,a) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nargs.testNargs# #{ f <- function (a, b, c) { nargs() }; f(1, 2) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nargs.testNargs# #{ f <- function (a, b=TRUE, c=FALSE) { nargs() }; f(1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nargs.testNargs# #{ f <- function (a, b=TRUE, c=FALSE) { nargs() }; f(1, FALSE) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nargs.testNargs# #{ f<-function(x, ..., y=TRUE) { nargs() }; f(1, 2, 3) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nargs.testnargs1# #nargs( ); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNChar# #v <- c(a=1,b=1234,c='ff',d='gg'); dim(v) <- c(foo=2,bar=2); dimnames(v) <- list(a=c('foo', 'bar'), n=c('f','g')); nchar(v) n a f g foo 1 2 bar 4 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNChar# #{ .Internal(nchar('ff', 'chars', FALSE, FALSE)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNChar# #{ .Internal(nchar(c(10,130), 'chars', FALSE, FALSE)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNChar# #{ nchar(c("hello", "hi")) } [1] 5 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNChar# #{ nchar(c("hello", "hi", 10, 130)) } [1] 5 2 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNChar# #{ nchar(c(10,130)) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNCharKeepNA# #nchar(c('aasd', NA), keepNA=NA) [1] 4 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNCharKeepNA# #nchar(c('aasd', NA), type='width') [1] 4 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNCharKeepNA# #nchar(c('aasd', NA), type='width', keepNA=FALSE) [1] 4 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNCharKeepNA# #nchar(c('aasd', NA), type='width', keepNA=TRUE) [1] 4 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNCharKeepNA# #nchar(c('aasd', NA, 'asdasd'), keepNA=TRUE) [1] 4 NA 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNCharTypeMatching# #nchar('aasd', type='') Error in nchar("aasd", type = "") : invalid 'type' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNCharTypeMatching# #nchar('aasd', type='cha') [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNCharTypeMatching# #nchar('aasd', type='charsxzy') Error in nchar("aasd", type = "charsxzy") : invalid 'type' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNULLAndMissing# #nchar() Error in nchar() : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNULLAndMissing# #nchar(type = 'chars', allowNA = FALSE, keepNA = NA) Error in nchar(type = "chars", allowNA = FALSE, keepNA = NA) : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNULLAndMissing# #nchar(wrongArg="a") Error in nchar(wrongArg = "a") : unused argument (wrongArg = "a") ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNULLAndMissing# #nchar(wrongArg='a') Error in nchar(wrongArg = "a") : unused argument (wrongArg = "a") ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNULLAndMissing# #nchar(x=NULL) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testNULLAndMissing# #nchar(x=NULL, type = 'chars', allowNA = FALSE, keepNA = NA) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar1# #argv <- list('DtTmCl> format(.leap.seconds) # all 24 leap seconds in your timezone', 'c', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 76 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar10# #argv <- list(FALSE, 'chars', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar11# #argv <- list('> contour(x, y, volcano, levels = lev, col=\'yellow\', lty=\'solid\', add=TRUE)', 'c', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 75 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar12# #argv <- list(character(0), 'c', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar13# #argv <- list(structure(c('rpart', 'recommended', '4.1-1', '2013-03-20', 'c(person(\'Terry\', \'Therneau\', role = \'aut\',\n\t email = \'therneau@mayo.edu\'),\n person(\'Beth\', \'Atkinson\', role = \'aut\',\t\n\t email = \'atkinson@mayo.edu\'),\n person(\'Brian\', \'Ripley\', role = c(\'aut\', \'trl\', \'cre\'),\n email = \'ripley@stats.ox.ac.uk\',\n\t\t comment = \'author of R port\'))', 'Recursive partitioning and regression trees', 'Recursive Partitioning', 'R (>= 2.14.0), graphics, stats, grDevices', 'survival', 'GPL-2 | GPL-3', 'yes', 'yes', 'Maintainers are not available to give advice on using a package\nthey did not author.', '2013-03-20 07:27:05 UTC; ripley', 'Terry Therneau [aut],\n Beth Atkinson [aut],\n Brian Ripley [aut, trl, cre] (author of R port)', 'Brian Ripley '), .Names = c('Package', 'Priority', 'Version', 'Date', 'Authors@R', 'Description', 'Title', 'Depends', 'Suggests', 'License', 'LazyData', 'ByteCompile', 'Note', 'Packaged', 'Author', 'Maintainer')), 'c', TRUE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) Package Priority Version Date Authors@R Description 5 11 5 10 345 43 Title Depends Suggests License LazyData ByteCompile 22 41 8 13 3 3 Note Packaged Author Maintainer 84 31 94 36 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar2# #argv <- list(c('\'a\'', '\'b\'', NA, NA, NA, '\'f\'', '\'g\'', '\'h\'', '\'i\'', '\'j\'', '\'k\'', '\'l\''), 'w', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 3 3 2 2 2 3 3 3 3 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar3# #argv <- list('\'abcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyzabcdefghijklmnopqrstuvwxyz\'', 'w', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 2602 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar4# #argv <- list(structure(c('1', '2', '3', '4', '5', '1', '2', '3', '4', '5'), .Dim = 10L), 'c', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar5# #argv <- list(c('Var1', 'Var2'), 'bytes', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 4 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar6# #argv <- list(c('0.0470', '0.0130', '0.0020', '0.0001', '2.3e-05', '4.5e-06'), 'w', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 6 6 6 6 7 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar7# #argv <- list(c('x1', 'x.2', 'x3'), 'bytes', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 2 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nchar.testnchar9# #argv <- list(c('\'1\'', '\'2\'', NA), 'w', FALSE, FALSE); .Internal(nchar(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 3 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_ncol.testncol1# #argv <- structure(list(x = structure(list(pop15 = c(29.35, 23.32, 23.8, 41.89, 42.19, 31.72, 39.74, 44.75, 46.64, 47.64, 24.42, 46.31, 27.84, 25.06, 23.31, 25.62, 46.05, 47.32, 34.03, 41.31, 31.16, 24.52, 27.01, 41.74, 21.8, 32.54, 25.95, 24.71, 32.61, 45.04, 43.56, 41.18, 44.19, 46.26, 28.96, 31.94, 31.92, 27.74, 21.44, 23.49, 43.42, 46.12, 23.27, 29.81, 46.4, 45.25, 41.12, 28.13, 43.69, 47.2), pop75 = c(2.87, 4.41, 4.43, 1.67, 0.83, 2.85, 1.34, 0.67, 1.06, 1.14, 3.93, 1.19, 2.37, 4.7, 3.35, 3.1, 0.87, 0.58, 3.08, 0.96, 4.19, 3.48, 1.91, 0.91, 3.73, 2.47, 3.67, 3.25, 3.17, 1.21, 1.2, 1.05, 1.28, 1.12, 2.85, 2.28, 1.52, 2.87, 4.54, 3.73, 1.08, 1.21, 4.46, 3.43, 0.9, 0.56, 1.73, 2.72, 2.07, 0.66), dpi = c(2329.68, 1507.99, 2108.47, 189.13, 728.47, 2982.88, 662.86, 289.52, 276.65, 471.24, 2496.53, 287.77, 1681.25, 2213.82, 2457.12, 870.85, 289.71, 232.44, 1900.1, 88.94, 1139.95, 1390, 1257.28, 207.68, 2449.39, 601.05, 2231.03, 1740.7, 1487.52, 325.54, 568.56, 220.56, 400.06, 152.01, 579.51, 651.11, 250.96, 768.79, 3299.49, 2630.96, 389.66, 249.87, 1813.93, 4001.89, 813.39, 138.33, 380.47, 766.54, 123.58, 242.69), ddpi = c(2.87, 3.93, 3.82, 0.22, 4.56, 2.43, 2.67, 6.51, 3.08, 2.8, 3.99, 2.19, 4.32, 4.52, 3.44, 6.28, 1.48, 3.19, 1.12, 1.54, 2.99, 3.54, 8.21, 5.81, 1.57, 8.12, 3.62, 7.66, 1.76, 2.48, 3.61, 1.03, 0.67, 2, 7.48, 2.19, 2, 4.35, 3.01, 2.7, 2.96, 1.13, 2.01, 2.45, 0.53, 5.14, 10.23, 1.88, 16.71, 5.08)), .Names = c('pop15', 'pop75', 'dpi', 'ddpi'), class = 'data.frame', row.names = c('Australia', 'Austria', 'Belgium', 'Bolivia', 'Brazil', 'Canada', 'Chile', 'China', 'Colombia', 'Costa Rica', 'Denmark', 'Ecuador', 'Finland', 'France', 'Germany', 'Greece', 'Guatamala', 'Honduras', 'Iceland', 'India', 'Ireland', 'Italy', 'Japan', 'Korea', 'Luxembourg', 'Malta', 'Norway', 'Netherlands', 'New Zealand', 'Nicaragua', 'Panama', 'Paraguay', 'Peru', 'Philippines', 'Portugal', 'South Africa', 'South Rhodesia', 'Spain', 'Sweden', 'Switzerland', 'Turkey', 'Tunisia', 'United Kingdom', 'United States', 'Venezuela', 'Zambia', 'Jamaica', 'Uruguay', 'Libya', 'Malaysia'))), .Names = 'x');do.call('ncol', argv) [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_newenv.testnewenv#Output.ContainsReferences# #e <- new.env(); e; parent.env(new.env(TRUE, e)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_newenv.testnewenv#Output.ContainsReferences# #new.env() ##com.oracle.truffle.r.test.builtins.TestBuiltin_newenv.testnewenv#Output.ContainsReferences# #new.env(1,,2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_newenv.testnewenv#Output.ContainsReferences# #new.env(logical(),new.env(),1000) ##com.oracle.truffle.r.test.builtins.TestBuiltin_newenv.testnewenv#Output.ContainsReferences# #parent.env(new.env()) ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(-1, "a", "b") } Error in ngettext(-1, "a", "b") : invalid 'n' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(0, "a", "b") } [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1+1i, "a", "b") } [1] "a" Warning message: In ngettext(1 + (0+1i), "a", "b") : imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1, "a", "b") } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1, "a", NULL) } Error in ngettext(1, "a", NULL) : 'msg2' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1, "a", c("b")) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1, "a", c("b", "c")) } Error in ngettext(1, "a", c("b", "c")) : 'msg2' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1, "a", c(1)) } Error in ngettext(1, "a", c(1)) : 'msg2' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1, NULL, "b") } Error in ngettext(1, NULL, "b") : 'msg1' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1, NULL, NULL) } Error in ngettext(1, NULL, NULL) : 'msg1' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1, c("a"), "b") } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1, c("a", "c"), "b") } Error in ngettext(1, c("a", "c"), "b") : 'msg1' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(1, c(1), "b") } Error in ngettext(1, c(1), "b") : 'msg1' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(42, "a", "b") } [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(c(1), "a", "b") } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testNgettext# #{ ngettext(c(1,2), "a", "b") } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testngettext1# #argv <- list(1L, '%s is not TRUE', '%s are not all TRUE', NULL); .Internal(ngettext(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] "%s is not TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_ngettext.testngettext2# #argv <- list(2L, '%s is not TRUE', '%s are not all TRUE', NULL); .Internal(ngettext(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] "%s are not all TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_nlevels.testnlevels1# #argv <- structure(list(x = structure(c(1L, 2L, NA), .Label = c('1', '2'), class = 'factor')), .Names = 'x');do.call('nlevels', argv) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist', mustWork=F) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist" ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist', mustWork=NA) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist" Warning message: In normalizePath("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist", : path[1]="com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist', mustWork=T) Error in normalizePath("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist", : path[1]="com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist#Ignored.ImplementationError# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/..', mustWork=F) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/.." ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist#Ignored.ImplementationError# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/..', mustWork=NA) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/.." Warning message: In normalizePath("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/..", : path[1]="com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/..": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist#Ignored.ImplementationError# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/..', mustWork=T) Error in normalizePath("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/..", : path[1]="com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/..": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa', mustWork=F) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa" ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa', mustWork=NA) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa" Warning message: In normalizePath("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa", : path[1]="com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa', mustWork=T) Error in normalizePath("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa", : path[1]="com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist#Ignored.ImplementationError# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa/..', mustWork=F) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa/.." ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist#Ignored.ImplementationError# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa/..', mustWork=NA) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa/.." Warning message: In normalizePath("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa/..", : path[1]="com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa/..": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist#Ignored.ImplementationError# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa/..', mustWork=T) Error in normalizePath("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa/..", : path[1]="com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../aa/..": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist#Ignored.ImplementationError# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../dummy.txt', mustWork=F) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../dummy.txt" ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist#Ignored.ImplementationError# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../dummy.txt', mustWork=NA) [1] "com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../dummy.txt" Warning message: In normalizePath("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../dummy.txt", : path[1]="com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../dummy.txt": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testFileDoesNotExist#Ignored.ImplementationError# #normalizePath('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../dummy.txt', mustWork=T) Error in normalizePath("com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../dummy.txt", : path[1]="com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/simple/data/tree1/filedoesnotexist/../dummy.txt": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_normalizePath.testnormalizePath1#Output.IgnoreWarningContext# #argv <- list(c('/home/lzhao/hg/r-instrumented/library', '/home/lzhao/R/x86_64-unknown-linux-gnu-library/3.0', '/home/lzhao/hg/r-instrumented/library'), '/', NA); .Internal(normalizePath(argv[[1]], argv[[2]], argv[[3]])) [1] "/home/lzhao/hg/r-instrumented/library" [2] "/home/lzhao/R/x86_64-unknown-linux-gnu-library/3.0" [3] "/home/lzhao/hg/r-instrumented/library" Warning messages: 1: path[1]="/home/lzhao/hg/r-instrumented/library": No such file or directory 2: path[2]="/home/lzhao/R/x86_64-unknown-linux-gnu-library/3.0": No such file or directory 3: path[3]="/home/lzhao/hg/r-instrumented/library": No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_nrow.testnrow1# #argv <- structure(list(x = structure(c(0, 3313, 2963, 3175, 3339, 2762, 3276, 2610, 4485, 2977, 3030, 4532, 2753, 3949, 2865, 2282, 2179, 3000, 817, 3927, 1991, 3313, 0, 1318, 1326, 1294, 1498, 2218, 803, 1172, 2018, 1490, 1305, 645, 636, 521, 1014, 1365, 1033, 1460, 2868, 1802, 2963, 1318, 0, 204, 583, 206, 966, 677, 2256, 597, 172, 2084, 690, 1558, 1011, 925, 747, 285, 1511, 1616, 1175, 3175, 1326, 204, 0, 460, 409, 1136, 747, 2224, 714, 330, 2052, 739, 1550, 1059, 1077, 977, 280, 1662, 1786, 1381, 3339, 1294, 583, 460, 0, 785, 1545, 853, 2047, 1115, 731, 1827, 789, 1347, 1101, 1209, 1160, 340, 1794, 2196, 1588, 2762, 1498, 206, 409, 785, 0, 760, 1662, 2436, 460, 269, 2290, 714, 1764, 1035, 911, 583, 465, 1497, 1403, 937, 3276, 2218, 966, 1136, 1545, 760, 0, 1418, 3196, 460, 269, 2971, 1458, 2498, 1778, 1537, 1104, 1176, 2050, 650, 1455, 2610, 803, 677, 747, 853, 1662, 1418, 0, 1975, 1118, 895, 1936, 158, 1439, 425, 328, 591, 513, 995, 2068, 1019, 4485, 1172, 2256, 2224, 2047, 2436, 3196, 1975, 0, 2897, 2428, 676, 1817, 698, 1693, 2185, 2565, 1971, 2631, 3886, 2974, 2977, 2018, 597, 714, 1115, 460, 460, 1118, 2897, 0, 550, 2671, 1159, 2198, 1479, 1238, 805, 877, 1751, 949, 1155, 3030, 1490, 172, 330, 731, 269, 269, 895, 2428, 550, 0, 2280, 863, 1730, 1183, 1098, 851, 457, 1683, 1500, 1205, 4532, 1305, 2084, 2052, 1827, 2290, 2971, 1936, 676, 2671, 2280, 0, 1178, 668, 1762, 2250, 2507, 1799, 2700, 3231, 2937, 2753, 645, 690, 739, 789, 714, 1458, 158, 1817, 1159, 863, 1178, 0, 1281, 320, 328, 724, 471, 1048, 2108, 1157, 3949, 636, 1558, 1550, 1347, 1764, 2498, 1439, 698, 2198, 1730, 668, 1281, 0, 1157, 1724, 2010, 1273, 2097, 3188, 2409, 2865, 521, 1011, 1059, 1101, 1035, 1778, 425, 1693, 1479, 1183, 1762, 320, 1157, 0, 618, 1109, 792, 1011, 2428, 1363, 2282, 1014, 925, 1077, 1209, 911, 1537, 328, 2185, 1238, 1098, 2250, 328, 1724, 618, 0, 331, 856, 586, 2187, 898, 2179, 1365, 747, 977, 1160, 583, 1104, 591, 2565, 805, 851, 2507, 724, 2010, 1109, 331, 0, 821, 946, 1754, 428, 3000, 1033, 285, 280, 340, 465, 1176, 513, 1971, 877, 457, 1799, 471, 1273, 792, 856, 821, 0, 1476, 1827, 1249, 817, 1460, 1511, 1662, 1794, 1497, 2050, 995, 2631, 1751, 1683, 2700, 1048, 2097, 1011, 586, 946, 1476, 0, 2707, 1209, 3927, 2868, 1616, 1786, 2196, 1403, 650, 2068, 3886, 949, 1500, 3231, 2108, 3188, 2428, 2187, 1754, 1827, 2707, 0, 2105, 1991, 1802, 1175, 1381, 1588, 937, 1455, 1019, 2974, 1155, 1205, 2937, 1157, 2409, 1363, 898, 428, 1249, 1209, 2105, 0), .Dim = c(21L, 21L), .Dimnames = list(c('Athens', 'Barcelona', 'Brussels', 'Calais', 'Cherbourg', 'Cologne', 'Copenhagen', 'Geneva', 'Gibraltar', 'Hamburg', 'Hook of Holland', 'Lisbon', 'Lyons', 'Madrid', 'Marseilles', 'Milan', 'Munich', 'Paris', 'Rome', 'Stockholm', 'Vienna'), c('Athens', 'Barcelona', 'Brussels', 'Calais', 'Cherbourg', 'Cologne', 'Copenhagen', 'Geneva', 'Gibraltar', 'Hamburg', 'Hook of Holland', 'Lisbon', 'Lyons', 'Madrid', 'Marseilles', 'Milan', 'Munich', 'Paris', 'Rome', 'Stockholm', 'Vienna')))), .Names = 'x');do.call('NROW', argv) [1] 21 ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.keepNATests# #nzchar(c('aasd', NA), keepNA=NA) [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.keepNATests# #nzchar(c('asdasd', NA), keepNA=FALSE) [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.keepNATests# #nzchar(c('asdasd', NA), keepNA=TRUE) [1] TRUE NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.nonStringArgs# #nchar(wrongArgName="a") Error in nchar(wrongArgName = "a") : unused argument (wrongArgName = "a") ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.nonStringArgs# #nchar(wrongArgName='a') Error in nchar(wrongArgName = "a") : unused argument (wrongArgName = "a") ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.nonStringArgs# #nzchar(NA) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.nonStringArgs# #nzchar(NULL) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.nonStringArgs# #nzchar(keepNA=F) Error in nzchar(keepNA = F) : supplied argument name 'keepNA' does not match 'x' ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.nonStringArgs# #nzchar(keepNA=NA) Error in nzchar(keepNA = NA) : supplied argument name 'keepNA' does not match 'x' ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.nonStringArgs# #nzchar(list('x', 42, list('a'), list())) [1] TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar1# #argv <- list('./myTst2/man/DocLink-class.Rd');nzchar(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar10# #argv <- list(logical(0));nzchar(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar12# #argv <- list('');do.call('nzchar', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar2# #argv <- list(FALSE);nzchar(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar3# #argv <- list(c('a', 'b', 'c'));nzchar(argv[[1]]); [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar4# #argv <- list(structure('MASS', .Names = ''));nzchar(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar5# #argv <- list(NULL);nzchar(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar6# #argv <- list(c('Fr', 'Temp', 'Soft', 'M.user', 'Brand'));nzchar(argv[[1]]); [1] TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar7# #argv <- list(structure('survival', .Names = ''));nzchar(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar8# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));nzchar(argv[[1]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_nzchar.testnzchar9# #argv <- list(c(' \036 The other major change was an error for asymmetric loss matrices,', ' prompted by a user query. With L=loss asymmetric, the altered', ' priors were computed incorrectly - they were using L\' instead of L.', ' Upshot - the tree would not not necessarily choose optimal splits', ' for the given loss matrix. Once chosen, splits were evaluated', ' correctly. The printed “improvement” values are of course the', ' wrong ones as well. It is interesting that for my little test', ' case, with L quite asymmetric, the early splits in the tree are', ' unchanged - a good split still looks good.'));nzchar(argv[[1]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_objectsize.testAbs# #if (!any(R.version$engine == "FastR")) { print(TRUE) } else { { object.size(1:100) < object.size(c(1,2,3,10)) } } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_objectsize.testAbs# #{ object.size(c(1,2,3,8,11,20,15,9)) > object.size(c(1,2,5)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_objectsize.testAbs# #{ object.size(list(c(1,2,3,6,11,20,1,5,9))) > object.size(list(c(1,10))) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testGetClass# #{ f <- quote(foo(42)); class(f)<-'myclass'; oldClass(f); } [1] "myclass" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testGetClass# #{ oldClass(NULL) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testGetClass# #{ x<-1; oldClass(x) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass1# #argv <- list(structure(list(`cbind(w = weight, w2 = weight^2)` = structure(c(4.17, 5.58, 5.18, 6.11, 4.5, 4.61, 5.17, 4.53, 5.33, 5.14, 4.81, 4.17, 4.41, 3.59, 5.87, 3.83, 6.03, 4.89, 4.32, 4.69, 17.3889, 31.1364, 26.8324, 37.3321, 20.25, 21.2521, 26.7289, 20.5209, 28.4089, 26.4196, 23.1361, 17.3889, 19.4481, 12.8881, 34.4569, 14.6689, 36.3609, 23.9121, 18.6624, 21.9961), .Dim = c(20L, 2L), .Dimnames = list(NULL, c('w', 'w2'))), group = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Ctl', 'Trt'), class = 'factor')), .Names = c('cbind(w = weight, w2 = weight^2)', 'group'), terms = quote(cbind(w = weight, w2 = weight^2) ~ group), row.names = c(NA, 20L), class = 'data.frame'));oldClass(argv[[1]]); [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass10# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')));oldClass(argv[[1]]); c0 "integer(0)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass11# #argv <- list(structure(list(srcfile = c('/home/lzhao/tmp/RtmpS45wYI/R.INSTALL2aa62411bcd3/rpart/R/rsq.rpart.R', '/home/lzhao/tmp/RtmpS45wYI/R.INSTALL2aa62411bcd3/rpart/R/rsq.rpart.R'), frow = c(7L, 9L), lrow = c(7L, 9L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2, class = 'data.frame'));oldClass(argv[[1]]); [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass12# #argv <- list(structure(1:5, .Tsp = c(1, 5, 1), class = 'ts'));oldClass(argv[[1]]); [1] "ts" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass13# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));oldClass(argv[[1]]); [1] "3.14159265358979" attr(,"class") [1] "testit" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass14# #argv <- list(structure(list(`cbind(A, B, C, D)` = structure(c(0.696706709347165, 0.362357754476673, -0.0291995223012888, 0.696706709347165, 0.696706709347165, -0.0291995223012888, 0.696706709347165, -0.0291995223012888, 0.362357754476673, 0.696706709347165, -0.0291995223012888, 0.362357754476673, -0.416146836547142, 0.362357754476673, 0.696706709347165, 0.696706709347165, 0.362357754476673, -0.416146836547142, -0.0291995223012888, -0.416146836547142, 0.696706709347165, -0.416146836547142, 0.362357754476673, -0.0291995223012888, 0.717356090899523, 0.932039085967226, 0.999573603041505, 0.717356090899523, 0.717356090899523, 0.999573603041505, 0.717356090899523, 0.999573603041505, 0.932039085967226, 0.717356090899523, 0.999573603041505, 0.932039085967226, 0.909297426825682, 0.932039085967226, 0.717356090899523, 0.717356090899523, 0.932039085967226, 0.909297426825682, 0.999573603041505, 0.909297426825682, 0.717356090899523, 0.909297426825682, 0.932039085967226, 0.999573603041505, -0.0291995223012888, -0.737393715541246, -0.998294775794753, -0.0291995223012888, -0.0291995223012888, -0.998294775794753, -0.0291995223012888, -0.998294775794753, -0.737393715541246, -0.0291995223012888, -0.998294775794753, -0.737393715541246, -0.653643620863612, -0.737393715541246, -0.0291995223012888, -0.0291995223012888, -0.737393715541246, -0.653643620863612, -0.998294775794753, -0.653643620863612, -0.0291995223012888, -0.653643620863612, -0.737393715541246, -0.998294775794753, 0.999573603041505, 0.67546318055115, -0.0583741434275801, 0.999573603041505, 0.999573603041505, -0.0583741434275801, 0.999573603041505, -0.0583741434275801, 0.67546318055115, 0.999573603041505, -0.0583741434275801, 0.67546318055115, -0.756802495307928, 0.67546318055115, 0.999573603041505, 0.999573603041505, 0.67546318055115, -0.756802495307928, -0.0583741434275801, -0.756802495307928, 0.999573603041505, -0.756802495307928, 0.67546318055115, -0.0583741434275801), .Dim = c(24L, 4L), .Dimnames = list(NULL, c('A', 'B', 'C', 'D'))), groups = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('1', '2', '3'), class = 'factor')), .Names = c('cbind(A, B, C, D)', 'groups'), terms = quote(cbind(A, B, C, D) ~ groups), row.names = c(NA, 24L), class = 'data.frame'));oldClass(argv[[1]]); [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass15# #argv <- list(structure(list(), .Names = character(0), class = 'data.frame', row.names = c(NA, -10L)));oldClass(argv[[1]]); [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass16# #argv <- list(structure(list(y = c(1.08728092481538, 0.0420572471552261, 0.787502161306819, 0.512717751544676, 3.35376639535311, 0.204341510750309, -0.334930602487435, 0.80049208412789, -0.416177803375218, -0.777970346246018, 0.934996808181635, -0.678786709127108, 1.52621589791412, 0.5895781228122, -0.744496121210548, -1.99065153885627, 1.51286447692396, -0.750182409847851), A = c(0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1), U = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('a', 'b', 'c'), class = 'factor'), V = structure(c(1L, 1L, 2L, 2L, 3L, 3L, 1L, 1L, 2L, 2L, 3L, 3L, 1L, 1L, 2L, 2L, 3L, 3L), .Label = c('a', 'b', 'c'), class = 'factor')), .Names = c('y', 'A', 'U', 'V'), class = 'data.frame', row.names = c(NA, 18L), terms = quote(y ~ A:U + A:V - 1)));oldClass(argv[[1]]); [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass17# #argv <- list(structure(list(surname = structure(integer(0), .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(integer(0), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(integer(0), .Label = c('no', 'yes'), class = 'factor'), title = structure(integer(0), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(integer(0), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased', 'title', 'other.author'), row.names = integer(0), class = 'data.frame'));oldClass(argv[[1]]); [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass18# #argv <- list(structure(list(srcfile = c(NA, NA, '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R', '/home/lzhao/tmp/RtmptukZK0/R.INSTALL2ccc3a5cba55/nlme/R/pdMat.R'), frow = c(NA, NA, 1739L, 1741L, 1807L, 1868L, 1868L, 1868L, 1870L, 1873L, 1888L, 1888L, 1888L, 1898L, 1898L, 1898L, 1899L, 1905L), lrow = c(NA, NA, 1739L, 1742L, 1807L, 1868L, 1868L, 1868L, 1872L, 1873L, 1888L, 1888L, 1888L, 1898L, 1898L, 1898L, 1901L, 1905L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 18L), class = 'data.frame'));oldClass(argv[[1]]); [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass19# #argv <- list(structure(list(double.eps = 2.22044604925031e-16, double.neg.eps = 1.11022302462516e-16, double.xmin = 2.2250738585072e-308, double.xmax = 1.79769313486232e+308, double.base = 2L, double.digits = 53L, double.rounding = 5L, double.guard = 0L, double.ulp.digits = -52L, double.neg.ulp.digits = -53L, double.exponent = 11L, double.min.exp = -1022L, double.max.exp = 1024L, integer.max = 2147483647L, sizeof.long = 8L, sizeof.longlong = 8L, sizeof.longdouble = 16L, sizeof.pointer = 8L), .Names = c('double.eps', 'double.neg.eps', 'double.xmin', 'double.xmax', 'double.base', 'double.digits', 'double.rounding', 'double.guard', 'double.ulp.digits', 'double.neg.ulp.digits', 'double.exponent', 'double.min.exp', 'double.max.exp', 'integer.max', 'sizeof.long', 'sizeof.longlong', 'sizeof.longdouble', 'sizeof.pointer')));oldClass(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass2# #argv <- list(structure(list(y = structure(c(8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536, 9.79424), .Tsp = c(1962.25, 1971.75, 4), class = 'ts'), lag.quarterly.revenue = c(8.79636, 8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536), price.index = c(4.70997, 4.70217, 4.68944, 4.68558, 4.64019, 4.62553, 4.61991, 4.61654, 4.61407, 4.60766, 4.60227, 4.5896, 4.57592, 4.58661, 4.57997, 4.57176, 4.56104, 4.54906, 4.53957, 4.51018, 4.50352, 4.4936, 4.46505, 4.44924, 4.43966, 4.42025, 4.4106, 4.41151, 4.3981, 4.38513, 4.3732, 4.3277, 4.32023, 4.30909, 4.30909, 4.30552, 4.29627, 4.27839, 4.27789), income.level = c(5.8211, 5.82558, 5.83112, 5.84046, 5.85036, 5.86464, 5.87769, 5.89763, 5.92574, 5.94232, 5.95365, 5.9612, 5.97805, 6.00377, 6.02829, 6.03475, 6.03906, 6.05046, 6.05563, 6.06093, 6.07103, 6.08018, 6.08858, 6.10199, 6.11207, 6.11596, 6.12129, 6.122, 6.13119, 6.14705, 6.15336, 6.15627, 6.16274, 6.17369, 6.16135, 6.18231, 6.18768, 6.19377, 6.2003), market.potential = c(12.9699, 12.9733, 12.9774, 12.9806, 12.9831, 12.9854, 12.99, 12.9943, 12.9992, 13.0033, 13.0099, 13.0159, 13.0212, 13.0265, 13.0351, 13.0429, 13.0497, 13.0551, 13.0634, 13.0693, 13.0737, 13.077, 13.0849, 13.0918, 13.095, 13.0984, 13.1089, 13.1169, 13.1222, 13.1266, 13.1356, 13.1415, 13.1444, 13.1459, 13.152, 13.1593, 13.1579, 13.1625, 13.1664)), .Names = c('y', 'lag.quarterly.revenue', 'price.index', 'income.level', 'market.potential'), row.names = c('1962.25', '1962.5', '1962.75', '1963', '1963.25', '1963.5', '1963.75', '1964', '1964.25', '1964.5', '1964.75', '1965', '1965.25', '1965.5', '1965.75', '1966', '1966.25', '1966.5', '1966.75', '1967', '1967.25', '1967.5', '1967.75', '1968', '1968.25', '1968.5', '1968.75', '1969', '1969.25', '1969.5', '1969.75', '1970', '1970.25', '1970.5', '1970.75', '1971', '1971.25', '1971.5', '1971.75'), class = 'data.frame'));oldClass(argv[[1]]); [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass20# #argv <- list(structure(list(Model = 1:2, df = c(5, 6), AIC = c('1571.455', '1570.925'), BIC = c('1590.056', '1593.247'), logLik = c(-780.727255295109, -779.462624623506), Test = structure(1:2, .Label = c('', '1 vs 2'), class = 'factor'), L.Ratio = c(NA, 2.52926134320705), `p-value` = c(NA, 0.111752518719366)), .Names = c('Model', 'df', 'AIC', 'BIC', 'logLik', 'Test', 'L.Ratio', 'p-value'), row.names = c('fm1', 'fm2'), class = 'data.frame'));oldClass(argv[[1]]); [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass22# #argv <- list(c('1.537e+04', '1.54e+04', '1.546e+04'));do.call('oldClass', argv) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass3# #argv <- list(c(7.50863122075491e-09, 1.87762632589663e-07, 2.29589583061716e-06, 1.83002461474278e-05, 0.000106962770210119, 0.000488992941332962, 0.00182154707835978, 0.0056884235091347, 0.0152093632759767, 0.0353957474549943, 0.0726726073416657, 0.13316547411151));oldClass(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass4# #argv <- list(c(0.2853725+0.3927816i, -0.07283992154231+0.224178134292i, -0.10883955678256+0.035364093700981i, -0.0449501817243521-0.0326582354266614i, 8.2299281e-09-2.69753665872767e-02i, 0.0105954299973322-0.0076980245688633i, 0.00604728675391113+0.00196488543076221i, 0.00095395849586903+0.00293598723445021i, -0.00088096824266454+0.00121254736140417i, -7.27670402517897e-04-4.44010655e-10i, -2.07656947543323e-04-2.85815671682054e-04i, 5.3003554565545e-05-1.6312776087427e-04i, 7.9199339795869e-05-2.57333559721504e-05i, 3.27089023280074e-05+2.37644512768026e-05i, -1.79660253e-11+1.96291758626278e-05i, -7.70998422901389e-06+5.60161993213361e-06i, -4.4004307139296e-06-1.42979165736404e-06i, -6.9416605906477e-07-2.13643143624753e-06i, 6.41055054129141e-07-8.82334435385704e-07i, 5.29504214700362e-07+6.46186824e-13i));oldClass(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass5# #argv <- list(structure(list(Subject = structure(c(1L, 3L, 6L, 2L, 4L, 5L), .Label = c('1', '4', '2', '5', '6', '3'), class = c('ordered', 'factor')), conc.0.25 = c(1.5, 2.03, 2.72, 1.85, 2.05, 2.31), conc.0.5 = c(0.94, 1.63, 1.49, 1.39, 1.04, 1.44), conc.0.75 = c(0.78, 0.71, 1.16, 1.02, 0.81, 1.03), conc.1 = c(0.48, 0.7, 0.8, 0.89, 0.39, 0.84), conc.1.25 = c(0.37, 0.64, 0.8, 0.59, 0.3, 0.64), conc.2 = c(0.19, 0.36, 0.39, 0.4, 0.23, 0.42)), row.names = c(1L, 12L, 23L, 34L, 45L, 56L), .Names = c('Subject', 'conc.0.25', 'conc.0.5', 'conc.0.75', 'conc.1', 'conc.1.25', 'conc.2'), class = c('nfnGroupedData', 'nfGroupedData', 'groupedData', 'data.frame')));oldClass(argv[[1]]); [1] "nfnGroupedData" "nfGroupedData" "groupedData" "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass6# #argv <- list(structure(c(-0.560475646552213+0i, 0.7424437487+0.205661411508856i, 1.39139505579429-0.26763356813179i, 0.928710764113827-0.221714979045717i, -0.46926798541295+1.18846175213664i, 0.7424437487-0.205661411508856i, 0.460916205989202+0i, -0.452623703774585+0.170604003753717i, -0.094501186832143+0.54302538277632i, -0.331818442379127+0.612232958468282i, 1.39139505579429+0.26763356813179i, -0.452623703774585-0.170604003753717i, 0.400771450594052+0i, -0.927967220342259+0.479716843914174i, -0.790922791530657+0.043092176305418i, 0.928710764113827+0.221714979045717i, -0.094501186832143-0.54302538277632i, -0.927967220342259-0.479716843914174i, 0.701355901563686+0i, -0.600841318509537+0.213998439984336i, -0.46926798541295-1.18846175213664i, -0.331818442379127-0.612232958468282i, -0.790922791530657-0.043092176305418i, -0.600841318509537-0.213998439984336i, -0.625039267849257+0i), .Dim = c(5L, 5L)));oldClass(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass7# #argv <- list(3.18309886183791e-301);oldClass(argv[[1]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass8# #argv <- list(structure(list(visible = c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), from = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), .Label = 'registered S3method for predict', class = 'factor')), .Names = c('visible', 'from'), row.names = c('predict.Arima', 'predict.HoltWinters', 'predict.StructTS', 'predict.ar', 'predict.arima0', 'predict.bSpline', 'predict.bs', 'predict.glm', 'predict.glmmPQL', 'predict.lda', 'predict.lm', 'predict.loess', 'predict.lqs', 'predict.mca', 'predict.mlm', 'predict.nbSpline', 'predict.nls', 'predict.npolySpline', 'predict.ns', 'predict.pbSpline', 'predict.polr', 'predict.poly', 'predict.polySpline', 'predict.ppolySpline', 'predict.ppr', 'predict.prcomp', 'predict.princomp', 'predict.qda', 'predict.rlm', 'predict.smooth.spline', 'predict.smooth.spline.fit'), class = 'data.frame'));oldClass(argv[[1]]); [1] "data.frame" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClass.testoldClass9# #argv <- list(structure(c(4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L), .Label = c('C', 'E', 'D', 'A', 'F', 'B'), class = 'factor', scores = structure(c(14, 16.5, 1.5, 5, 3, 15), .Dim = 6L, .Dimnames = list(c('A', 'B', 'C', 'D', 'E', 'F')))));oldClass(argv[[1]]); [1] "factor" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssign# #{ x <- 1; oldClass(x) <- c('a', 'b'); oldClass(x) } [1] "a" "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssign# #{ x <- as.pairlist(42); oldClass(x)<-'mycls'; oldClass(x) } [1] "mycls" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssign# #{ x <- function() 42; oldClass(x)<-'mycls'; oldClass(x) } [1] "mycls" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssign# #{ x <- new.env(); oldClass(x)<-'mycls'; oldClass(x) } [1] "mycls" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssign# #{ x<-1; oldClass(x)<-"foo"; class(x) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssign# #{ x<-1; oldClass(x)<-"foo"; oldClass(x) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssign# #{ x<-1; oldClass(x)<-"integer"; class(x) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssign# #{ x<-1; oldClass(x)<-"integer"; class(x)<-"integer"; class(x) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssign# #{ x<-1; oldClass(x)<-"integer"; class(x)<-"integer"; oldClass(x) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssign# #{ x<-1; oldClass(x)<-"integer"; oldClass(x) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testOldClassAssignValidation# #{ x <- 1; oldClass(x) <- 42; oldClass(x) } Error in oldClass(x) <- 42 : attempt to set invalid 'class' attribute ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testoldClassassign1# #argv <- list(list(), NULL);`oldClass<-`(argv[[1]],argv[[2]]); list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign.testoldClassassign2# #argv <- list(NULL, NULL);`oldClass<-`(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_oldClassassign_.testoldClassassign_1# #argv <- structure(list(structure(1:10, class = 'foo'), value = character(0)), .Names = c('', 'value'));do.call('oldClass<-', argv) [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_on_exit.testOnExit# #f <- function() { on.exit() }; f() ##com.oracle.truffle.r.test.builtins.TestBuiltin_on_exit.testOnExit# #f <- function() { on.exit(print('test')); on.exit(); print('some') }; f() [1] "some" ##com.oracle.truffle.r.test.builtins.TestBuiltin_on_exit.testOnExit# #f <- function() { on.exit(print('test')); on.exit(print('test2')); print('some') }; f() [1] "some" [1] "test2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_on_exit.testOnExit# #f <- function() { on.exit(print('test')); on.exit(print('test2')); print('some'); on.exit() }; f() [1] "some" ##com.oracle.truffle.r.test.builtins.TestBuiltin_on_exit.testOnExit# #f <- function() { on.exit(print('test')); on.exit(print('test2', TRUE)); print('some') }; f() [1] "some" [1] "test2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_on_exit.testOnExit# #f <- function() { on.exit(print('test')); print('some') }; f() [1] "some" [1] "test" ##com.oracle.truffle.r.test.builtins.TestBuiltin_on_exit.testOnExit# #f <- function() { on.exit(print('test', TRUE)); on.exit(print('test2')); print('some') }; f() [1] "some" [1] "test2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_on_exit.testOnExit# #f <- function() { on.exit(print('test', TRUE)); print('some') }; f() [1] "some" [1] "test" ##com.oracle.truffle.r.test.builtins.TestBuiltin_on_exit.testOnExit# #f <- function() { on.exit(return(5)); return(1) }; f() [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testBooleanOperators# #as.symbol('*') == '*' [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testBooleanOperators# #as.symbol('<-') == '<-' [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColon# #1:'1' [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColon# #1:'1.1' [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColon# #2147483647L:'2147483648' [1] 2147483647 2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColon# #8.2:NULL Error in 8.2:NULL : argument of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColon# #8.2:c(9,8) [1] 8.2 Warning message: In 8.2:c(9, 8) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColon# #NULL:5 Error in NULL:5 : argument of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColon# #new.env():new.env() Error in new.env():new.env() : argument of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColon# #numeric(0):numeric(0) Error in numeric(0):numeric(0) : argument of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #-2147483647L:-2147483647L [1] -2147483647 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #-2147483647L:-2147483648 [1] -2147483647 -2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #-2147483647L:-2147483649 [1] -2147483647 -2147483648 -2147483649 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #-2147483648:-2147483647L [1] -2147483648 -2147483647 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #-2147483648:-2147483648 [1] -2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #-2147483648:-2147483649 [1] -2147483648 -2147483649 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #-2147483649:-2147483647L [1] -2147483649 -2147483648 -2147483647 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #-2147483649:-2147483648 [1] -2147483649 -2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #-2147483649:-2147483649 [1] -2147483649 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #2147483647L:2147483647L [1] 2147483647 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #2147483647L:2147483648 [1] 2147483647 2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #2147483648:2147483647L [1] 2147483648 2147483647 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #2147483648:2147483648 [1] 2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(-2147483647L, -2147483647L):c(-2147483647L, -2147483647L) [1] -2147483647 Warning messages: 1: In c(-2147483647L, -2147483647L):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used 2: In c(-2147483647L, -2147483647L):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(-2147483647L, -2147483647L):c(-2147483648, -2147483648) [1] -2147483647 -2147483648 Warning messages: 1: In c(-2147483647L, -2147483647L):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used 2: In c(-2147483647L, -2147483647L):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(-2147483647L, -2147483647L):c(-2147483649, -2147483649) [1] -2147483647 -2147483648 -2147483649 Warning messages: 1: In c(-2147483647L, -2147483647L):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used 2: In c(-2147483647L, -2147483647L):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(-2147483648, -2147483648):c(-2147483647L, -2147483647L) [1] -2147483648 -2147483647 Warning messages: 1: In c(-2147483648, -2147483648):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used 2: In c(-2147483648, -2147483648):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(-2147483648, -2147483648):c(-2147483648, -2147483648) [1] -2147483648 Warning messages: 1: In c(-2147483648, -2147483648):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used 2: In c(-2147483648, -2147483648):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(-2147483648, -2147483648):c(-2147483649, -2147483649) [1] -2147483648 -2147483649 Warning messages: 1: In c(-2147483648, -2147483648):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used 2: In c(-2147483648, -2147483648):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(-2147483649, -2147483649):c(-2147483647L, -2147483647L) [1] -2147483649 -2147483648 -2147483647 Warning messages: 1: In c(-2147483649, -2147483649):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used 2: In c(-2147483649, -2147483649):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(-2147483649, -2147483649):c(-2147483648, -2147483648) [1] -2147483649 -2147483648 Warning messages: 1: In c(-2147483649, -2147483649):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used 2: In c(-2147483649, -2147483649):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(-2147483649, -2147483649):c(-2147483649, -2147483649) [1] -2147483649 Warning messages: 1: In c(-2147483649, -2147483649):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used 2: In c(-2147483649, -2147483649):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(2147483647L, 2147483647L):c(2147483647L, 2147483647L) [1] 2147483647 Warning messages: 1: In c(2147483647L, 2147483647L):c(2147483647L, 2147483647L) : numerical expression has 2 elements: only the first used 2: In c(2147483647L, 2147483647L):c(2147483647L, 2147483647L) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(2147483647L, 2147483647L):c(2147483648, 2147483648) [1] 2147483647 2147483648 Warning messages: 1: In c(2147483647L, 2147483647L):c(2147483648, 2147483648) : numerical expression has 2 elements: only the first used 2: In c(2147483647L, 2147483647L):c(2147483648, 2147483648) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(2147483648, 2147483648):c(2147483647L, 2147483647L) [1] 2147483648 2147483647 Warning messages: 1: In c(2147483648, 2147483648):c(2147483647L, 2147483647L) : numerical expression has 2 elements: only the first used 2: In c(2147483648, 2147483648):c(2147483647L, 2147483647L) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #c(2147483648, 2147483648):c(2147483648, 2147483648) [1] 2147483648 Warning messages: 1: In c(2147483648, 2147483648):c(2147483648, 2147483648) : numerical expression has 2 elements: only the first used 2: In c(2147483648, 2147483648):c(2147483648, 2147483648) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(-2147483647L:-2147483647L) [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(-2147483647L:-2147483648) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(-2147483647L:-2147483649) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(-2147483648:-2147483647L) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(-2147483648:-2147483648) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(-2147483648:-2147483649) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(-2147483649:-2147483647L) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(-2147483649:-2147483648) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(-2147483649:-2147483649) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(2147483647L:2147483647L) [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(2147483647L:2147483648) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(2147483648:2147483647L) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(2147483648:2147483648) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(-2147483647L, -2147483647L):c(-2147483647L, -2147483647L)) [1] "integer" Warning messages: 1: In c(-2147483647L, -2147483647L):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used 2: In c(-2147483647L, -2147483647L):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(-2147483647L, -2147483647L):c(-2147483648, -2147483648)) [1] "double" Warning messages: 1: In c(-2147483647L, -2147483647L):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used 2: In c(-2147483647L, -2147483647L):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(-2147483647L, -2147483647L):c(-2147483649, -2147483649)) [1] "double" Warning messages: 1: In c(-2147483647L, -2147483647L):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used 2: In c(-2147483647L, -2147483647L):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(-2147483648, -2147483648):c(-2147483647L, -2147483647L)) [1] "double" Warning messages: 1: In c(-2147483648, -2147483648):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used 2: In c(-2147483648, -2147483648):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(-2147483648, -2147483648):c(-2147483648, -2147483648)) [1] "double" Warning messages: 1: In c(-2147483648, -2147483648):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used 2: In c(-2147483648, -2147483648):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(-2147483648, -2147483648):c(-2147483649, -2147483649)) [1] "double" Warning messages: 1: In c(-2147483648, -2147483648):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used 2: In c(-2147483648, -2147483648):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(-2147483649, -2147483649):c(-2147483647L, -2147483647L)) [1] "double" Warning messages: 1: In c(-2147483649, -2147483649):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used 2: In c(-2147483649, -2147483649):c(-2147483647L, -2147483647L) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(-2147483649, -2147483649):c(-2147483648, -2147483648)) [1] "double" Warning messages: 1: In c(-2147483649, -2147483649):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used 2: In c(-2147483649, -2147483649):c(-2147483648, -2147483648) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(-2147483649, -2147483649):c(-2147483649, -2147483649)) [1] "double" Warning messages: 1: In c(-2147483649, -2147483649):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used 2: In c(-2147483649, -2147483649):c(-2147483649, -2147483649) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(2147483647L, 2147483647L):c(2147483647L, 2147483647L)) [1] "integer" Warning messages: 1: In c(2147483647L, 2147483647L):c(2147483647L, 2147483647L) : numerical expression has 2 elements: only the first used 2: In c(2147483647L, 2147483647L):c(2147483647L, 2147483647L) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(2147483647L, 2147483647L):c(2147483648, 2147483648)) [1] "double" Warning messages: 1: In c(2147483647L, 2147483647L):c(2147483648, 2147483648) : numerical expression has 2 elements: only the first used 2: In c(2147483647L, 2147483647L):c(2147483648, 2147483648) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(2147483648, 2147483648):c(2147483647L, 2147483647L)) [1] "double" Warning messages: 1: In c(2147483648, 2147483648):c(2147483647L, 2147483647L) : numerical expression has 2 elements: only the first used 2: In c(2147483648, 2147483648):c(2147483647L, 2147483647L) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testColonIntAndDouble# #typeof(c(2147483648, 2147483648):c(2147483648, 2147483648)) [1] "double" Warning messages: 1: In c(2147483648, 2147483648):c(2147483648, 2147483648) : numerical expression has 2 elements: only the first used 2: In c(2147483648, 2147483648):c(2147483648, 2147483648) : numerical expression has 2 elements: only the first used ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- array(FALSE,dim=c(2,3)); as.logical(lhs) == rhs } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- array(FALSE,dim=c(2,3)); lhs == as.logical(rhs) } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- array(FALSE,dim=c(2,3)); lhs == rhs } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- array(FALSE,dim=c(2,3)); temp <- as.logical(lhs); temp == rhs } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- array(FALSE,dim=c(2,3)); temp <- as.logical(rhs); lhs == temp } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); as.logical(lhs) == rhs } rx1 rx2 rx3 ry1 TRUE TRUE TRUE ry2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); lhs == as.logical(rhs) } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); lhs == rhs } rx1 rx2 rx3 ry1 TRUE TRUE TRUE ry2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); temp <- as.logical(lhs); temp == rhs } rx1 rx2 rx3 ry1 TRUE TRUE TRUE ry2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); temp <- as.logical(rhs); lhs == temp } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- c(FALSE, FALSE); as.logical(lhs) == rhs } [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- c(FALSE, FALSE); lhs == as.logical(rhs) } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- c(FALSE, FALSE); lhs == rhs } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- c(FALSE, FALSE); temp <- as.logical(lhs); temp == rhs } [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3)); rhs <- c(FALSE, FALSE); temp <- as.logical(rhs); lhs == temp } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- array(FALSE,dim=c(2,3)); as.logical(lhs) == rhs } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- array(FALSE,dim=c(2,3)); lhs == as.logical(rhs) } lx1 lx2 lx3 ly1 TRUE TRUE TRUE ly2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- array(FALSE,dim=c(2,3)); lhs == rhs } lx1 lx2 lx3 ly1 TRUE TRUE TRUE ly2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- array(FALSE,dim=c(2,3)); temp <- as.logical(lhs); temp == rhs } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- array(FALSE,dim=c(2,3)); temp <- as.logical(rhs); lhs == temp } lx1 lx2 lx3 ly1 TRUE TRUE TRUE ly2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); as.logical(lhs) == rhs } rx1 rx2 rx3 ry1 TRUE TRUE TRUE ry2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); lhs == as.logical(rhs) } lx1 lx2 lx3 ly1 TRUE TRUE TRUE ly2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); lhs == rhs } lx1 lx2 lx3 ly1 TRUE TRUE TRUE ly2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); temp <- as.logical(lhs); temp == rhs } rx1 rx2 rx3 ry1 TRUE TRUE TRUE ry2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); temp <- as.logical(rhs); lhs == temp } lx1 lx2 lx3 ly1 TRUE TRUE TRUE ly2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- c(FALSE, FALSE); as.logical(lhs) == rhs } [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- c(FALSE, FALSE); lhs == as.logical(rhs) } lx1 lx2 lx3 ly1 TRUE TRUE TRUE ly2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- c(FALSE, FALSE); lhs == rhs } lx1 lx2 lx3 ly1 TRUE TRUE TRUE ly2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- c(FALSE, FALSE); temp <- as.logical(lhs); temp == rhs } [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ly1','ly2'),c('lx1','lx2','lx3'))); rhs <- c(FALSE, FALSE); temp <- as.logical(rhs); lhs == temp } lx1 lx2 lx3 ly1 TRUE TRUE TRUE ly2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- array(FALSE,dim=c(2,3)); as.logical(lhs) == rhs } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- array(FALSE,dim=c(2,3)); lhs == as.logical(rhs) } [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- array(FALSE,dim=c(2,3)); lhs == rhs } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- array(FALSE,dim=c(2,3)); temp <- as.logical(lhs); temp == rhs } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- array(FALSE,dim=c(2,3)); temp <- as.logical(rhs); lhs == temp } [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); as.logical(lhs) == rhs } rx1 rx2 rx3 ry1 TRUE TRUE TRUE ry2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); lhs == as.logical(rhs) } [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); lhs == rhs } rx1 rx2 rx3 ry1 TRUE TRUE TRUE ry2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); temp <- as.logical(lhs); temp == rhs } rx1 rx2 rx3 ry1 TRUE TRUE TRUE ry2 TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- array(FALSE,dim=c(2,3),dimnames=list(c('ry1','ry2'),c('rx1','rx2','rx3'))); temp <- as.logical(rhs); lhs == temp } [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- c(FALSE, FALSE); as.logical(lhs) == rhs } [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- c(FALSE, FALSE); lhs == as.logical(rhs) } [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- c(FALSE, FALSE); lhs == rhs } [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- c(FALSE, FALSE); temp <- as.logical(lhs); temp == rhs } [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testCopyAttribOnBinaryBoolean# #{ lhs <- c(FALSE, FALSE); rhs <- c(FALSE, FALSE); temp <- as.logical(rhs); lhs == temp } [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testDispatchToOpsSpecializations# #data.frame(factor(c(1,2,1))) == data.frame(factor(c(1,2,2))) factor.c.1..2..1.. [1,] TRUE [2,] TRUE [3,] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testDispatchToOpsSpecializations# #data.frame(factor(c(1,2,3))) == data.frame(factor(c(1,2,3))) factor.c.1..2..3.. [1,] TRUE [2,] TRUE [3,] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testDispatchToOpsSpecializations#Output.IgnoreErrorContext# #factor(c("a","b","c")) == factor(c(1,2,3)) Error in Ops.factor(factor(c("a", "b", "c")), factor(c(1, 2, 3))) : level sets of factors are different ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testEqualsList# #{ l <- list(an='a', bn='b', 3, 4); 'a' == l } an bn TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testEqualsList# #{ l <- list(an='a', bn='b', 3, 4); l == 'a' } an bn TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testEqualsList# #{ l <- list(an=1, bn=2, 3, 4); 1 == l } an bn TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testEqualsList# #{ l <- list(an=1, bn=2, 3, 4); l == 1 } an bn TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testEqualsList# #{ l <- list(an=1L, bn=2L, 3, 4); 1 == l } an bn TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testEqualsList# #{ l <- list(an=1L, bn=2L, 3, 4); l == 1 } an bn TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testEqualsList# #{ l <- list(an=T, bn=F, T, F); T == l } an bn TRUE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testEqualsList# #{ l <- list(an=T, bn=F, T, F); l == T } an bn TRUE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testIn# #{ "hello" %in% c("I", "say", "hello", "world") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testIn# #{ 2 %in% c(1,2,3) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testIn# #{ `%in%`(2,c(1,2,3)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testIn# #{ c("hello", "say") %in% c("I", "say", "hello", "world") } [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testIn# #{ c(1,2,3,4,5) %in% c(1,2,1,2) } [1] TRUE TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testListWithNull# #{ c(1, 1) < list(1, NULL) } Error: 'list' object cannot be coerced to type 'double' ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testListWithNull# #{ list(1, NULL) < c(1, 1) } Error: 'list' object cannot be coerced to type 'double' ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testListWithNull# #{ list(NULL) < 1 } Error: 'list' object cannot be coerced to type 'double' ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ as.vector(c(1,2,3)) %*% t(as.vector(c(1,2))) } [,1] [,2] [1,] 1 2 [2,] 2 4 [3,] 3 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ c(1+1i,0-0i,4+4i) %*% matrix(c(3+3i,1-1i,2+2i,0-0i,1+1i,2-2i),3) } [,1] [,2] [1,] 0+22i 16+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ c(1+1i,2-2i,3+3i) %*% c(4-4i,5+5i,6-6i) } [,1] [1,] 64+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ c(1,0,4) %*% matrix(c(3,1,2,0,1,2),3) } [,1] [,2] [1,] 11 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ c(1,2,3) %*% c(4,5,6) } [,1] [1,] 32 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ matrix(c(1+1i,0-0i,4+4i),3) %*% matrix(c(3+3i,1-1i,2+2i,0-0i,1+1i,2-2i),1) } [,1] [,2] [,3] [,4] [,5] [,6] [1,] 0+ 6i 2+0i 0+ 4i 0+0i 0+2i 4+0i [2,] 0+ 0i 0+0i 0+ 0i 0+0i 0+0i 0+0i [3,] 0+24i 8+0i 0+16i 0+0i 0+8i 16+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ matrix(c(1+1i,2-2i,3+3i,4-4i), 2) %*% matrix(c(5+5i,6-6i,7+7i,8-8i), 2) } [,1] [,2] [1,] 36+10i 48+14i [2,] 20-48i 28-64i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ matrix(c(1,2,3,4), 2) %*% matrix(c(5,6,7,8), 2) } [,1] [,2] [1,] 23 31 [2,] 34 46 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ matrix(c(3+3i,1-1i,2+2i,0-0i,1+1i,2-2i), 2) %*% matrix(c(1+1i,0-0i,4+4i,2-2i,1+1i,0-0i), 3) } [,1] [,2] [1,] 0+14i 12+4i [2,] 18+ 0i 0-4i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ matrix(c(3+3i,1-1i,2+2i,0-0i,1+1i,2-2i),2) %*% c(1+1i,0-0i,4+4i) } [,1] [1,] 0+14i [2,] 18+ 0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ matrix(c(3,1,2,0,1,2), 2) %*% matrix(c(1,0,4,2,1,0), 3) } [,1] [,2] [1,] 7 8 [2,] 9 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testMatMult# #{ matrix(c(3,1,2,0,1,2),2) %*% c(1,0,4) } [,1] [1,] 7 [2,] 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testNames# #data <- c(1,2,3,4); names(data) <- c('a','b','c','d'); data[c('a','b')] + data[c('c','d')]; data[c('a','b')] + data[c('c')]; data[c('a')] + data[c('c','d')]; data[c('a')] + data[c('c')]; data[c('a')] + 1; 1 + data[c('a')]; data[c('a')] + c(1,2); c(1,2) + data[c('a')]; data[c('a','b')] + 1; 1 + data[c('a','b')]; data[c('a','b')] + c(1,2); c(1,2) + data[c('a','b')] a b 4 6 a b 4 5 c d 4 5 a 4 a 2 a 2 [1] 2 3 [1] 2 3 a b 2 3 a b 2 3 a b 2 4 a b 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #as.symbol('asdf') + as.symbol('fdsa') Error in as.symbol("asdf") + as.symbol("fdsa") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #as.symbol('asdf') == as.symbol('fdsa') [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `!`(TRUE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `%%`(1,2) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `%*%`(3,5) } [,1] [1,] 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `%/%`(1,2) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `%o%`(3,5) } [,1] [1,] 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `&&`(TRUE, FALSE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `&`(TRUE, FALSE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `*`(1,2) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `+`(1,2) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `-`(1,2) } [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `/`(1,2) } [1] 0.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `^`(1,2) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `|`(TRUE, FALSE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ `||`(TRUE, FALSE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ x <- `+` ; f <- function() { x <- 1 ; x(2,3) } ; f() } [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testOperators# #{ x <- `+` ; x(2,3) } [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testPrecedence# #{ 3 %% 2 %in% 1} [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators1# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));`!`(argv[[1]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators10# #argv <- list(1, 0+1i);`+`(argv[[1]],argv[[2]]); [1] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators100# #argv <- list(c(30L, 30L, 60L, 60L, 60L, 60L, 60L, 60L, 30L, 30L, 60L, 60L, 60L, NA, 30L, 30L, 30L, 30L, 60L, 60L, 60L, 60L, 60L, 60L, 30L, 30L, 60L, 60L, 60L, 60L, 30L, 30L, 30L, NA, 30L, 30L, 60L, 60L, 30L, 30L, 30L, 30L, 30L, 60L, 60L, 30L, 30L, 30L, 30L, 60L, NA, 60L, NA, 30L, 60L, 60L, 30L, NA, 30L, 30L, 60L, NA, 30L, 30L, 30L, 30L, 30L, NA, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, NA, 18L, 18L, 30L, 30L, 30L, 30L, 18L, 18L, 30L, 30L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, NA, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, NA, 18L, 18L, 30L, 30L, 18L, 18L, 30L, 30L, 18L, 18L, 30L, 30L, 30L, 30L, NA, 18L, NA, 30L, 30L, NA, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 30L, 30L, NA, 30L, 18L, 18L, 30L, 30L, 18L, 18L, 7L, 7L, 30L, 30L, 18L, 18L, NA, 30L, 7L, 7L, 7L, NA, 18L, 18L, 7L, 7L, 18L, NA, 30L, 30L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 18L, 18L), 60);`<=`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA TRUE [16] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [31] TRUE TRUE TRUE NA TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [46] TRUE TRUE TRUE TRUE TRUE NA TRUE NA TRUE TRUE TRUE TRUE NA TRUE TRUE [61] TRUE NA TRUE TRUE TRUE TRUE TRUE NA TRUE TRUE TRUE TRUE TRUE TRUE TRUE [76] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA TRUE TRUE TRUE TRUE TRUE [91] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA TRUE TRUE [106] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [121] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [136] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA TRUE TRUE TRUE [151] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA TRUE NA TRUE [166] TRUE NA TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA [181] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA TRUE [196] TRUE TRUE TRUE NA TRUE TRUE TRUE TRUE TRUE NA TRUE TRUE TRUE TRUE TRUE [211] TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators101# #argv <- list(structure(c(21, 0, 77, 0, 0, 96, 0, 0, 0, 0, 0, 0, 0, 0, 77, 0, 325, 0, 0, 288, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 361, 0, 513, 96, 0, 288, 0, 0, 576, 0, 0, 0, 0, 0, 513, 0, 729), .Dim = c(7L, 7L), .Dimnames = list(NULL, NULL)), 0);`!=`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [1,] TRUE FALSE TRUE FALSE FALSE TRUE FALSE [2,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE [3,] TRUE FALSE TRUE FALSE FALSE TRUE FALSE [4,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE [5,] FALSE FALSE FALSE FALSE TRUE FALSE TRUE [6,] TRUE FALSE TRUE FALSE FALSE TRUE FALSE [7,] FALSE FALSE FALSE FALSE TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators102#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'), 0L);`<=`(argv[[1]],argv[[2]]); [1] NA Warning message: In Ops.factor(argv[[1]], argv[[2]]) : ‘<=’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators103# #argv <- list(NULL, NULL);`<=`(argv[[1]],argv[[2]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators104# #argv <- list(structure(c(-1.47120249322699, 0.791288894530825, 4.43110323863505), .Dim = c(1L, 3L)), 0.0031308);`<=`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators105#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`<=`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘<=’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators106# #argv <- list(0.998212441139784, c(0.999998001700552, -0.0013118835870674, -0.000526551904329415, 0.999999038344567, -0.000903475278483392, -0.000381296378838388, 0.999999057686544, -0.000896140095625969, -0.000373156128147092, 0.999998405868953, -0.00114777435393854, -0.000526063245555164, 0.99999814161282, -0.00120795166706622, -0.000631851641234638, 0.999997792453059, -0.00139185834612791, -0.000519877304541034, 0.999998020546725, -0.00127080900255349, -0.00060373324887666, 0.999998059330159, -0.00123814735894241, -0.000638480377887232, 0.999998337108097, -0.00115570987192407, -0.000572034814304861, 0.999998571810103, -0.00106400147389197, -0.00054414035107764, 0.999999136998844, -0.000829344110491764, -0.000418555560445895, 0.999999436800894, -0.000688792506748533, -0.00029793232712181, 0.999999182435777, -0.000786088000160243, -0.000446798847724984, 0.999998035855459, -0.00125214214514046, -0.000629508325517675, 0.999995461301925, -0.00191759993645823, -0.000928163756226527, 0.999990501294199, -0.00282586497589704, -0.00123008240127283, 0.99998523015117, -0.00349306924843624, -0.00160252859811979, 0.999980247693918, -0.00393070891026528, -0.00207399213858218, 0.999258133391236, -0.0212608113487506, 0.0170086490790013, 0.999752823870685, -0.0151150534926454, -0.00431858671218418, 0.998521231438773, -0.0331918414882689, 0.0193619075348229, 0.973987730061349, 0.0773006134969334, -0.139141104294479, 0.997923156801661, -0.0321910695742469, 0.0321910695742468, 0.999947758503179, -0.00259457124676546, -0.006745885241587, -0.0013118835870674, 0.138748425090248, -0.345681325192261, -0.000903475278483392, 0.151184975864853, -0.358227947918666, -0.000896140095625969, 0.147770769059702, -0.354871477867884, -0.00114777435393854, 0.173602465164251, -0.378765536799718, -0.00120795166706622, 0.214831416406957, -0.410703566802515, -0.00139185834612791, 0.122433312766354, -0.327782640513123, -0.00127080900255349, 0.184140620360657, -0.387596745778816, -0.00123814735894241, 0.21006198499474, -0.407350481092054, -0.00115570987192407, 0.196781639012774, -0.397564195941878, -0.00106400147389197, 0.207318901950479, -0.405384561552842, -0.000829344110491764, 0.203000309817415, -0.402231893588506, -0.000688792506748533, 0.157606764246543, -0.364371236069974, -0.000786088000160243, 0.244176387845927, -0.429597092087573, -0.00125214214514046, 0.201759382472957, -0.401311557517518, -0.00191759993645823, 0.189814026846399, -0.392149187005707, -0.00282586497589704, 0.159305169670633, -0.365949514378666, -0.00349306924843624, 0.173889122744829, -0.378998013455332, -0.00393070891026528, 0.217788926857211, -0.412724435577854, -0.0212608113487506, 0.000452357688250284, -0.00036188615058233, -0.0151150534926454, 0.000228521327097438, 6.52918077527545e-05, -0.0331918414882689, 0.00110332991097693, -0.000643609114746404, 0.0773006134969334, 0.00613496932514866, -0.0110429447852694, -0.0321910695742469, 0.0010384215991718, -0.00103842159917336, -0.00259457124676546, 6.73215168555691e-06, 1.75035942027152e-05, -0.000526551904329415, -0.345681325192261, 0.861253573209199, -0.000381296378838388, -0.358227947918666, 0.848815985790579, -0.000373156128147092, -0.354871477867884, 0.852230173253752, -0.000526063245555164, -0.378765536799718, 0.826399128966796, -0.000631851641234638, -0.410703566802515, 0.785170441980223, -0.000519877304541034, -0.327782640513123, 0.877568894780586, -0.00060373324887666, -0.387596745778816, 0.815861359092619, -0.000638480377887232, -0.407350481092054, 0.789939955675102, -0.000572034814304861, -0.397564195941878, 0.803220023879128, -0.00054414035107764, -0.405384561552842, 0.792682526239419, -0.000418555560445895, -0.402231893588506, 0.797000553183741, -0.00029793232712181, -0.364371236069974, 0.842393798952562, -0.000446798847724984, -0.429597092087573, 0.755824429718295, -0.000629508325517675, -0.401311557517518, 0.798242581671585, -0.000928163756226527, -0.392149187005707, 0.810190511851676, -0.00123008240127283, -0.365949514378666, 0.840704329035169, -0.00160252859811979, -0.378998013455332, 0.826125647104002, -0.00207399213858218, -0.412724435577854, 0.782230825448871, 0.0170086490790013, -0.00036188615058233, 0.00028950892043616, -0.00431858671218418, 6.52918077527545e-05, 1.86548021961656e-05, 0.0193619075348229, -0.000643609114746404, 0.000375438650284673, -0.139141104294479, -0.0110429447852694, 0.0198773006134874, 0.0321910695742468, -0.00103842159917336, 0.00103842159917592, -0.006745885241587, 1.75035942027152e-05, 4.55093454284494e-05));`<=`(argv[[1]],argv[[2]]); [1] TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE [13] TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE [25] TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE [37] TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE [49] TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE [61] TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [109] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [121] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [133] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [145] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [157] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [169] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [181] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [193] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [205] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators107#Ignored.OutputFormatting# #argv <- list(structure(0:100, .Tsp = c(1, 101, 1), class = 'ts'), 0);`<=`(argv[[1]],argv[[2]]); Time Series: Start = 1 End = 101 Frequency = 1 [1] TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [37] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [49] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [61] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators108#Ignored.OutputFormatting# #argv <- list(structure(c(0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96, 97, 98, 99, 100, 0, 10, 20, 30, 40, 50, 60, 70, 80, 90, 100, 110, 120, 130, 140, 150, 160, 170, 180, 190, 200, 210, 220, 230, 240, 250, 260, 270, 280, 290, 300, 310, 320, 330, 340, 350, 360, 370, 380, 390, 400, 410, 420, 430, 440, 450, 460, 470, 480, 490, 500, 510, 520, 530, 540, 550, 560, 570, 580, 590, 600, 610, 620, 630, 640, 650, 660, 670, 680, 690, 700, 710, 720, 730, 740, 750, 760, 770, 780, 790, 800, 810, 820, 830, 840, 850, 860, 870, 880, 890, 900, 910, 920, 930, 940, 950, 960, 970, 980, 990, 1000, -4, -3, -2, -1, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96), .Dim = c(101L, 3L), .Dimnames = list(NULL, c('t1', '10 * t1', 't1 - 4')), .Tsp = c(1, 101, 1), class = c('mts', 'ts', 'matrix')), 0);`<=`(argv[[1]],argv[[2]]); Time Series: Start = 1 End = 101 Frequency = 1 t1 10 * t1 t1 - 4 1 TRUE TRUE TRUE 2 FALSE FALSE TRUE 3 FALSE FALSE TRUE 4 FALSE FALSE TRUE 5 FALSE FALSE TRUE 6 FALSE FALSE FALSE 7 FALSE FALSE FALSE 8 FALSE FALSE FALSE 9 FALSE FALSE FALSE 10 FALSE FALSE FALSE 11 FALSE FALSE FALSE 12 FALSE FALSE FALSE 13 FALSE FALSE FALSE 14 FALSE FALSE FALSE 15 FALSE FALSE FALSE 16 FALSE FALSE FALSE 17 FALSE FALSE FALSE 18 FALSE FALSE FALSE 19 FALSE FALSE FALSE 20 FALSE FALSE FALSE 21 FALSE FALSE FALSE 22 FALSE FALSE FALSE 23 FALSE FALSE FALSE 24 FALSE FALSE FALSE 25 FALSE FALSE FALSE 26 FALSE FALSE FALSE 27 FALSE FALSE FALSE 28 FALSE FALSE FALSE 29 FALSE FALSE FALSE 30 FALSE FALSE FALSE 31 FALSE FALSE FALSE 32 FALSE FALSE FALSE 33 FALSE FALSE FALSE 34 FALSE FALSE FALSE 35 FALSE FALSE FALSE 36 FALSE FALSE FALSE 37 FALSE FALSE FALSE 38 FALSE FALSE FALSE 39 FALSE FALSE FALSE 40 FALSE FALSE FALSE 41 FALSE FALSE FALSE 42 FALSE FALSE FALSE 43 FALSE FALSE FALSE 44 FALSE FALSE FALSE 45 FALSE FALSE FALSE 46 FALSE FALSE FALSE 47 FALSE FALSE FALSE 48 FALSE FALSE FALSE 49 FALSE FALSE FALSE 50 FALSE FALSE FALSE 51 FALSE FALSE FALSE 52 FALSE FALSE FALSE 53 FALSE FALSE FALSE 54 FALSE FALSE FALSE 55 FALSE FALSE FALSE 56 FALSE FALSE FALSE 57 FALSE FALSE FALSE 58 FALSE FALSE FALSE 59 FALSE FALSE FALSE 60 FALSE FALSE FALSE 61 FALSE FALSE FALSE 62 FALSE FALSE FALSE 63 FALSE FALSE FALSE 64 FALSE FALSE FALSE 65 FALSE FALSE FALSE 66 FALSE FALSE FALSE 67 FALSE FALSE FALSE 68 FALSE FALSE FALSE 69 FALSE FALSE FALSE 70 FALSE FALSE FALSE 71 FALSE FALSE FALSE 72 FALSE FALSE FALSE 73 FALSE FALSE FALSE 74 FALSE FALSE FALSE 75 FALSE FALSE FALSE 76 FALSE FALSE FALSE 77 FALSE FALSE FALSE 78 FALSE FALSE FALSE 79 FALSE FALSE FALSE 80 FALSE FALSE FALSE 81 FALSE FALSE FALSE 82 FALSE FALSE FALSE 83 FALSE FALSE FALSE 84 FALSE FALSE FALSE 85 FALSE FALSE FALSE 86 FALSE FALSE FALSE 87 FALSE FALSE FALSE 88 FALSE FALSE FALSE 89 FALSE FALSE FALSE 90 FALSE FALSE FALSE 91 FALSE FALSE FALSE 92 FALSE FALSE FALSE 93 FALSE FALSE FALSE 94 FALSE FALSE FALSE 95 FALSE FALSE FALSE 96 FALSE FALSE FALSE 97 FALSE FALSE FALSE 98 FALSE FALSE FALSE 99 FALSE FALSE FALSE 100 FALSE FALSE FALSE 101 FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators109#Ignored.OutputFormatting# #argv <- list(structure(c(112, 118, 132, 129, 121, 135, 148, 148, 136, 119, 104, 118, 115, 126, 141, 135, 125, 149, 170, 170, 158, 133, 114, 140, 145, 150, 178, 163, 172, 178, 199, 199, 184, 162, 146, 166, 171, 180, 193, 181, 183, 218, 230, 242, 209, 191, 172, 194, 196, 196, 236, 235, 229, 243, 264, 272, 237, 211, 180, 201, 204, 188, 235, 227, 234, 264, 302, 293, 259, 229, 203, 229, 242, 233, 267, 269, 270, 315, 364, 347, 312, 274, 237, 278, 284, 277, 317, 313, 318, 374, 413, 405, 355, 306, 271, 306, 315, 301, 356, 348, 355, 422, 465, 467, 404, 347, 305, 336, 340, 318, 362, 348, 363, 435, 491, 505, 404, 359, 310, 337, 360, 342, 406, 396, 420, 472, 548, 559, 463, 407, 362, 405, 417, 391, 419, 461, 472, 535, 622, 606, 508, 461, 390, 432, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 419.147602949539, 391.474665943444, 435.919286153217, 443.935203034261, 455.023399013445, 517.28707821144, 589.71337277669, 582.999919227301, 484.573388713116, 428.878182738437, 368.526582998452, 406.728709993152, 415.660571294428, 388.716535970235, 433.006017658935, 440.885684396326, 451.651900136866, 513.051252429496, 584.327164324967, 577.055407135124, 479.076505013118, 423.494870357491, 363.43932958967, 400.592058645117, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 484.030717075782, 462.954959541421, 526.353307750503, 546.165638262644, 569.502470928676, 657.838443307596, 761.241730163307, 763.280655335144, 642.989004951864, 576.423799567567, 501.429012064338, 559.981301364233, 591.700754553767, 565.210772316967, 642.377841008703, 666.682421047093, 695.547100430962, 804.065022775202, 931.340589597203, 934.837830059897, 788.422986194072, 707.666678543854, 616.37838266375, 689.250456425465), .Dim = c(168L, 3L), .Dimnames = list(NULL, c('structure(c(112, 118, 132, 129, 121, 135, 148, 148, 136, 119, ', 'structure(c(419.147602949539, 391.474665943444, 435.919286153217, ', 'structure(c(484.030717075782, 462.954959541421, 526.353307750503, ')), .Tsp = c(1949, 1962.91666666667, 12), class = c('mts', 'ts', 'matrix')), 0);`<=`(argv[[1]],argv[[2]]); structure(c(112, 118, 132, 129, 121, 135, 148, 148, 136, 119, Jan 1949 FALSE Feb 1949 FALSE Mar 1949 FALSE Apr 1949 FALSE May 1949 FALSE Jun 1949 FALSE Jul 1949 FALSE Aug 1949 FALSE Sep 1949 FALSE Oct 1949 FALSE Nov 1949 FALSE Dec 1949 FALSE Jan 1950 FALSE Feb 1950 FALSE Mar 1950 FALSE Apr 1950 FALSE May 1950 FALSE Jun 1950 FALSE Jul 1950 FALSE Aug 1950 FALSE Sep 1950 FALSE Oct 1950 FALSE Nov 1950 FALSE Dec 1950 FALSE Jan 1951 FALSE Feb 1951 FALSE Mar 1951 FALSE Apr 1951 FALSE May 1951 FALSE Jun 1951 FALSE Jul 1951 FALSE Aug 1951 FALSE Sep 1951 FALSE Oct 1951 FALSE Nov 1951 FALSE Dec 1951 FALSE Jan 1952 FALSE Feb 1952 FALSE Mar 1952 FALSE Apr 1952 FALSE May 1952 FALSE Jun 1952 FALSE Jul 1952 FALSE Aug 1952 FALSE Sep 1952 FALSE Oct 1952 FALSE Nov 1952 FALSE Dec 1952 FALSE Jan 1953 FALSE Feb 1953 FALSE Mar 1953 FALSE Apr 1953 FALSE May 1953 FALSE Jun 1953 FALSE Jul 1953 FALSE Aug 1953 FALSE Sep 1953 FALSE Oct 1953 FALSE Nov 1953 FALSE Dec 1953 FALSE Jan 1954 FALSE Feb 1954 FALSE Mar 1954 FALSE Apr 1954 FALSE May 1954 FALSE Jun 1954 FALSE Jul 1954 FALSE Aug 1954 FALSE Sep 1954 FALSE Oct 1954 FALSE Nov 1954 FALSE Dec 1954 FALSE Jan 1955 FALSE Feb 1955 FALSE Mar 1955 FALSE Apr 1955 FALSE May 1955 FALSE Jun 1955 FALSE Jul 1955 FALSE Aug 1955 FALSE Sep 1955 FALSE Oct 1955 FALSE Nov 1955 FALSE Dec 1955 FALSE Jan 1956 FALSE Feb 1956 FALSE Mar 1956 FALSE Apr 1956 FALSE May 1956 FALSE Jun 1956 FALSE Jul 1956 FALSE Aug 1956 FALSE Sep 1956 FALSE Oct 1956 FALSE Nov 1956 FALSE Dec 1956 FALSE Jan 1957 FALSE Feb 1957 FALSE Mar 1957 FALSE Apr 1957 FALSE May 1957 FALSE Jun 1957 FALSE Jul 1957 FALSE Aug 1957 FALSE Sep 1957 FALSE Oct 1957 FALSE Nov 1957 FALSE Dec 1957 FALSE Jan 1958 FALSE Feb 1958 FALSE Mar 1958 FALSE Apr 1958 FALSE May 1958 FALSE Jun 1958 FALSE Jul 1958 FALSE Aug 1958 FALSE Sep 1958 FALSE Oct 1958 FALSE Nov 1958 FALSE Dec 1958 FALSE Jan 1959 FALSE Feb 1959 FALSE Mar 1959 FALSE Apr 1959 FALSE May 1959 FALSE Jun 1959 FALSE Jul 1959 FALSE Aug 1959 FALSE Sep 1959 FALSE Oct 1959 FALSE Nov 1959 FALSE Dec 1959 FALSE Jan 1960 FALSE Feb 1960 FALSE Mar 1960 FALSE Apr 1960 FALSE May 1960 FALSE Jun 1960 FALSE Jul 1960 FALSE Aug 1960 FALSE Sep 1960 FALSE Oct 1960 FALSE Nov 1960 FALSE Dec 1960 FALSE Jan 1961 NA Feb 1961 NA Mar 1961 NA Apr 1961 NA May 1961 NA Jun 1961 NA Jul 1961 NA Aug 1961 NA Sep 1961 NA Oct 1961 NA Nov 1961 NA Dec 1961 NA Jan 1962 NA Feb 1962 NA Mar 1962 NA Apr 1962 NA May 1962 NA Jun 1962 NA Jul 1962 NA Aug 1962 NA Sep 1962 NA Oct 1962 NA Nov 1962 NA Dec 1962 NA structure(c(419.147602949539, 391.474665943444, 435.919286153217, Jan 1949 NA Feb 1949 NA Mar 1949 NA Apr 1949 NA May 1949 NA Jun 1949 NA Jul 1949 NA Aug 1949 NA Sep 1949 NA Oct 1949 NA Nov 1949 NA Dec 1949 NA Jan 1950 NA Feb 1950 NA Mar 1950 NA Apr 1950 NA May 1950 NA Jun 1950 NA Jul 1950 NA Aug 1950 NA Sep 1950 NA Oct 1950 NA Nov 1950 NA Dec 1950 NA Jan 1951 NA Feb 1951 NA Mar 1951 NA Apr 1951 NA May 1951 NA Jun 1951 NA Jul 1951 NA Aug 1951 NA Sep 1951 NA Oct 1951 NA Nov 1951 NA Dec 1951 NA Jan 1952 NA Feb 1952 NA Mar 1952 NA Apr 1952 NA May 1952 NA Jun 1952 NA Jul 1952 NA Aug 1952 NA Sep 1952 NA Oct 1952 NA Nov 1952 NA Dec 1952 NA Jan 1953 NA Feb 1953 NA Mar 1953 NA Apr 1953 NA May 1953 NA Jun 1953 NA Jul 1953 NA Aug 1953 NA Sep 1953 NA Oct 1953 NA Nov 1953 NA Dec 1953 NA Jan 1954 NA Feb 1954 NA Mar 1954 NA Apr 1954 NA May 1954 NA Jun 1954 NA Jul 1954 NA Aug 1954 NA Sep 1954 NA Oct 1954 NA Nov 1954 NA Dec 1954 NA Jan 1955 NA Feb 1955 NA Mar 1955 NA Apr 1955 NA May 1955 NA Jun 1955 NA Jul 1955 NA Aug 1955 NA Sep 1955 NA Oct 1955 NA Nov 1955 NA Dec 1955 NA Jan 1956 NA Feb 1956 NA Mar 1956 NA Apr 1956 NA May 1956 NA Jun 1956 NA Jul 1956 NA Aug 1956 NA Sep 1956 NA Oct 1956 NA Nov 1956 NA Dec 1956 NA Jan 1957 NA Feb 1957 NA Mar 1957 NA Apr 1957 NA May 1957 NA Jun 1957 NA Jul 1957 NA Aug 1957 NA Sep 1957 NA Oct 1957 NA Nov 1957 NA Dec 1957 NA Jan 1958 NA Feb 1958 NA Mar 1958 NA Apr 1958 NA May 1958 NA Jun 1958 NA Jul 1958 NA Aug 1958 NA Sep 1958 NA Oct 1958 NA Nov 1958 NA Dec 1958 NA Jan 1959 NA Feb 1959 NA Mar 1959 NA Apr 1959 NA May 1959 NA Jun 1959 NA Jul 1959 NA Aug 1959 NA Sep 1959 NA Oct 1959 NA Nov 1959 NA Dec 1959 NA Jan 1960 NA Feb 1960 NA Mar 1960 NA Apr 1960 NA May 1960 NA Jun 1960 NA Jul 1960 NA Aug 1960 NA Sep 1960 NA Oct 1960 NA Nov 1960 NA Dec 1960 NA Jan 1961 FALSE Feb 1961 FALSE Mar 1961 FALSE Apr 1961 FALSE May 1961 FALSE Jun 1961 FALSE Jul 1961 FALSE Aug 1961 FALSE Sep 1961 FALSE Oct 1961 FALSE Nov 1961 FALSE Dec 1961 FALSE Jan 1962 FALSE Feb 1962 FALSE Mar 1962 FALSE Apr 1962 FALSE May 1962 FALSE Jun 1962 FALSE Jul 1962 FALSE Aug 1962 FALSE Sep 1962 FALSE Oct 1962 FALSE Nov 1962 FALSE Dec 1962 FALSE structure(c(484.030717075782, 462.954959541421, 526.353307750503, Jan 1949 NA Feb 1949 NA Mar 1949 NA Apr 1949 NA May 1949 NA Jun 1949 NA Jul 1949 NA Aug 1949 NA Sep 1949 NA Oct 1949 NA Nov 1949 NA Dec 1949 NA Jan 1950 NA Feb 1950 NA Mar 1950 NA Apr 1950 NA May 1950 NA Jun 1950 NA Jul 1950 NA Aug 1950 NA Sep 1950 NA Oct 1950 NA Nov 1950 NA Dec 1950 NA Jan 1951 NA Feb 1951 NA Mar 1951 NA Apr 1951 NA May 1951 NA Jun 1951 NA Jul 1951 NA Aug 1951 NA Sep 1951 NA Oct 1951 NA Nov 1951 NA Dec 1951 NA Jan 1952 NA Feb 1952 NA Mar 1952 NA Apr 1952 NA May 1952 NA Jun 1952 NA Jul 1952 NA Aug 1952 NA Sep 1952 NA Oct 1952 NA Nov 1952 NA Dec 1952 NA Jan 1953 NA Feb 1953 NA Mar 1953 NA Apr 1953 NA May 1953 NA Jun 1953 NA Jul 1953 NA Aug 1953 NA Sep 1953 NA Oct 1953 NA Nov 1953 NA Dec 1953 NA Jan 1954 NA Feb 1954 NA Mar 1954 NA Apr 1954 NA May 1954 NA Jun 1954 NA Jul 1954 NA Aug 1954 NA Sep 1954 NA Oct 1954 NA Nov 1954 NA Dec 1954 NA Jan 1955 NA Feb 1955 NA Mar 1955 NA Apr 1955 NA May 1955 NA Jun 1955 NA Jul 1955 NA Aug 1955 NA Sep 1955 NA Oct 1955 NA Nov 1955 NA Dec 1955 NA Jan 1956 NA Feb 1956 NA Mar 1956 NA Apr 1956 NA May 1956 NA Jun 1956 NA Jul 1956 NA Aug 1956 NA Sep 1956 NA Oct 1956 NA Nov 1956 NA Dec 1956 NA Jan 1957 NA Feb 1957 NA Mar 1957 NA Apr 1957 NA May 1957 NA Jun 1957 NA Jul 1957 NA Aug 1957 NA Sep 1957 NA Oct 1957 NA Nov 1957 NA Dec 1957 NA Jan 1958 NA Feb 1958 NA Mar 1958 NA Apr 1958 NA May 1958 NA Jun 1958 NA Jul 1958 NA Aug 1958 NA Sep 1958 NA Oct 1958 NA Nov 1958 NA Dec 1958 NA Jan 1959 NA Feb 1959 NA Mar 1959 NA Apr 1959 NA May 1959 NA Jun 1959 NA Jul 1959 NA Aug 1959 NA Sep 1959 NA Oct 1959 NA Nov 1959 NA Dec 1959 NA Jan 1960 NA Feb 1960 NA Mar 1960 NA Apr 1960 NA May 1960 NA Jun 1960 NA Jul 1960 NA Aug 1960 NA Sep 1960 NA Oct 1960 NA Nov 1960 NA Dec 1960 NA Jan 1961 FALSE Feb 1961 FALSE Mar 1961 FALSE Apr 1961 FALSE May 1961 FALSE Jun 1961 FALSE Jul 1961 FALSE Aug 1961 FALSE Sep 1961 FALSE Oct 1961 FALSE Nov 1961 FALSE Dec 1961 FALSE Jan 1962 FALSE Feb 1962 FALSE Mar 1962 FALSE Apr 1962 FALSE May 1962 FALSE Jun 1962 FALSE Jul 1962 FALSE Aug 1962 FALSE Sep 1962 FALSE Oct 1962 FALSE Nov 1962 FALSE Dec 1962 FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators11# #argv <- list(structure(68.6851383798793, .Names = ''), structure(35.9756377289347, .Names = 'Var1'));`+`(argv[[1]],argv[[2]]); 104.6608 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators110# #argv <- list(structure(list(Fertility = c(80.2, 83.1, 92.5, 85.8, 76.9), Agriculture = c(17, 45.1, 39.7, 36.5, 43.5), Examination = c(15L, 6L, 5L, 12L, 17L), Education = c(12L, 9L, 5L, 7L, 15L)), .Names = c('Fertility', 'Agriculture', 'Examination', 'Education'), row.names = c('Courtelary', 'Delemont', 'Franches-Mnt', 'Moutier', 'Neuveville'), class = 'data.frame'), 6);`<=`(argv[[1]],argv[[2]]); Fertility Agriculture Examination Education Courtelary FALSE FALSE FALSE FALSE Delemont FALSE FALSE TRUE FALSE Franches-Mnt FALSE FALSE TRUE TRUE Moutier FALSE FALSE FALSE FALSE Neuveville FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators111# #argv <- list(c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, NA, 2L, 2L, 0L, NA, 1L, 1L), c(0, 0, 0, 0, 0, 0, 0, 0, 1, NA, 2, 2, 0, NA, 1, 1));`==`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA TRUE TRUE TRUE NA TRUE [16] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators112#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`!`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘!’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators113# #argv <- list(structure(c(2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), .Label = c('fm2', 'original'), class = c('ordered', 'factor')), 'original');`!=`(argv[[1]],argv[[2]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [37] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [49] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [61] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [109] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [121] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [133] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [145] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [157] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators114# #argv <- list(structure(c(1, 2, 0, 1, 2, 0, 1, 2, 0, 1, 2, 0), .Dim = 12L), 0);`==`(argv[[1]],argv[[2]]); [1] FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators115# #argv <- list(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96, 97, 98, 99, 100, 101, 102, 103, 104, 105, 106, 107, 108, 109, 110, 111, 112, 113, 114, 115, 116, 117, 118, 119, 120, 121, 122, 123, 124, 124, 125, 126, 127, 160, 160, 164, 167, 168, 173, 173, 176, 180, 184, 193, 194, 196, 199, 201, 203, 205, 206, 211, 212, 214, 215, 218, 220, 221, 223, 225, 226, 228, 231, 233, 235, 237, 238, 243, 244, 246, 247, 250, 252, 253, 258, 259, 260, 261, 262, 263, 268, 269, 270, 271, 272, 272, 273, 273, 280, 281, 282, 283, 313, 314, 317, 318, 321, 322, 323, 324, 327, 328, 336, 336, 337, 337, 340, 341, 344, 345, 346, 347, 350, 351, 352, 353, 354, 354, 355, 355, 356, 357, 366, 367, 368, 368, 369, 369, 377, 378, 379, 379, 380, 380, 381, 382, 711, 728, 729, 731, 733), structure(231L, .Names = 'e7', class = c('noquote', 'hexmode')));`==`(argv[[1]],argv[[2]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [37] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [49] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [61] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [109] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [121] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [133] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [145] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [157] FALSE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [169] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [181] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [193] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [205] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [217] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [229] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators116# #argv <- list(structure(c(1L, 2L, 3L, 1L, 2L, 3L, 1L, 2L, 3L, 1L, 2L, 3L), .Dim = 3:4), structure(c(1L, 1L, 1L, 2L, 2L, 2L, 3L, 3L, 3L, 4L, 4L, 4L), .Dim = 3:4));`==`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] TRUE FALSE FALSE FALSE [2,] FALSE TRUE FALSE FALSE [3,] FALSE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators117# #argv <- list(structure(c(9L, 4L, 6L, 5L, 3L, 10L, 5L, 3L, 5L), .Dim = 9L, .Dimnames = structure(list(x = c('0', '1', '2', '3', '4', '5', '6', '7', '8')), .Names = 'x'), class = 'table'), c(9, 4, 6, 5, 3, 10, 5, 3, 5));`==`(argv[[1]],argv[[2]]); x 0 1 2 3 4 5 6 7 8 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators118# #argv <- list(structure(c('white', 'aquamarine3', 'bisque2', 'blueviolet', 'burlywood4', 'chartreuse4', 'coral4', 'cyan3', 'darkgreen', 'darkorange1', 'aliceblue', 'white', 'white', 'white', 'white', 'chocolate', 'cornflowerblue', 'cyan4', 'darkgrey', 'darkorange2', 'antiquewhite', 'white', 'white', 'white', 'white', 'chocolate1', 'cornsilk', 'darkblue', 'darkkhaki', 'darkorange3', 'antiquewhite1', 'white', 'white', 'white', 'white', 'chocolate2', 'cornsilk1', 'darkcyan', 'darkmagenta', 'darkorange4', 'antiquewhite2', 'azure2', 'blanchedalmond', 'brown3', 'cadetblue3', 'chocolate3', 'cornsilk2', 'darkgoldenrod', 'darkolivegreen', 'darkorchid', 'antiquewhite3', 'azure3', 'blue', 'brown4', 'cadetblue4', 'chocolate4', 'cornsilk3', 'darkgoldenrod1', 'darkolivegreen1', 'darkorchid1', 'antiquewhite4', 'azure4', 'blue1', 'burlywood', 'chartreuse', 'coral', 'cornsilk4', 'darkgoldenrod2', 'darkolivegreen2', 'darkorchid2', 'aquamarine', 'beige', 'blue2', 'burlywood1', 'chartreuse1', 'coral1', 'cyan', 'darkgoldenrod3', 'darkolivegreen3', 'darkorchid3', 'aquamarine1', 'bisque', 'blue3', 'burlywood2', 'chartreuse2', 'coral2', 'cyan1', 'darkgoldenrod4', 'darkolivegreen4', 'darkorchid4', 'aquamarine2', 'bisque1', 'blue4', 'burlywood3', 'chartreuse3', 'coral3', 'cyan2', 'darkgray', 'darkorange', 'darkred'), .Dim = c(10L, 10L), class = 'raster'), 'white');`==`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [2,] FALSE TRUE TRUE TRUE TRUE FALSE FALSE FALSE FALSE FALSE [3,] FALSE TRUE TRUE TRUE TRUE FALSE FALSE FALSE FALSE FALSE [4,] FALSE TRUE TRUE TRUE TRUE FALSE FALSE FALSE FALSE FALSE [5,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [6,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [7,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [8,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [9,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [10,] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators119# #argv <- list(c(0, 7.93839803127729e-06, 7.93839803127729e-06, 1.58767960625546e-05, 2.38151940938319e-05, 3.96919901563864e-05, 5.5568786218941e-05, 8.73223783440502e-05, 0.000119075970469159, 0.0001746447566881, 0.000230213542907041, 0.000317535921251092, 0.000412796697626419, 0.00055568786218941, 0.000698579026752401, 0.000904977375565611, 0.00112725252044137, 0.00142097324759863, 0.00173057077081845, 0.00213542907041359, 0.00255616416607129, 0.00308803683416687, 0.00364372469635628, 0.00431848852901484, 0.00501706755576725, 0.00585853774708264, 0.00670000793839803, 0.00769230769230769, 0.00869254584424863, 0.00983567516075256, 0.0109629276811939, 0.0122410097642296, 0.0134714614590776, 0.0148448043184885, 0.016146701595618, 0.0175597364451854, 0.0188775105183774, 0.020298483765976, 0.0215606890529491, 0.022902278320235, 0.0240692228308327, 0.0252758593315869, 0.0262602206874653, 0.0272763356354688, 0.0280304834484401, 0.0287925696594427, 0.0292768119393506, 0.0297372390251647, 0.0299118837818528, 0.0300706517424784, 0.0299118837818528, 0.0297372390251647, 0.0292768119393506, 0.0287925696594427, 0.0280304834484401, 0.0272763356354688, 0.0262602206874653, 0.0252758593315869, 0.0240692228308327, 0.022902278320235, 0.0215606890529491, 0.020298483765976, 0.0188775105183774, 0.0175597364451854, 0.016146701595618, 0.0148448043184885, 0.0134714614590776, 0.0122410097642296, 0.0109629276811939, 0.00983567516075256, 0.00869254584424863, 0.00769230769230769, 0.00670000793839803, 0.00585853774708264, 0.00501706755576725, 0.00431848852901484, 0.00364372469635628, 0.00308803683416687, 0.00255616416607129, 0.00213542907041359, 0.00173057077081845, 0.00142097324759863, 0.00112725252044137, 0.000904977375565611, 0.000698579026752401, 0.00055568786218941, 0.000412796697626419, 0.000317535921251092, 0.000230213542907041, 0.0001746447566881, 0.000119075970469159, 8.73223783440502e-05, 5.5568786218941e-05, 3.96919901563864e-05, 2.38151940938319e-05, 1.58767960625546e-05, 7.93839803127729e-06, 7.93839803127729e-06, 0), c(0, 7.93839803127729e-06, 7.93839803127729e-06, 1.58767960625546e-05, 2.38151940938319e-05, 3.96919901563864e-05, 5.5568786218941e-05, 8.73223783440502e-05, 0.000119075970469159, 0.0001746447566881, 0.000230213542907041, 0.000317535921251092, 0.000412796697626419, 0.00055568786218941, 0.000698579026752401, 0.000904977375565611, 0.00112725252044137, 0.00142097324759863, 0.00173057077081845, 0.00213542907041359, 0.00255616416607129, 0.00308803683416687, 0.00364372469635628, 0.00431848852901484, 0.00501706755576725, 0.00585853774708264, 0.00670000793839803, 0.00769230769230769, 0.00869254584424863, 0.00983567516075256, 0.0109629276811939, 0.0122410097642296, 0.0134714614590776, 0.0148448043184885, 0.016146701595618, 0.0175597364451854, 0.0188775105183774, 0.020298483765976, 0.0215606890529491, 0.022902278320235, 0.0240692228308327, 0.0252758593315869, 0.0262602206874653, 0.0272763356354688, 0.0280304834484401, 0.0287925696594427, 0.0292768119393506, 0.0297372390251647, 0.0299118837818528, 0.0300706517424784, 0.0299118837818528, 0.0297372390251647, 0.0292768119393506, 0.0287925696594427, 0.0280304834484401, 0.0272763356354688, 0.0262602206874653, 0.0252758593315869, 0.0240692228308327, 0.022902278320235, 0.0215606890529491, 0.020298483765976, 0.0188775105183774, 0.0175597364451854, 0.016146701595618, 0.0148448043184885, 0.0134714614590776, 0.0122410097642296, 0.0109629276811939, 0.00983567516075256, 0.00869254584424863, 0.00769230769230769, 0.00670000793839803, 0.00585853774708264, 0.00501706755576725, 0.00431848852901484, 0.00364372469635628, 0.00308803683416687, 0.00255616416607129, 0.00213542907041359, 0.00173057077081845, 0.00142097324759863, 0.00112725252044137, 0.000904977375565611, 0.000698579026752401, 0.00055568786218941, 0.000412796697626419, 0.000317535921251092, 0.000230213542907041, 0.0001746447566881, 0.000119075970469159, 8.73223783440502e-05, 5.5568786218941e-05, 3.96919901563864e-05, 2.38151940938319e-05, 1.58767960625546e-05, 7.93839803127729e-06, 7.93839803127729e-06, 0));`==`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [16] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [31] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [46] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [61] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [76] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [91] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators12# #argv <- list(structure(0.070387338608913, .Names = 'Var1'), structure(0.00374843815077052, .Names = 'Var2'));`+`(argv[[1]],argv[[2]]); Var1 0.07413578 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators120#Ignored.OutputFormatting# #argv <- list(structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12), .Tsp = c(1959, 1997.91666666667, 12), class = 'ts'), 10L);`==`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec 1959 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1960 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1961 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1962 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1963 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1964 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1965 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1966 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1967 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1968 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1969 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1970 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1971 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1972 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1973 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1974 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1975 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1976 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1977 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1978 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1979 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1980 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1981 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1982 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1983 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1984 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1985 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1986 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1987 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1988 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1989 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1990 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1991 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1992 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1993 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1994 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1995 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1996 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 1997 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators121# #argv <- list(structure(c(0.86317353889998+0i, -3.79913366221062+3.31244294914647i, 1.55614767167993-1.74174276171448i, -2.23430861671215-1.65262168622253i, -2.23430861671215+1.65262168622253i, 1.55614767167993+1.74174276171448i, -3.79913366221062-3.31244294914647i, -3.33827801689622+0i, -0.24558402446046-1.38976239274682i, 0.38994543428825+2.49010387459687i, 1.4081214006546+1.81482300583077i, 1.4081214006546-1.81482300583077i, 0.38994543428825-2.49010387459687i, -0.24558402446046+1.38976239274682i, -2.31885928035568+0i, -4.19304293056817-0.22777444729915i, 0.98896416070392-1.81216964948694i, 1.39179443748361-4.40983340277928i, 1.39179443748361+4.40983340277928i, 0.98896416070392+1.81216964948694i, -4.19304293056817+0.22777444729915i, -1.0554525205105+0i, -0.26365333042432+1.4074399019829i, 0.40560122186879+3.13070845018955i, -1.20041403617116-3.43234427504359i, -1.20041403617116+3.43234427504359i, 0.40560122186879-3.13070845018955i, -0.26365333042432-1.4074399019829i, 0.0498590799965546+0i, 1.83744919383128-0.49050274510365i, -0.24547773966823+4.86316579489277i, -0.99323533469825+1.90306050881202i, -0.99323533469825-1.90306050881202i, -0.24547773966823-4.86316579489277i, 1.83744919383128+0.49050274510365i), .Dim = c(7L, 5L)), structure(c(0.86317353889998+0i, -3.79913366221062+3.31244294914647i, 1.55614767167993-1.74174276171448i, -2.23430861671215-1.65262168622253i, -2.23430861671215+1.65262168622253i, 1.55614767167993+1.74174276171448i, -3.79913366221062-3.31244294914647i, -3.33827801689622+0i, -0.24558402446046-1.38976239274682i, 0.38994543428825+2.49010387459687i, 1.4081214006546+1.81482300583077i, 1.4081214006546-1.81482300583077i, 0.38994543428825-2.49010387459687i, -0.24558402446046+1.38976239274682i, -2.31885928035568+0i, -4.19304293056817-0.22777444729915i, 0.98896416070392-1.81216964948694i, 1.39179443748361-4.40983340277928i, 1.39179443748361+4.40983340277928i, 0.98896416070392+1.81216964948694i, -4.19304293056817+0.22777444729915i, -1.0554525205105+0i, -0.26365333042432+1.4074399019829i, 0.40560122186879+3.13070845018955i, -1.20041403617116-3.43234427504359i, -1.20041403617116+3.43234427504359i, 0.40560122186879-3.13070845018955i, -0.26365333042432-1.4074399019829i, 0.0498590799965546+0i, 1.83744919383128-0.49050274510365i, -0.24547773966823+4.86316579489277i, -0.99323533469825+1.90306050881202i, -0.99323533469825-1.90306050881202i, -0.24547773966823-4.86316579489277i, 1.83744919383128+0.49050274510365i), .Dim = c(7L, 5L)));`==`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [1,] TRUE TRUE TRUE TRUE TRUE [2,] TRUE TRUE TRUE TRUE TRUE [3,] TRUE TRUE TRUE TRUE TRUE [4,] TRUE TRUE TRUE TRUE TRUE [5,] TRUE TRUE TRUE TRUE TRUE [6,] TRUE TRUE TRUE TRUE TRUE [7,] TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators122# #argv <- list(c(1.22408179743946+0i, 0.359813827057364+0i, 0.400771450594052+0i, 0.11068271594512+0i, -0.555841134754075+0i), structure(c(1.22408179743946+0i, 0.359813827057364+0i, 0.400771450594052+0i, 0.11068271594512+0i, -0.555841134754075+0i), .Dim = c(1L, 5L)));`==`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [1,] TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators122# #argv <- list(structure(c(1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 1L, 2L), .Label = c('0-9g/day', '10-19', '20-29', '30+'), class = c('ordered', 'factor'), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88')), structure(c(1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 1L, 2L), .Label = c('0-9g/day', '10-19', '20-29', '30+'), class = c('ordered', 'factor')));`==`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [16] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [31] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [46] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [61] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [76] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators124# #argv <- list(16L, 8);`%%`(argv[[1]],argv[[2]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators125# #argv <- list('«Latin-1 accented chars»: ghè øØ å<Å æ<Æ gh ghè', '«Latin-1 accented chars»: ghè øØ å<Å æ<Æ gh ghè');`==`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators126# #argv <- list(structure(list(cde = 2L, cd = 4L), .Names = c('cde', 'cd'), row.names = 'ab', class = 'data.frame'), c(2, 4));`==`(argv[[1]],argv[[2]]); cde cd ab TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators127# #argv <- list(1, structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 0L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), .Names = c('is.array', 'is.atomic', 'is.call', 'is.character', 'is.complex', 'is.data.frame', 'is.double', 'is.environment', 'is.expression', 'is.factor', 'is.finite', 'is.function', 'is.infinite', 'is.integer', 'is.language', 'is.list', 'is.logical', 'is.matrix', 'is.na', 'is.name', 'is.nan', 'is.null', 'is.numeric', 'is.numeric_version', 'is.object', 'is.ordered', 'is.package_version', 'is.pairlist', 'is.primitive', 'is.qr', 'is.raw', 'is.recursive', 'is.symbol', 'is.table', 'is.vector')));`==`(argv[[1]],argv[[2]]); is.array is.atomic is.call is.character TRUE TRUE TRUE TRUE is.complex is.data.frame is.double is.environment TRUE TRUE TRUE TRUE is.expression is.factor is.finite is.function TRUE TRUE FALSE TRUE is.infinite is.integer is.language is.list FALSE TRUE TRUE TRUE is.logical is.matrix is.na is.name TRUE TRUE FALSE TRUE is.nan is.null is.numeric is.numeric_version FALSE TRUE TRUE TRUE is.object is.ordered is.package_version is.pairlist TRUE TRUE TRUE TRUE is.primitive is.qr is.raw is.recursive TRUE TRUE TRUE TRUE is.symbol is.table is.vector TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators128# #argv <- list(c(30000L, 100000L), c(30000, 1e+05));`==`(argv[[1]],argv[[2]]); [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators129# #argv <- list(2L, e2 = 2);`==`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators13# #argv <- list(c(1, 1, 10, 1, 1, 10, 10), 0);`!=`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators130# #argv <- list(2, structure(list(2L), class = structure('L', package = '.GlobalEnv')));`==`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators131# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'), 1L);`==`(argv[[1]],argv[[2]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators132# #argv <- list(NULL, NULL);`==`(argv[[1]],argv[[2]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators133# #argv <- list(structure(c(2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2), .Dim = 5:6), structure(c(2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Dim = 5:6, .Dimnames = structure(list(blocks = c('1', '2', '3', '4', '5'), varieties = c('1', '2', '3', '4', '5', '6')), .Names = c('blocks', 'varieties')), class = 'table'));`==`(argv[[1]],argv[[2]]); varieties blocks 1 2 3 4 5 6 1 TRUE TRUE TRUE TRUE TRUE TRUE 2 TRUE TRUE TRUE TRUE TRUE TRUE 3 TRUE TRUE TRUE TRUE TRUE TRUE 4 TRUE TRUE TRUE TRUE TRUE TRUE 5 TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators134# #argv <- list(FALSE, 'Sweave');`==`(argv[[1]],argv[[2]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators135# #argv <- list(1, 26);`%%`(argv[[1]],argv[[2]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators136# #argv <- list(NULL, NULL);`>`(argv[[1]],argv[[2]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators137#Ignored.OutputFormatting# #argv <- list(structure(c(2, 1, 0, 1, 2), .Tsp = c(-1, 3, 1), class = 'ts'), 1e-05);`>`(argv[[1]],argv[[2]]); Time Series: Start = -1 End = 3 Frequency = 1 [1] TRUE TRUE FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators138# #argv <- list(structure(NA_real_, class = c('POSIXct', 'POSIXt')), structure(1386394754, class = c('POSIXct', 'POSIXt')));`>`(argv[[1]],argv[[2]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators139# #argv <- list(structure(c(-0.626453810742332, 0.183643324222082, -0.835628612410047, 1.59528080213779, 0.329507771815361, -0.820468384118015, 0.487429052428485, 0.738324705129217, 0.575781351653492, -0.305388387156356, 1.51178116845085, 0.389843236411431, -0.621240580541804, -2.2146998871775, 1.12493091814311, -0.0449336090152309, -0.0161902630989461, 0.943836210685299, 0.821221195098089, 0.593901321217509, 0.918977371608218, 0.782136300731067, 0.0745649833651906, -1.98935169586337, 0.61982574789471, -0.0561287395290008, -0.155795506705329, -1.47075238389927), .Dim = c(4L, 7L)), 0);`>`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [1,] FALSE TRUE TRUE FALSE FALSE TRUE TRUE [2,] TRUE FALSE FALSE FALSE TRUE TRUE FALSE [3,] FALSE TRUE TRUE TRUE TRUE TRUE FALSE [4,] TRUE TRUE TRUE FALSE TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators14# #argv <- list(c(23.454000046244, 23.454000046244, 23.454000046244, 23.454000046244, 28.3020224298599, 28.3020224298599, 28.3020224298599, 28.3020224298599, 30.800519631939, 30.800519631939, 30.800519631939, 30.800519631939, 25.9206422064884, 25.9206422064884, 25.9206422064884, 23.2002066882042, 23.2002066882042, 23.2002066882042, 20.1196890721666, 20.1196890721666, 20.1196890721666, 33.5952341720171, 33.5952341720171, 39.0519830824759, 39.0519830824759, 32.136512000254, 32.136512000254, 40.0046131871928, 40.0046131871928, 36.1899385542654, 36.1899385542654, 36.1899385542654, 36.9107066354437, 36.9107066354437, 30.6345192978006, 30.6345192978006, 34.3113600002908, 34.3113600002908, 38.3947952390571, 38.3947952390571, 31.2256309266188, 31.2256309266188, 31.2256309266188, 31.2256309266188, 31.2302025081837, 31.2302025081837, 31.2302025081837, 31.2302025081837, 19.9976293105352, 19.9976293105352, 19.9976293105352, 37.0952034528547, 37.0952034528547, 37.0952034528547, 32.5940180631865, 32.5940180631865, 32.5940180631865, 30.3755575381127, 30.3755575381127, 30.3755575381127), c(-7.78372381938215, -2.21918545910218, -0.632702831725275, -0.180387300047981, -7.49017129741483, -2.13549190787282, -0.608841307830204, -0.173584239188075, -22.5802449738518, -16.4998575320751, -8.81014962829596, -2.51182549655016, -23.557038894075, -17.2136212906412, -9.19126598036131, -21.8778835738372, -15.9866273589884, -8.53610880037608, -15.0686941140291, -11.0110101269414, -5.87936269076593, -5.59523381317633, -1.59523408160483, -33.4519828181102, -13.051983020203, -16.7365117167447, -8.93651185736664, -28.2046129643012, -11.0046131346857, -24.7866580698756, -18.1121297542524, -9.67102733534973, -10.9107059357263, -3.11070645913868, -6.43451888517834, -1.83451919385285, -19.311359673177, -10.3113598354284, -17.5947943688525, -9.39479451670115, -13.4592527410221, -3.83731214857368, -1.09404027169438, -0.311917318619494, -9.6582725100978, -2.75363032037238, -0.7850762062622, -0.223829845669225, -4.53229442651767, -1.2921838083017, -0.368409206751382, -8.25942763485825, -2.35481141586021, -0.671370589998607, -10.5255747423345, -3.00090328985181, -0.855575184775718, -7.55762449149225, -2.15472321038819, -0.614324265331269));`+`(argv[[1]],argv[[2]]); [1] 15.670276 21.234815 22.821297 23.273613 20.811851 26.166531 27.693181 [8] 28.128438 8.220275 14.300662 21.990370 28.288694 2.363603 8.707021 [15] 16.729376 1.322323 7.213579 14.664098 5.050995 9.108679 14.240326 [22] 28.000000 32.000000 5.600000 26.000000 15.400000 23.200000 11.800000 [29] 29.000000 11.403280 18.077809 26.518911 26.000001 33.800000 24.200000 [36] 28.800000 15.000000 24.000000 20.800001 29.000001 17.766378 27.388319 [43] 30.131591 30.913714 21.571930 28.476572 30.445126 31.006373 15.465335 [50] 18.705446 19.629220 28.835776 34.740392 36.423833 22.068443 29.593115 [57] 31.738443 22.817933 28.220834 29.761233 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators140# #argv <- list(structure(c(24L, 13L, 15L, 68L, 39L, 74L, 22L, 1L, 8L, 55L, 24L, 20L, 51L, 13L, 3L, 4L, 5L, 6L, 15L, 2L, 8L, 60L, 67L, 23L, 58L, 24L, 22L, 21L, 37L, 74L, 59L, 39L, 14L, 14L, 19L, 23L, 70L, 21L, 22L, 31L, 29L, 30L, 45L, 58L, 17L, 7L, 19L, 26L, 39L, 74L, 57L, 59L, 12L, 72L, 70L, 37L, 64L, 16L, 18L, 21L, 22L, 8L, 62L, 61L, 63L, 71L, 105L, 64L, 10L, 41L, 8L, 27L, 11L, 34L, 32L, 33L, 68L, 107L, NA, 66L, NA, 65L, 48L, 52L, 43L, 47L, 46L, 44L, 41L, 54L, 28L, 50L, 40L, NA, 69L, NA, 75L, 109L, NA, 86L, 112L, 110L, 104L, 24L, 111L, 87L, NA, NA, 92L, 73L, 85L, 90L, 89L, NA, 83L, NA, 102L, NA, 108L, 88L, 91L, 93L, NA, 94L, 84L, NA, 106L, NA, 95L, 82L, 56L, 87L, 109L, 75L, 104L, 110L, 112L, 111L, 24L, 73L, 85L, 86L, 90L, 89L, 102L, 88L, 92L, 9L, 49L, 42L, 38L, 35L, 36L, 25L, NA, NA, 9L, 49L, 42L, NA, 36L, 38L, 25L, 53L, 79L, 78L, 103L, 77L, 80L, 114L, 97L, 113L, 76L, 96L, 81L, 116L, 99L, 117L, 115L, 98L, 101L, 100L), .Label = c('1008', '1011', '1013', '1014', '1015', '1016', '1027', '1028', '1030', '1032', '1051', '1052', '1083', '1093', '1095', '1096', '110', '1102', '111', '1117', '112', '113', '116', '117', '1219', '125', '1250', '1251', '126', '127', '128', '1291', '1292', '1293', '1298', '1299', '130', '1308', '135', '1376', '1377', '1383', '1408', '1409', '141', '1410', '1411', '1413', '1418', '1422', '1438', '1445', '1456', '1492', '2001', '2316', '262', '266', '269', '270', '2708', '2714', '2715', '272', '2728', '2734', '280', '283', '286', '290', '3501', '411', '412', '475', '5028', '5042', '5043', '5044', '5045', '5047', '5049', '5050', '5051', '5052', '5053', '5054', '5055', '5056', '5057', '5058', '5059', '5060', '5061', '5062', '5066', '5067', '5068', '5069', '5070', '5072', '5073', '5115', '5160', '5165', '655', '724', '885', '931', '942', '952', '955', '958', 'c118', 'c168', 'c203', 'c204', 'c266')), 20);`>`(argv[[1]],argv[[2]]); [1] TRUE FALSE FALSE TRUE TRUE TRUE TRUE FALSE FALSE TRUE TRUE FALSE [13] TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE TRUE [25] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE FALSE FALSE FALSE TRUE [37] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE FALSE FALSE FALSE TRUE [49] TRUE TRUE TRUE TRUE FALSE TRUE TRUE TRUE TRUE FALSE FALSE TRUE [61] TRUE FALSE TRUE TRUE TRUE TRUE TRUE TRUE FALSE TRUE FALSE TRUE [73] FALSE TRUE TRUE TRUE TRUE TRUE NA TRUE NA TRUE TRUE TRUE [85] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA TRUE NA [97] TRUE TRUE NA TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA NA [109] TRUE TRUE TRUE TRUE TRUE NA TRUE NA TRUE NA TRUE TRUE [121] TRUE TRUE NA TRUE TRUE NA TRUE NA TRUE TRUE TRUE TRUE [133] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [145] TRUE TRUE TRUE FALSE TRUE TRUE TRUE TRUE TRUE TRUE NA NA [157] FALSE TRUE TRUE NA TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [169] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [181] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators141# #argv <- list(structure(c(2, 2, 1, 1, 1, 0, 1, 2, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0), .Dim = 18L, .Dimnames = list(c('5', '8', '9', '12', '13', '16', '18', '23', '27', '28', '30', '31', '33', '34', '43', '45', '48', '161'))), 0);`>`(argv[[1]],argv[[2]]); 5 8 9 12 13 16 18 23 27 28 30 31 33 TRUE TRUE TRUE TRUE TRUE FALSE TRUE TRUE TRUE FALSE TRUE TRUE TRUE 34 43 45 48 161 TRUE TRUE TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators142# #argv <- list(structure(list(c(3L, 0L, 1L)), class = c('R_system_version', 'package_version', 'numeric_version')), structure('2.13.2', .Names = 'SweaveListingUtils'));`>`(argv[[1]],argv[[2]]); TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators143# #argv <- list(c(8262, 2889), 1e+05);`>`(argv[[1]],argv[[2]]); [1] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators144#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`>`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘>’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators145# #argv <- list(c(1, 2, 3, NA, -1, 0, 1, NA), 0);`>`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE NA FALSE FALSE TRUE NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators146# #argv <- list(10, 16L);`%%`(argv[[1]],argv[[2]]); [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators147#Ignored.OutputFormatting# #argv <- list(structure(0, .Tsp = c(1, 1, 1), class = 'ts'), 1e-05);`>`(argv[[1]],argv[[2]]); Time Series: Start = 1 End = 1 Frequency = 1 [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators148# #argv <- list(FALSE, FALSE);`>=`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators149#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`>=`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘>=’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators15# #argv <- list(structure(c(1976, 1976.08333333333, 1976.16666666667, 1976.25, 1976.33333333333, 1976.41666666667, 1976.5, 1976.58333333333, 1976.66666666667, 1976.75, 1976.83333333333, 1976.91666666667, 1977, 1977.08333333333, 1977.16666666667, 1977.25, 1977.33333333333, 1977.41666666667, 1977.5, 1977.58333333333, 1977.66666666667, 1977.75, 1977.83333333333, 1977.91666666667, 1978), .Tsp = c(1976, 1978, 12), class = 'ts'), 0.001);`+`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul Aug 1976 1976.001 1976.084 1976.168 1976.251 1976.334 1976.418 1976.501 1976.584 1977 1977.001 1977.084 1977.168 1977.251 1977.334 1977.418 1977.501 1977.584 1978 1978.001 Sep Oct Nov Dec 1976 1976.668 1976.751 1976.834 1976.918 1977 1977.668 1977.751 1977.834 1977.918 1978 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators150# #argv <- list(NULL, NULL);`>=`(argv[[1]],argv[[2]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators151# #argv <- list(structure(c(1L, 1L, 1L, 1L, 6L, 2L, 4L, 3L, 7L, 2L, 8L, 4L, 2L, 2L, 1L, 3L, 3L, 4L, 3L, 2L, 1L, 2L, 3L, 1L, 1L, 2L, 1L, 3L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 2L, 4L, 1L, 1L, 1L, 1L, 2L, 1L, 5L, 2L, 1L, 3L, 2L, 2L, 6L, 2L, 1L, 2L, 5L, 2L, 2L, 2L, 4L, 4L, 1L, 1L, 3L, 4L, 2L, 2L, 2L, 1L, 5L, 4L, 4L, 1L, 1L, 4L, 2L, 3L, 2L, 1L, 8L, 1L, 5L, 1L, 3L, 4L, 4L, 1L, 3L, 1L, 2L, 6L, 1L, 1L, 1L, 1L, 1L, 6L, 2L, 2L, 1L, 1L, 2L, 3L, 1L, 1L, 1L, 1L), .Dim = 124L, .Dimnames = structure(list(ne60 = c('96', '100', '102', '104', '105', '107', '108', '109', '110', '111', '112', '113', '115', '116', '117', '118', '119', '120', '121', '122', '124', '125', '126', '128', '129', '130', '131', '132', '133', '134', '135', '136', '137', '138', '139', '140', '141', '142', '143', '144', '145', '149', '157', '158', '168', '173', '174', '184', '199', '200', '202', '205', '207', '210', '214', '216', '221', '223', '224', '225', '226', '229', '230', '231', '233', '235', '237', '238', '240', '242', '243', '244', '245', '246', '247', '248', '249', '250', '251', '252', '254', '255', '256', '257', '258', '259', '260', '261', '262', '263', '264', '265', '266', '267', '268', '269', '270', '271', '272', '273', '274', '275', '276', '277', '278', '279', '280', '282', '283', '284', '285', '286', '287', '288', '289', '290', '291', '293', '294', '296', '300', '302', '304', '306')), .Names = 'ne60'), class = 'table'), 4);`>=`(argv[[1]],argv[[2]]); ne60 96 100 102 104 105 107 108 109 110 111 112 113 115 FALSE FALSE FALSE FALSE TRUE FALSE TRUE FALSE TRUE FALSE TRUE TRUE FALSE 116 117 118 119 120 121 122 124 125 126 128 129 130 FALSE FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 131 132 133 134 135 136 137 138 139 140 141 142 143 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 144 145 149 157 158 168 173 174 184 199 200 202 205 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 207 210 214 216 221 223 224 225 226 229 230 231 233 FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE 235 237 238 240 242 243 244 245 246 247 248 249 250 FALSE FALSE FALSE TRUE FALSE FALSE FALSE TRUE FALSE FALSE FALSE TRUE TRUE 251 252 254 255 256 257 258 259 260 261 262 263 264 FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE TRUE TRUE TRUE FALSE FALSE 265 266 267 268 269 270 271 272 273 274 275 276 277 TRUE FALSE FALSE FALSE FALSE TRUE FALSE TRUE FALSE FALSE TRUE TRUE FALSE 278 279 280 282 283 284 285 286 287 288 289 290 291 FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE FALSE 293 294 296 300 302 304 306 FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators152# #argv <- list(structure(3.00390625, base = 16, lens = 3L, .classes = c('R_system_version', 'package_version', 'numeric_version')), structure(2.9375, base = 16, lens = 3L, .classes = c('package_version', 'numeric_version')));`>=`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators153# #argv <- list(structure(list(2L), class = 'numeric_version'), '2');`>=`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators154# #argv <- list('3.0.1', '2.3.0');`>=`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators155# #argv <- list(c(30L, 30L, 60L, 60L, 60L, 60L, 60L, 60L, 30L, 30L, 60L, 60L, 60L, NA, 30L, 30L, 30L, 30L, 60L, 60L, 60L, 60L, 60L, 60L, 30L, 30L, 60L, 60L, 60L, 60L, 30L, 30L, 30L, NA, 30L, 30L, 60L, 60L, 30L, 30L, 30L, 30L, 30L, 60L, 60L, 30L, 30L, 30L, 30L, 60L, NA, 60L, NA, 30L, 60L, 60L, 30L, NA, 30L, 30L, 60L, NA, 30L, 30L, 30L, 30L, 30L, NA, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, 30L, NA, 18L, 18L, 30L, 30L, 30L, 30L, 18L, 18L, 30L, 30L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, NA, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, NA, 18L, 18L, 30L, 30L, 18L, 18L, 30L, 30L, 18L, 18L, 30L, 30L, 30L, 30L, NA, 18L, NA, 30L, 30L, NA, 18L, 18L, 30L, 30L, 7L, 7L, 18L, 18L, 30L, 30L, 30L, 30L, NA, 30L, 18L, 18L, 30L, 30L, 18L, 18L, 7L, 7L, 30L, 30L, 18L, 18L, NA, 30L, 7L, 7L, 7L, NA, 18L, 18L, 7L, 7L, 18L, NA, 30L, 30L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 18L, 18L), 30);`>=`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [13] TRUE NA TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [25] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA TRUE TRUE [37] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [49] TRUE TRUE NA TRUE NA TRUE TRUE TRUE TRUE NA TRUE TRUE [61] TRUE NA TRUE TRUE TRUE TRUE TRUE NA TRUE TRUE TRUE TRUE [73] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [85] NA FALSE FALSE TRUE TRUE TRUE TRUE FALSE FALSE TRUE TRUE TRUE [97] TRUE FALSE FALSE FALSE FALSE TRUE NA FALSE FALSE TRUE TRUE FALSE [109] FALSE FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE TRUE TRUE FALSE [121] FALSE FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE TRUE TRUE FALSE [133] FALSE FALSE FALSE TRUE TRUE FALSE FALSE TRUE TRUE FALSE FALSE FALSE [145] FALSE TRUE NA FALSE FALSE TRUE TRUE FALSE FALSE TRUE TRUE FALSE [157] FALSE TRUE TRUE TRUE TRUE NA FALSE NA TRUE TRUE NA FALSE [169] FALSE TRUE TRUE FALSE FALSE FALSE FALSE TRUE TRUE TRUE TRUE NA [181] TRUE FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE TRUE TRUE FALSE [193] FALSE NA TRUE FALSE FALSE FALSE NA FALSE FALSE FALSE FALSE FALSE [205] NA TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [217] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators156# #argv <- list(structure(c(0L, 1L, 1L, 3L), .Names = c('1', '2', '3', '4')), 0:3);`>=`(argv[[1]],argv[[2]]); 1 2 3 4 TRUE TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators157#Output.IgnoreWarningContext# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));`%%`(argv[[1]],argv[[2]]); [1] c0 <0 rows> (or 0-length row.names) Warning message: In Ops.factor(left, right) : ‘%%’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators158# #argv <- list(c(1.67451869393188, 0.668927329809365, 0.0791361259651342, 0.543924729050942, 0.00967644138302005, 0.464139419264689, 1.12629957234273), 1e-30);`>=`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators159# #argv <- list(c(2.00256647265648e-308, 2.22284878464869e-308, 2.22507363599982e-308, 2.2250738585072e-308, 2.22507408101459e-308, 2.22729893236571e-308, 2.44758124435792e-308, 1.61792382137608e+308, 1.79589544172745e+308, 1.797692955093e+308, 1.79769313486232e+308), 1);`>=`(argv[[1]],argv[[2]]); [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators16# #argv <- list(1.678932e-305, 0+0i);`+`(argv[[1]],argv[[2]]); [1] 1.678932e-305+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators160# #argv <- list(structure(c(1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1), .Dim = c(4L, 4L)), 0);`>=`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] TRUE TRUE TRUE TRUE [2,] TRUE TRUE TRUE TRUE [3,] TRUE TRUE TRUE TRUE [4,] TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators161# #argv <- list(structure(c(-0.626453810742332, 0.183643324222082, -0.835628612410047, 1.59528080213779, 0.329507771815361, -0.820468384118015, 0.487429052428485, 0.738324705129217, 0.575781351653492, -0.305388387156356, 1.51178116845085, 0.389843236411431, -0.621240580541804, -2.2146998871775, 1.12493091814311, -0.0449336090152309, -0.0161902630989461, 0.943836210685299, 0.821221195098089, 0.593901321217509, 0.918977371608218, 0.782136300731067, 0.0745649833651906, -1.98935169586337, 0.61982574789471, -0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861, -0.41499456329968, -0.394289953710349, -0.0593133967111857, 1.10002537198388, 0.763175748457544, -0.164523596253587, -0.253361680136508, 0.696963375404737, 0.556663198673657, -0.68875569454952, -0.70749515696212, 0.36458196213683, 0.768532924515416, -0.112346212150228, 0.881107726454215), .Label = structure(list(c(-2.21578569960353, -0.304302574730325), c(-0.689841506975551, -0.0550429271029698), c(-0.254447492562539, 0.3887574239854), c(-0.0548908530089361, 0.620911560320741), c(0.3887574239854, 0.882193538880246), c(0.695877562978706, 1.59636661456382)), class = 'shingleLevel'), class = 'shingle'), -0.254447492562539);`>=`(argv[[1]],argv[[2]]); [1] FALSE TRUE FALSE TRUE TRUE FALSE TRUE TRUE TRUE FALSE TRUE TRUE [13] FALSE FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE FALSE [25] TRUE TRUE TRUE FALSE FALSE TRUE TRUE TRUE TRUE TRUE FALSE FALSE [37] FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE FALSE FALSE TRUE TRUE [49] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators162# #argv <- list(c(1, 2, 3, 4, 5, 6, 7, NA, 9, 10, 11, 12), 1);`>=`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE NA TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators163# #argv <- list(structure(c(18000, 315550800, 631170000, 946702800, 1262322000, 1577854800), class = c('POSIXct', 'POSIXt'), tzone = ''), 28304640);`>=`(argv[[1]],argv[[2]]); [1] FALSE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators164# #argv <- list(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE));`!`(argv[[1]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [16] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [31] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [46] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [61] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [76] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [91] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators165# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')));`!`(argv[[1]]); 100 -1e-13 Inf -Inf NaN 3.14 NA TRUE TRUE TRUE TRUE FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators166# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE), .Dim = c(5L, 2L), .Dimnames = list(NULL, c('VAR1', 'VAR3'))));`!`(argv[[1]]); VAR1 VAR3 [1,] TRUE TRUE [2,] TRUE TRUE [3,] TRUE TRUE [4,] TRUE TRUE [5,] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators167# #argv <- list(structure(c(FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')), structure(c(TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')));`!=`(argv[[1]],argv[[2]]); 100 -1e-13 Inf -Inf NaN 3.14 NA TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators168#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`%%`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘%%’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators169# #argv <- list(structure(1:3, .Label = c('1', '2', NA), class = 'factor'), structure(1:3, .Label = c('1', '2', NA), class = 'factor'));`!=`(argv[[1]],argv[[2]]); [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators17# #argv <- list(4.40646552950873, structure(c(2.62980519617636, 3.871217247387, 4.50132920500077, 4.98499803067693, 5.10709299286893, 5.03983500591087, 4.63030887318817, 5.53509956067429, 5.33332559980012, 5.70084841033141, 4.71574513022187, 4.22037009914704, 3.98171648049174, 4.03049403236714, 4.12846177743637, 4.47709151156657, 5.3332151234887, 5.63317778205492, 5.92697054095118, 6.19581080008781, 6.04311655609605, 6.94831988490059, 6.18986185304067, 5.62147157665625, 4.74634441202163, 4.26914765102244, 5.32109627677161, 6.60533693281051, 5.67035960484307, 5.44401652160046, 3.65126501643718, 3.93293892861635, 3.04580339357603, 3.07640267537579, 2.77049106976243, 2.76443164640389, 3.33918351115387, 4.07927158424254, 4.04908494376122, 4.33034621462195, 3.99989475056739, 4.25702880430535), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42')));`+`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 8 7.036271 8.277683 8.907795 9.391464 9.513559 9.446301 9.036774 9.941565 9 10 11 12 13 14 15 16 9.739791 10.107314 9.122211 8.626836 8.388182 8.436960 8.534927 8.883557 17 18 19 20 21 22 23 24 9.739681 10.039643 10.333436 10.602276 10.449582 11.354785 10.596327 10.027937 25 26 27 28 29 30 31 32 9.152810 8.675613 9.727562 11.011802 10.076825 9.850482 8.057731 8.339404 33 34 35 36 37 38 39 40 7.452269 7.482868 7.176957 7.170897 7.745649 8.485737 8.455550 8.736812 41 42 8.406360 8.663494 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators170# #argv <- list(429204532L, 2L);`%%`(argv[[1]],argv[[2]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators171# #argv <- list(structure(c(1960.08433333333, 1960.16766666667, 1960.251, 1960.33433333333, 1960.41766666667, 1960.501, 1960.58433333333, 1960.66766666667, 1960.751, 1960.83433333333, 1960.91766666667, 1961.001, 1961.08433333333, 1961.16766666667, 1961.251, 1961.33433333333, 1961.41766666667, 1961.501, 1961.58433333333, 1961.66766666667), .Tsp = c(1960.08333333333, 1961.66666666667, 12), class = 'ts'), 1);`%%`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun 1960 0.08433333 0.16766667 0.25100000 0.33433333 0.41766667 1961 0.00100000 0.08433333 0.16766667 0.25100000 0.33433333 0.41766667 Jul Aug Sep Oct Nov Dec 1960 0.50100000 0.58433333 0.66766667 0.75100000 0.83433333 0.91766667 1961 0.50100000 0.58433333 0.66766667 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators172# #argv <- list(c(-1, 0, 0, 0, 0, 0, 1, 1, 1), 2L);`%%`(argv[[1]],argv[[2]]); [1] 1 0 0 0 0 0 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators173# #argv <- list(-65205377L, 1073741824L);`%%`(argv[[1]],argv[[2]]); [1] 1008536447 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators174# #argv <- list(160L, 16);`%%`(argv[[1]],argv[[2]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators175# #argv <- list(structure(c(52L, 52L, 1L, 1L), .Names = c('y', 'x', 'Ta', 'Tb')), 52L);`%%`(argv[[1]],argv[[2]]); y x Ta Tb 0 0 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators176# #argv <- list(1, 2);`%%`(argv[[1]],argv[[2]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators177# #argv <- list(c(0, 1, 1, 2, 2, 3, 3, 4, 4), 2L);`%%`(argv[[1]],argv[[2]]); [1] 0 1 1 0 0 1 1 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators178# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 0, 1, 0), .Dim = c(12L, 4L), .Dimnames = list(c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), c('(Intercept)', 'M.userY', 'TempLow', 'M.userY:TempLow')), assign = 0:3, contrasts = structure(list(M.user = 'contr.treatment', Temp = 'contr.treatment'), .Names = c('M.user', 'Temp'))), c(0.262364229584951, -0.851832547542732, 0.0441056253109867, 0.444266588736502));`%*%`(argv[[1]],argv[[2]]); [,1] 1 0.3064699 3 0.2623642 5 -0.1010961 7 -0.5894683 9 0.3064699 11 0.2623642 13 -0.1010961 15 -0.5894683 17 0.3064699 19 0.2623642 21 -0.1010961 23 -0.5894683 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators179# #argv <- list(structure(c(1976.001, 1976.08433333333, 1976.16766666667, 1976.251, 1976.33433333333, 1976.41766666667, 1976.501, 1976.58433333333, 1976.66766666667, 1976.751, 1976.83433333333, 1976.91766666667, 1977.001, 1977.08433333333, 1977.16766666667, 1977.251, 1977.33433333333, 1977.41766666667, 1977.501, 1977.58433333333, 1977.66766666667, 1977.751, 1977.83433333333, 1977.91766666667, 1978.001), .Tsp = c(1976, 1978, 12), class = 'ts'), 1);`%%`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun 1976 0.00100000 0.08433333 0.16766667 0.25100000 0.33433333 0.41766667 1977 0.00100000 0.08433333 0.16766667 0.25100000 0.33433333 0.41766667 1978 0.00100000 Jul Aug Sep Oct Nov Dec 1976 0.50100000 0.58433333 0.66766667 0.75100000 0.83433333 0.91766667 1977 0.50100000 0.58433333 0.66766667 0.75100000 0.83433333 0.91766667 1978 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators18# #argv <- list(100.35609040323, c(16.9869197055322, 32.9569269674228, 63.9409059420178, 124.054025326065, 240.681625836759, 466.954980809107, 905.955962962971, 1757.67737910411, 3410.13238536472, 6616.11910351861, 12836.1679387595, 24903.9058659644, 48316.9533415093, 93741.4393055559, 181871.099797343, 352854.587965931, 684585.733452663, 1328189.12501195, 2576866.95120412, 4999471.20418434, 9699651.86203691, 18818639.4925072, 36510711.6612103, 70835729.9973146, 137430918.652385, 266634612.255063, 517307292.635014, 1003646273.64047, 1947209824.67014, 3777851022.69026, 7329543107.69234, 14220307218.2724, 27589323701.4766, 53527027976.3571, 103849690372.38, 201482477136.65, 390903318513.094, 758405428581.828, 1471409340525, 2854733584163.2, 5538570139592.47, 10745576876721.9, 20847875806089.6, 40447705191861.9, 78474031143733.8, 152250258320878, 295386140114522, 573089154225693, 1111870646888807, 2157179779616058, 4185221198711724, 8119896472079771, 15753699885107074, 30564313341110788, 59298911165416064, 115047926192872144, 223208572655883520, 433054888999496256, 840185189372140416, 1630073162483360512, 3162562907154039296, 6135800755390145536, 11904285231665293312, 23095927088628809728, 44809229424741679104, 86935979401654583296, 1.68667585038894e+20, 3.27237979472409e+20, 6.34886040400066e+20, 1.23176498322335e+21, 2.3897910449238e+21, 4.63651858608037e+21, 8.99547458123233e+21, 1.74524401098118e+22, 3.38600996574481e+22, 6.56931833943232e+22, 1.2745368112143e+23, 2.47277418935474e+23, 4.79751713543167e+23, 9.30783359186e+23, 1.80584589336672e+24, 3.50358583273485e+24, 6.79743145992125e+24, 1.31879384887967e+25, 2.55863884188836e+25, 4.96410620111801e+25, 9.63103896202531e+25, 1.8685521165353e+26, 3.62524440610747e+26, 7.03346558424191e+26, 1.36458766866515e+27, 2.64748506006045e+27, 5.13647990832267e+27, 9.96546732089944e+27, 1.93343575165167e+28, 3.75112745382766e+28, 7.27769576146466e+28, 1.41197163381895e+29, 2.73941637580644e+29, 5.31483912303488e+29));`+`(argv[[1]],argv[[2]]); [1] 1.173430e+02 1.333130e+02 1.642970e+02 2.244101e+02 3.410377e+02 [6] 5.673111e+02 1.006312e+03 1.858033e+03 3.510488e+03 6.716475e+03 [11] 1.293652e+04 2.500426e+04 4.841731e+04 9.384180e+04 1.819715e+05 [16] 3.529549e+05 6.846861e+05 1.328289e+06 2.576967e+06 4.999572e+06 [21] 9.699752e+06 1.881874e+07 3.651081e+07 7.083583e+07 1.374310e+08 [26] 2.666347e+08 5.173074e+08 1.003646e+09 1.947210e+09 3.777851e+09 [31] 7.329543e+09 1.422031e+10 2.758932e+10 5.352703e+10 1.038497e+11 [36] 2.014825e+11 3.909033e+11 7.584054e+11 1.471409e+12 2.854734e+12 [41] 5.538570e+12 1.074558e+13 2.084788e+13 4.044771e+13 7.847403e+13 [46] 1.522503e+14 2.953861e+14 5.730892e+14 1.111871e+15 2.157180e+15 [51] 4.185221e+15 8.119896e+15 1.575370e+16 3.056431e+16 5.929891e+16 [56] 1.150479e+17 2.232086e+17 4.330549e+17 8.401852e+17 1.630073e+18 [61] 3.162563e+18 6.135801e+18 1.190429e+19 2.309593e+19 4.480923e+19 [66] 8.693598e+19 1.686676e+20 3.272380e+20 6.348860e+20 1.231765e+21 [71] 2.389791e+21 4.636519e+21 8.995475e+21 1.745244e+22 3.386010e+22 [76] 6.569318e+22 1.274537e+23 2.472774e+23 4.797517e+23 9.307834e+23 [81] 1.805846e+24 3.503586e+24 6.797431e+24 1.318794e+25 2.558639e+25 [86] 4.964106e+25 9.631039e+25 1.868552e+26 3.625244e+26 7.033466e+26 [91] 1.364588e+27 2.647485e+27 5.136480e+27 9.965467e+27 1.933436e+28 [96] 3.751127e+28 7.277696e+28 1.411972e+29 2.739416e+29 5.314839e+29 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators180# #argv <- list(structure(c(1, 0, NA, 1), .Dim = c(2L, 2L)), structure(c(1, 2, 0, 1, 0, 0), .Dim = 2:3));`%*%`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] NA NA NA [2,] 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators181# #argv <- list(0, NA_real_);`%*%`(argv[[1]],argv[[2]]); [,1] [1,] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators182# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0.35, 0.64, 0.12, 1.66, 1.52, 0.23, -1.99, 0.42, 1.86, -0.02, -1.64, -0.46, -0.1, 1.25, 0.37, 0.31, 1.11, 1.65, 0.33, 0.89, -0.25, -0.87, -0.22, 0.71, -2.26, 0.77, -0.05, 0.32, -0.64, 0.39, 0.19, -1.62, 0.37, 0.02, 0.97, -2.62, 0.15, 1.55, -1.41, -2.35, -0.43, 0.57, -0.66, -0.08, 0.02, 0.24, -0.33, -0.03, -1.13, 0.32, 1.55, 2.13, -0.1, -0.32, -0.67, 1.44, 0.04, -1.1, -0.95, -0.19, -0.68, -0.43, -0.84, 0.69, -0.65, 0.71, 0.19, 0.45, 0.45, -1.19, 1.3, 0.14, -0.36, -0.5, -0.47, -1.31, -1.02, 1.17, 1.51, -0.33, -0.01, -0.59, -0.28, -0.18, -1.07, 0.66, -0.71, 1.88, -0.14, -0.19, 0.84, 0.44, 1.33, -0.2, -0.45, 1.46, 1, -1.02, 0.68, 0.84), .Dim = c(100L, 2L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100'), c('(Intercept)', 'x')), assign = 0:1), c(1.15937252188199, 0.442508987631707));`%*%`(argv[[1]],argv[[2]]); [,1] 1 1.314251e+00 2 1.442578e+00 3 1.212474e+00 4 1.893937e+00 5 1.831986e+00 6 1.261150e+00 7 2.787796e-01 8 1.345226e+00 9 1.982439e+00 10 1.150522e+00 11 4.336578e-01 12 9.558184e-01 13 1.115122e+00 14 1.712509e+00 15 1.323101e+00 16 1.296550e+00 17 1.650557e+00 18 1.889512e+00 19 1.305400e+00 20 1.553206e+00 21 1.048745e+00 22 7.743897e-01 23 1.062021e+00 24 1.473554e+00 25 1.593022e-01 26 1.500104e+00 27 1.137247e+00 28 1.300975e+00 29 8.761668e-01 30 1.331951e+00 31 1.243449e+00 32 4.425080e-01 33 1.323101e+00 34 1.168223e+00 35 1.588606e+00 36 -1.025713e-06 37 1.225749e+00 38 1.845261e+00 39 5.354348e-01 40 1.194764e-01 41 9.690937e-01 42 1.411603e+00 43 8.673166e-01 44 1.123972e+00 45 1.168223e+00 46 1.265575e+00 47 1.013345e+00 48 1.146097e+00 49 6.593374e-01 50 1.300975e+00 51 1.845261e+00 52 2.101917e+00 53 1.115122e+00 54 1.017770e+00 55 8.628915e-01 56 1.796585e+00 57 1.177073e+00 58 6.726126e-01 59 7.389890e-01 60 1.075296e+00 61 8.584664e-01 62 9.690937e-01 63 7.876650e-01 64 1.464704e+00 65 8.717417e-01 66 1.473554e+00 67 1.243449e+00 68 1.358502e+00 69 1.358502e+00 70 6.327868e-01 71 1.734634e+00 72 1.221324e+00 73 1.000069e+00 74 9.381180e-01 75 9.513933e-01 76 5.796857e-01 77 7.080134e-01 78 1.677108e+00 79 1.827561e+00 80 1.013345e+00 81 1.154947e+00 82 8.982922e-01 83 1.035470e+00 84 1.079721e+00 85 6.858879e-01 86 1.451428e+00 87 8.451911e-01 88 1.991289e+00 89 1.097421e+00 90 1.075296e+00 91 1.531080e+00 92 1.354076e+00 93 1.747909e+00 94 1.070871e+00 95 9.602435e-01 96 1.805436e+00 97 1.601882e+00 98 7.080134e-01 99 1.460279e+00 100 1.531080e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators183# #argv <- list(c(-3, -2, -1, 0, 1, 2, 3, 4, 5), structure(c(-3, -2, -1, 0, 1, 2, 3, 4, 5), .Dim = c(1L, 9L)));`%*%`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [1,] 9 6 3 0 -3 -6 -9 -12 -15 [2,] 6 4 2 0 -2 -4 -6 -8 -10 [3,] 3 2 1 0 -1 -2 -3 -4 -5 [4,] 0 0 0 0 0 0 0 0 0 [5,] -3 -2 -1 0 1 2 3 4 5 [6,] -6 -4 -2 0 2 4 6 8 10 [7,] -9 -6 -3 0 3 6 9 12 15 [8,] -12 -8 -4 0 4 8 12 16 20 [9,] -15 -10 -5 0 5 10 15 20 25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators184# #argv <- list(c(4, 8, 12, 16, 20, 24, 28, 32, 36, 40, 44, 48, 4000, 8000, 12000, 16000, 20000, 24000, 28000, 32000, 36000, 40000, 44000, 48000), structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24), .Dim = c(1L, 24L)));`%*%`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] 4 8 12 16 20 24 28 32 36 40 [2,] 8 16 24 32 40 48 56 64 72 80 [3,] 12 24 36 48 60 72 84 96 108 120 [4,] 16 32 48 64 80 96 112 128 144 160 [5,] 20 40 60 80 100 120 140 160 180 200 [6,] 24 48 72 96 120 144 168 192 216 240 [7,] 28 56 84 112 140 168 196 224 252 280 [8,] 32 64 96 128 160 192 224 256 288 320 [9,] 36 72 108 144 180 216 252 288 324 360 [10,] 40 80 120 160 200 240 280 320 360 400 [11,] 44 88 132 176 220 264 308 352 396 440 [12,] 48 96 144 192 240 288 336 384 432 480 [13,] 4000 8000 12000 16000 20000 24000 28000 32000 36000 40000 [14,] 8000 16000 24000 32000 40000 48000 56000 64000 72000 80000 [15,] 12000 24000 36000 48000 60000 72000 84000 96000 108000 120000 [16,] 16000 32000 48000 64000 80000 96000 112000 128000 144000 160000 [17,] 20000 40000 60000 80000 100000 120000 140000 160000 180000 200000 [18,] 24000 48000 72000 96000 120000 144000 168000 192000 216000 240000 [19,] 28000 56000 84000 112000 140000 168000 196000 224000 252000 280000 [20,] 32000 64000 96000 128000 160000 192000 224000 256000 288000 320000 [21,] 36000 72000 108000 144000 180000 216000 252000 288000 324000 360000 [22,] 40000 80000 120000 160000 200000 240000 280000 320000 360000 400000 [23,] 44000 88000 132000 176000 220000 264000 308000 352000 396000 440000 [24,] 48000 96000 144000 192000 240000 288000 336000 384000 432000 480000 [,11] [,12] [,13] [,14] [,15] [,16] [,17] [,18] [,19] [,20] [1,] 44 48 52 56 60 64 68 72 76 80 [2,] 88 96 104 112 120 128 136 144 152 160 [3,] 132 144 156 168 180 192 204 216 228 240 [4,] 176 192 208 224 240 256 272 288 304 320 [5,] 220 240 260 280 300 320 340 360 380 400 [6,] 264 288 312 336 360 384 408 432 456 480 [7,] 308 336 364 392 420 448 476 504 532 560 [8,] 352 384 416 448 480 512 544 576 608 640 [9,] 396 432 468 504 540 576 612 648 684 720 [10,] 440 480 520 560 600 640 680 720 760 800 [11,] 484 528 572 616 660 704 748 792 836 880 [12,] 528 576 624 672 720 768 816 864 912 960 [13,] 44000 48000 52000 56000 60000 64000 68000 72000 76000 80000 [14,] 88000 96000 104000 112000 120000 128000 136000 144000 152000 160000 [15,] 132000 144000 156000 168000 180000 192000 204000 216000 228000 240000 [16,] 176000 192000 208000 224000 240000 256000 272000 288000 304000 320000 [17,] 220000 240000 260000 280000 300000 320000 340000 360000 380000 400000 [18,] 264000 288000 312000 336000 360000 384000 408000 432000 456000 480000 [19,] 308000 336000 364000 392000 420000 448000 476000 504000 532000 560000 [20,] 352000 384000 416000 448000 480000 512000 544000 576000 608000 640000 [21,] 396000 432000 468000 504000 540000 576000 612000 648000 684000 720000 [22,] 440000 480000 520000 560000 600000 640000 680000 720000 760000 800000 [23,] 484000 528000 572000 616000 660000 704000 748000 792000 836000 880000 [24,] 528000 576000 624000 672000 720000 768000 816000 864000 912000 960000 [,21] [,22] [,23] [,24] [1,] 84 88 92 96 [2,] 168 176 184 192 [3,] 252 264 276 288 [4,] 336 352 368 384 [5,] 420 440 460 480 [6,] 504 528 552 576 [7,] 588 616 644 672 [8,] 672 704 736 768 [9,] 756 792 828 864 [10,] 840 880 920 960 [11,] 924 968 1012 1056 [12,] 1008 1056 1104 1152 [13,] 84000 88000 92000 96000 [14,] 168000 176000 184000 192000 [15,] 252000 264000 276000 288000 [16,] 336000 352000 368000 384000 [17,] 420000 440000 460000 480000 [18,] 504000 528000 552000 576000 [19,] 588000 616000 644000 672000 [20,] 672000 704000 736000 768000 [21,] 756000 792000 828000 864000 [22,] 840000 880000 920000 960000 [23,] 924000 968000 1012000 1056000 [24,] 1008000 1056000 1104000 1152000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators185#Ignored.ImplementationError# #argv <- list(structure(numeric(0), .Dim = c(10L, 0L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10'), NULL)), structure(numeric(0), .Names = character(0)));`%*%`(argv[[1]],argv[[2]]); [,1] 1 0 2 0 3 0 4 0 5 0 6 0 7 0 8 0 9 0 10 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators186# #argv <- list(structure(c(0.553622032575332, 0, 0, 0, 0, 1.83583330034692, 0, 0, 0, 0, 0.540309168173204, 0, 0, 0, 0, 0.347171956892285), .Dim = c(4L, 4L)), structure(c(3.26267089696047, -0.712693854979374, 2.39769041729195, 5.15111718577956, -0.712693854979374, 0.296710908544859, -1.00753262176762, -0.987904999293151, 2.39769041729195, -1.00753262176762, 3.42543180838832, 3.32535677689614, 5.15111718577956, -0.987904999293151, 3.32535677689614, 8.29680198510459), .Dim = c(4L, 4L), .Dimnames = list(c('A', 'B', 'C', 'D'), c('A', 'B', 'C', 'D'))));`%*%`(argv[[1]],argv[[2]]); A B C D [1,] 1.806286 -0.3945630 1.327414 2.851772 [2,] -1.308387 0.5447118 -1.849662 -1.813629 [3,] 1.295494 -0.5443791 1.850792 1.796721 [4,] 1.788323 -0.3429729 1.154471 2.880417 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators187# #argv <- list(243L, 16);`%/%`(argv[[1]],argv[[2]]); [1] 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators188# #argv <- list(4L, 2L);`%/%`(argv[[1]],argv[[2]]); [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators189# #argv <- list(5, 3);`%/%`(argv[[1]],argv[[2]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators19# #argv <- list(structure(c(798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988, 798.368155587988), .Tsp = c(1971, 2000, 1), class = 'ts'), structure(c(96.1627886140128, 99.5328179233045, 102.792420797859, 105.951789523417, 109.019638748919, 112.00348906474, 114.909884224142, 117.744560053261, 120.512577567101, 123.218429147578, 125.866124161059, 128.459258681722, 131.001072784874, 133.494498015905, 135.942197018618, 138.34659685001, 140.70991716901, 143.034194231449, 145.321301429523, 147.572966965162, 149.790789131479, 151.976249586445, 154.130724932091, 156.255496856342, 158.351761049736, 160.420635073182, 162.463165323754, 164.480333221768, 166.473060722972, 168.442215243699), .Tsp = c(1971, 2000, 1), class = 'ts'));`+`(argv[[1]],argv[[2]]); Time Series: Start = 1971 End = 2000 Frequency = 1 [1] 894.5309 897.9010 901.1606 904.3199 907.3878 910.3716 913.2780 916.1127 [9] 918.8807 921.5866 924.2343 926.8274 929.3692 931.8627 934.3104 936.7148 [17] 939.0781 941.4023 943.6895 945.9411 948.1589 950.3444 952.4989 954.6237 [25] 956.7199 958.7888 960.8313 962.8485 964.8412 966.8104 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators190# #argv <- list(1:2, 4L);`%%`(argv[[1]],argv[[2]]); [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators191# #argv <- list(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE));`&`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators192# #argv <- list(structure(c(TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, NA), .Dim = c(5L, 2L), .Dimnames = list(NULL, c('VAR1', 'VAR3'))), structure(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE), .Dim = c(5L, 2L), .Dimnames = list(NULL, c('VAR1', 'VAR3'))));`&`(argv[[1]],argv[[2]]); VAR1 VAR3 [1,] TRUE TRUE [2,] FALSE TRUE [3,] FALSE TRUE [4,] FALSE TRUE [5,] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators193# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')), structure(c(TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')));`&`(argv[[1]],argv[[2]]); 100 -1e-13 Inf -Inf NaN 3.14 NA FALSE FALSE FALSE FALSE FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators195# #argv <- list(7);`(`(argv[[1]]); [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators196# #argv <- list(structure(c(2L, 1L, 3L), .Label = c('NA', 'a', 'b'), class = 'factor'));`(`(argv[[1]]); [1] a NA b Levels: NA a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators197# #argv <- list(structure(list(), .Names = character(0), row.names = integer(0), class = 'data.frame'));`(`(argv[[1]]); data frame with 0 columns and 0 rows ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators198# #argv <- list(structure(c(0.500999999999976, 0.584333333333234, 0.667666666666719, 0.750999999999976, 0.834333333333234, 0.917666666666719, 0.000999999999976353, 0.0843333333332339, 0.167666666666719, 0.250999999999976), .Tsp = c(1920.5, 1921.25, 12), class = 'ts'));`(`(argv[[1]]); Jan Feb Mar Apr May Jun Jul Aug 1920 0.50100000 0.58433333 1921 0.00100000 0.08433333 0.16766667 0.25100000 Sep Oct Nov Dec 1920 0.66766667 0.75100000 0.83433333 0.91766667 1921 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators2# #argv <- list(c(NA, '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'), c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', NA));`!=`(argv[[1]],argv[[2]]); [1] NA FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators20# #argv <- list(structure(978350400, class = c('POSIXct', 'POSIXt'), tzone = 'GMT'), c(1605796.39468342, 2250605.34500331, 3464617.14155227, 5492840.71388841, 1219772.31891453, 5433460.81468463, 5713396.02452517, 3996505.04896045, 3804881.73750043, 373683.36378783, 1245734.22899097, 1067815.23929536, 4155114.17658627, 2323059.28775668, 4656000.90815127, 3010085.0161314, 4340156.73798323, 5999048.06153476, 2298452.76521891, 4701988.69854212, 5653097.23772854, 1283037.96871752, 3941322.93728739, 759357.220374048, 1616150.60446411, 2335218.03170443, 80984.7349449992, 2312682.3643595, 5259890.2349174, 2058430.73196709, 2915620.53836882, 3626174.11217093, 2984937.82503158, 1126244.053334, 5003953.83093506, 4042886.83258742, 4803562.677674, 652843.049369752, 4377003.8016513, 2487387.75048405, 4965083.1868127, 3913420.05222291, 4735177.34632641, 3344763.6128068, 3203744.02103573, 4774026.48925781, 141107.11171478, 2886287.43334115, 4429033.49147737, 4189640.45360684, 2888643.47467571, 5208594.91588175, 2649611.30449176, 1480533.93148631, 427466.877132654, 601571.336723864, 1912811.28504127, 3136700.02379268, 4003806.70217425, 2460508.97211581, 5521073.589921, 1775713.19845319, 2776429.51241881, 2010322.98948616, 3936464.58484232, 1560485.48977822, 2894241.66157097, 4634646.93606645, 509525.338098407, 5293943.40406358, 2050713.12808245, 5076935.23793668, 2096741.74243212, 2018670.78146338, 2880972.33020514, 5396015.5351907, 5227525.11837333, 2358656.75892681, 4701235.58655381, 5809817.647174, 2628820.56391239, 4309288.77686709, 2419165.9430936, 1967729.81455922, 4578863.07127029, 1225882.75911659, 4300861.15349829, 735992.738373578, 1484714.53242749, 866704.886756837, 1449278.70250493, 356435.113750398, 3884559.38760191, 5299676.19835585, 4710875.96918643, 4822123.77896905, 2753499.89549071, 2480188.52821738, 4904143.22827756, 3658636.53959334));`+`(argv[[1]],argv[[2]]); [1] "2001-01-20 02:03:16 GMT" "2001-01-27 13:10:05 GMT" [3] "2001-02-10 14:23:37 GMT" "2001-03-06 01:47:20 GMT" [5] "2001-01-15 14:49:32 GMT" "2001-03-05 09:17:40 GMT" [7] "2001-03-08 15:03:16 GMT" "2001-02-16 18:08:25 GMT" [9] "2001-02-14 12:54:41 GMT" "2001-01-05 19:48:03 GMT" [11] "2001-01-15 22:02:14 GMT" "2001-01-13 20:36:55 GMT" [13] "2001-02-18 14:11:54 GMT" "2001-01-28 09:17:39 GMT" [15] "2001-02-24 09:20:00 GMT" "2001-02-05 08:08:05 GMT" [17] "2001-02-20 17:35:56 GMT" "2001-03-11 22:24:08 GMT" [19] "2001-01-28 02:27:32 GMT" "2001-02-24 22:06:28 GMT" [21] "2001-03-07 22:18:17 GMT" "2001-01-16 08:23:57 GMT" [23] "2001-02-16 02:48:42 GMT" "2001-01-10 06:55:57 GMT" [25] "2001-01-20 04:55:50 GMT" "2001-01-28 12:40:18 GMT" [27] "2001-01-02 10:29:44 GMT" "2001-01-28 06:24:42 GMT" [29] "2001-03-03 09:04:50 GMT" "2001-01-25 07:47:10 GMT" [31] "2001-02-04 05:53:40 GMT" "2001-02-12 11:16:14 GMT" [33] "2001-02-05 01:08:57 GMT" "2001-01-14 12:50:44 GMT" [35] "2001-02-28 09:59:13 GMT" "2001-02-17 07:01:26 GMT" [37] "2001-02-26 02:19:22 GMT" "2001-01-09 01:20:43 GMT" [39] "2001-02-21 03:50:03 GMT" "2001-01-30 06:56:27 GMT" [41] "2001-02-27 23:11:23 GMT" "2001-02-15 19:03:40 GMT" [43] "2001-02-25 07:19:37 GMT" "2001-02-09 05:06:03 GMT" [45] "2001-02-07 13:55:44 GMT" "2001-02-25 18:07:06 GMT" [47] "2001-01-03 03:11:47 GMT" "2001-02-03 21:44:47 GMT" [49] "2001-02-21 18:17:13 GMT" "2001-02-18 23:47:20 GMT" [51] "2001-02-03 22:24:03 GMT" "2001-03-02 18:49:54 GMT" [53] "2001-02-01 04:00:11 GMT" "2001-01-18 15:15:33 GMT" [55] "2001-01-06 10:44:26 GMT" "2001-01-08 11:06:11 GMT" [57] "2001-01-23 15:20:11 GMT" "2001-02-06 19:18:20 GMT" [59] "2001-02-16 20:10:06 GMT" "2001-01-29 23:28:28 GMT" [61] "2001-03-06 09:37:53 GMT" "2001-01-22 01:15:13 GMT" [63] "2001-02-02 15:13:49 GMT" "2001-01-24 18:25:22 GMT" [65] "2001-02-16 01:27:44 GMT" "2001-01-19 13:28:05 GMT" [67] "2001-02-03 23:57:21 GMT" "2001-02-24 03:24:06 GMT" [69] "2001-01-07 09:32:05 GMT" "2001-03-03 18:32:23 GMT" [71] "2001-01-25 05:38:33 GMT" "2001-03-01 06:15:35 GMT" [73] "2001-01-25 18:25:41 GMT" "2001-01-24 20:44:30 GMT" [75] "2001-02-03 20:16:12 GMT" "2001-03-04 22:53:35 GMT" [77] "2001-03-03 00:05:25 GMT" "2001-01-28 19:10:56 GMT" [79] "2001-02-24 21:53:55 GMT" "2001-03-09 17:50:17 GMT" [81] "2001-01-31 22:13:40 GMT" "2001-02-20 09:01:28 GMT" [83] "2001-01-29 11:59:25 GMT" "2001-01-24 06:35:29 GMT" [85] "2001-02-23 11:54:23 GMT" "2001-01-15 16:31:22 GMT" [87] "2001-02-20 06:41:01 GMT" "2001-01-10 00:26:32 GMT" [89] "2001-01-18 16:25:14 GMT" "2001-01-11 12:45:04 GMT" [91] "2001-01-18 06:34:38 GMT" "2001-01-05 15:00:35 GMT" [93] "2001-02-15 11:02:39 GMT" "2001-03-03 20:07:56 GMT" [95] "2001-02-25 00:34:35 GMT" "2001-02-26 07:28:43 GMT" [97] "2001-02-02 08:51:39 GMT" "2001-01-30 04:56:28 GMT" [99] "2001-02-27 06:15:43 GMT" "2001-02-12 20:17:16 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators200# #argv <- list(structure(list(coefficients = structure(NA_real_, .Names = 'x'), residuals = structure(c(-0.667819876370237, 0.170711734013213, 0.552921941721332, -0.253162069270378, -0.00786394222146348, 0.0246733498130512, 0.0730305465518564, -1.36919169254062, 0.0881443844426084, -0.0834190388782434), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), effects = structure(c(-0.667819876370237, 0.170711734013213, 0.552921941721332, -0.253162069270378, -0.00786394222146348, 0.0246733498130512, 0.0730305465518564, -1.36919169254062, 0.0881443844426084, -0.0834190388782434), .Names = c('', '', '', '', '', '', '', '', '', '')), rank = 0L, fitted.values = structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), assign = 1L, qr = structure(list(qr = structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Dim = c(10L, 1L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10'), 'x'), assign = 1L), qraux = 0, pivot = 1L, tol = 1e-07, rank = 0L), .Names = c('qr', 'qraux', 'pivot', 'tol', 'rank'), class = 'qr'), df.residual = 10L, xlevels = structure(list(), .Names = character(0)), call = quote(lm(formula = y ~ x + 0)), terms = quote(y ~ x + 0), model = structure(list(y = c(-0.667819876370237, 0.170711734013213, 0.552921941721332, -0.253162069270378, -0.00786394222146348, 0.0246733498130512, 0.0730305465518564, -1.36919169254062, 0.0881443844426084, -0.0834190388782434), x = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0)), .Names = c('y', 'x'), terms = quote(y ~ x + 0), row.names = c(NA, 10L), class = 'data.frame')), .Names = c('coefficients', 'residuals', 'effects', 'rank', 'fitted.values', 'assign', 'qr', 'df.residual', 'xlevels', 'call', 'terms', 'model'), class = 'lm'));`(`(argv[[1]]); Call: lm(formula = y ~ x + 0) Coefficients: x NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators201# #argv <- list(3e+09, 30000L);`%%`(argv[[1]],argv[[2]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators202# #argv <- list(structure(list(A = c(1, NA, 1), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA_integer_, NA_integer_, NA_integer_), E = c(FALSE, NA, TRUE), F = c('abc', NA, 'def')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')));`(`(argv[[1]]); A B C D E F 1 1 1.1 1.1+0i NA FALSE abc 2 NA NA NA NA NA 3 1 2.0 3.0+0i NA TRUE def ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators203# #argv <- list(structure(1395082079.73982, class = c('POSIXct', 'POSIXt')));`(`(argv[[1]]); [1] "2014-03-17 18:47:59 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators204# #argv <- list(quote(y ~ a + b:c + d + e + e:d));`(`(argv[[1]]); y ~ a + b:c + d + e + e:d ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators205# #argv <- list(structure(c(-Inf, -Inf, -Inf, -Inf, 0, 0, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, -Inf, -Inf, -Inf, 0, 0, 1, 1, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.5, 1, Inf, Inf, Inf, -Inf, -Inf, -Inf, -Inf, 0, 1, 1, 1, Inf, -Inf, -Inf, -Inf, -Inf, 0, 0.5, 1, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.5, 1, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.6, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.4, 0.8, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.533333333333334, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.525, Inf, Inf, Inf, Inf, -Inf, -Inf, 0, 0, 1, 2, Inf, Inf, Inf, -Inf, -Inf, 0, 0.5, 1, 2, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 1, 2, 2, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.8, 1.6, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.3, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.4, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.2, 1.9, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.499999999999999, 1.33333333333333, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.325, Inf, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 2, 3, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 2, 3, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2, 3, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.6, 2.7, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2.1, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2.2, Inf, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 2, 3, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2.13333333333333, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2.125, Inf, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 3, 4, Inf, Inf, Inf, -Inf, -Inf, 0, 1.5, 3, 4, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 2, 4, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2.4, 3.8, Inf, Inf, Inf, -Inf, -Inf, 0.100000000000001, 1.5, 2.9, Inf, Inf, Inf, Inf, -Inf, -Inf, 0, 1.5, 3, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.2, 1.5, 2.8, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.0666666666666664, 1.5, 2.93333333333333, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.0750000000000002, 1.5, 2.925, Inf, Inf, Inf, Inf, -Inf, -Inf, 0, 2, 4, 5, Inf, Inf, Inf, -Inf, -Inf, 0, 2, 4, 5, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 3, 5, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1.5, 3.2, 4.9, Inf, Inf, Inf, -Inf, -Inf, 0.300000000000001, 2, 3.7, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.2, 2, 3.8, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.4, 2, 3.6, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.266666666666667, 2, 3.73333333333333, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.275, 2, 3.725, Inf, Inf, Inf, Inf), .Dim = c(9L, 9L, 6L), .Dimnames = list(c('20%', '30%', '40%', '50%', '60%', '70%', '80%', '90%', '100%'), NULL, NULL)));`(`(argv[[1]]); , , 1 [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] 20% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 30% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 40% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 50% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 60% 0 0 -Inf -Inf -Inf -Inf -Inf -Inf -Inf 70% 0 0 -Inf -Inf -Inf 0 -Inf -Inf -Inf 80% 0 0 0 -Inf 0 0 -Inf 0 0 90% 0 0 0 -Inf 0 0 -Inf 0 0 100% 0 0 0 0 0 0 0 0 0 , , 2 [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] 20% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 30% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 40% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 50% 0 0.0 -Inf -Inf 0.0 0.0 0.0 0.0000000 0.000 60% 0 0.5 0 0.0 0.5 0.6 0.4 0.5333333 0.525 70% 1 1.0 1 0.5 1.0 Inf 0.8 Inf Inf 80% 1 Inf 1 1.0 Inf Inf Inf Inf Inf 90% Inf Inf 1 Inf Inf Inf Inf Inf Inf 100% Inf Inf Inf Inf Inf Inf Inf Inf Inf , , 3 [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] 20% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 30% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 40% 0 0.0 -Inf -Inf -Inf -Inf -Inf -Inf -Inf 50% 0 0.5 0 0.0 0.5 0.5 0.5 0.500000 0.500 60% 1 1.0 1 0.8 1.3 1.4 1.2 1.333333 1.325 70% 2 2.0 2 1.6 Inf Inf 1.9 Inf Inf 80% Inf Inf 2 Inf Inf Inf Inf Inf Inf 90% Inf Inf Inf Inf Inf Inf Inf Inf Inf 100% Inf Inf Inf Inf Inf Inf Inf Inf Inf , , 4 [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] 20% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 30% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 40% 0 0 -Inf -Inf -Inf -Inf 0 -Inf -Inf 50% 1 1 1 0.5 1.0 1.0 1 1.000000 1.000 60% 2 2 2 1.6 2.1 2.2 2 2.133333 2.125 70% 3 3 3 2.7 Inf Inf 3 Inf Inf 80% Inf Inf Inf Inf Inf Inf Inf Inf Inf 90% Inf Inf Inf Inf Inf Inf Inf Inf Inf 100% Inf Inf Inf Inf Inf Inf Inf Inf Inf , , 5 [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] 20% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 30% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 40% 0 0.0 0 -Inf 0.1 0.0 0.2 0.06666667 0.075 50% 1 1.5 1 1.0 1.5 1.5 1.5 1.50000000 1.500 60% 3 3.0 2 2.4 2.9 3.0 2.8 2.93333333 2.925 70% 4 4.0 4 3.8 Inf Inf Inf Inf Inf 80% Inf Inf Inf Inf Inf Inf Inf Inf Inf 90% Inf Inf Inf Inf Inf Inf Inf Inf Inf 100% Inf Inf Inf Inf Inf Inf Inf Inf Inf , , 6 [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] 20% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 30% -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 40% 0 0 0 -Inf 0.3 0.2 0.4 0.2666667 0.275 50% 2 2 1 1.5 2.0 2.0 2.0 2.0000000 2.000 60% 4 4 3 3.2 3.7 3.8 3.6 3.7333333 3.725 70% 5 5 5 4.9 Inf Inf Inf Inf Inf 80% Inf Inf Inf Inf Inf Inf Inf Inf Inf 90% Inf Inf Inf Inf Inf Inf Inf Inf Inf 100% Inf Inf Inf Inf Inf Inf Inf Inf Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators206# #argv <- list(structure(character(0), .Dim = c(0L, 7L), .Dimnames = list(NULL, c('description', 'class', 'mode', 'text', 'isopen', 'can read', 'can write'))));`(`(argv[[1]]); description class mode text isopen can read can write ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators207# #argv <- list(structure(list(coefficients = structure(c(1.47191076131574, 0.586694550701453, NA, 0.258706725324317), .Names = c('(Intercept)', 'x1', 'x2', 'x3')), residuals = structure(c(0.224762433374997, 0.4813346401898, -0.548705796690786, -0.873306430909872, 0.3255545927283, -0.288240908441576, 0.530823516045489, -0.0649703574297026, 1.2699009772491, -1.05715266611575), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), effects = structure(c(-18.0083860263211, 7.91372047070235, 0.594462796282497, -0.733976126666906, 0.546582698364345, -0.032332374655677, 0.774795104738016, 0.120246912926227, 1.34954655602521, -1.1298961521627), .Names = c('(Intercept)', 'x1', 'x3', '', '', '', '', '', '', '')), rank = 3L, fitted.values = structure(c(2.08447598454963, 2.74878255284838, 3.46483046621199, 4.23261972464046, 5.0521503281338, 5.923422276692, 6.84643557031507, 7.821190209003, 8.84768619275579, 9.92592352157344), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10')), assign = 0:3, qr = structure(list( qr = structure(c(-3.16227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, 0.316227766016838, -17.3925271309261, 9.08295106229247, 0.15621147358221, 0.0461150970695743, -0.0639812794430617, -0.174077655955698, -0.284174032468334, -0.39427040898097, -0.504366785493606, -0.614463162006242, -12.1747689916483, 9.99124616852172, 2.29782505861521, 0.388354773181155, 0.471167347118467, 0.46694109307793, 0.375676011059543, 0.197372101063308, -0.0679706369107753, -0.420352202862709, -17.3925271309261, 9.08295106229247, 1.30962518065979e-16, -1.00907321685019e-15, 0.0501848681992808, -0.170313338748631, 0.0400139169574381, -0.419073670426332, -0.887431917453648, -0.0447724572319277), .Dim = c(10L, 4L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10'), c('(Intercept)', 'x1', 'x3', 'x2')), assign = 0:3), qraux = c(1.31622776601684, 1.26630785009485, 1.21850337126599, 1.04136435435488 ), pivot = c(1L, 2L, 4L, 3L), tol = 1e-07, rank = 3L), .Names = c('qr', 'qraux', 'pivot', 'tol', 'rank'), class = 'qr'), df.residual = 7L, xlevels = structure(list(), .Names = character(0)), call = quote(lm(formula = y ~ x1 + x2 + x3)), terms = quote(y ~ x1 + x2 + x3), model = structure(list(y = c(2.30923841792462, 3.23011719303818, 2.9161246695212, 3.35931329373059, 5.3777049208621, 5.63518136825043, 7.37725908636056, 7.75621985157329, 10.1175871700049, 8.86877085545769), x1 = 1:10, x2 = 1:10, x3 = c(0.1, 0.4, 0.9, 1.6, 2.5, 3.6, 4.9, 6.4, 8.1, 10)), .Names = c('y', 'x1', 'x2', 'x3'), terms = quote(y ~ x1 + x2 + x3), row.names = c(NA, 10L), class = 'data.frame')), .Names = c('coefficients', 'residuals', 'effects', 'rank', 'fitted.values', 'assign', 'qr', 'df.residual', 'xlevels', 'call', 'terms', 'model'), class = 'lm'));`(`(argv[[1]]); Call: lm(formula = y ~ x1 + x2 + x3) Coefficients: (Intercept) x1 x2 x3 1.4719 0.5867 NA 0.2587 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators208# #argv <- list(structure(c(1L, 2L, 1L), .Dim = 3L, .Dimnames = structure(list(c('1', '2', NA)), .Names = ''), class = 'table'));`(`(argv[[1]]); 1 2 1 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators209# #argv <- list(0.603420215896625, c(0, 0, 0, 0, 0, -0.0303676182248376, -0.0303676182248376, -0.0616574286863247, -0.0616574286863247, -0.0616574286863247, -0.0616574286863247, -0.0616574286863247, -0.0616574286863247, -0.0938974361662337, -0.0938974361662337, -0.0938974361662337, -0.127116495884859, -0.127116495884859, -0.127116495884859, -0.127116495884859, -0.161344339326807, -0.161344339326807, -0.161344339326807, -0.161344339326807, -0.161344339326807, -0.161344339326807, -0.196611600851059, -0.196611600851059, -0.196611600851059, -0.196611600851059, -0.196611600851059, -0.196611600851059, -0.196611600851059, -0.196611600851059, -0.196611600851059, -0.232949845109116, -0.232949845109116, -0.232949845109116, -0.232949845109116, -0.232949845109116, -0.232949845109116, -0.232949845109116, -0.232949845109116, -0.232949845109116, -0.232949845109116, -0.270391595295763, -0.270391595295763, -0.270391595295763, -0.270391595295763, -0.270391595295763, -0.348720674486417, -0.389678109021166));`*`(argv[[1]],argv[[2]]); [1] 0.00000000 0.00000000 0.00000000 0.00000000 0.00000000 -0.01832443 [7] -0.01832443 -0.03720534 -0.03720534 -0.03720534 -0.03720534 -0.03720534 [13] -0.03720534 -0.05665961 -0.05665961 -0.05665961 -0.07670466 -0.07670466 [19] -0.07670466 -0.07670466 -0.09735844 -0.09735844 -0.09735844 -0.09735844 [25] -0.09735844 -0.09735844 -0.11863941 -0.11863941 -0.11863941 -0.11863941 [31] -0.11863941 -0.11863941 -0.11863941 -0.11863941 -0.11863941 -0.14056665 [37] -0.14056665 -0.14056665 -0.14056665 -0.14056665 -0.14056665 -0.14056665 [43] -0.14056665 -0.14056665 -0.14056665 -0.16315975 -0.16315975 -0.16315975 [49] -0.16315975 -0.16315975 -0.21042510 -0.23513965 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators21# #argv <- list(1, c(FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE));`+`(argv[[1]],argv[[2]]); [1] 1 1 1 2 1 2 2 1 1 1 1 1 1 1 1 1 1 2 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators210# #argv <- list(5, c(0.90483741803596, 0.042329219623205, 3.72007597602068e-44));`*`(argv[[1]],argv[[2]]); [1] 4.524187e+00 2.116461e-01 1.860038e-43 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators211# #argv <- list(structure(c(110, 72, 89, 67, 116, 56, 102, 70, 116, 56, 106, 48), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')), structure(c(0.618181818181818, 0.583333333333333, 0.415730337078652, 0.358208955223881, 0.568965517241379, 0.589285714285714, 0.46078431372549, 0.328571428571429, 0.543103448275862, 0.517857142857143, 0.537735849056604, 0.395833333333333), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')));`*`(argv[[1]],argv[[2]]); 1 3 5 7 9 11 13 15 17 19 21 23 68 42 37 24 66 33 47 23 63 29 57 19 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators212# #argv <- list(0, 0L);`%%`(argv[[1]],argv[[2]]); [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators213# #argv <- list(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1), structure(c(110, 72, 89, 67, 116, 56, 102, 70, 116, 56, 106, 48), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')));`*`(argv[[1]],argv[[2]]); 1 3 5 7 9 11 13 15 17 19 21 23 110 72 89 67 116 56 102 70 116 56 106 48 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators214# #argv <- list(0+6.28318530717959i, 1:16);`*`(argv[[1]],argv[[2]]); [1] 0+ 6.283185i 0+ 12.566371i 0+ 18.849556i 0+ 25.132741i 0+ 31.415927i [6] 0+ 37.699112i 0+ 43.982297i 0+ 50.265482i 0+ 56.548668i 0+ 62.831853i [11] 0+ 69.115038i 0+ 75.398224i 0+ 81.681409i 0+ 87.964594i 0+ 94.247780i [16] 0+100.530965i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators215# #argv <- list(10, structure(0:100, .Tsp = c(1, 101, 1), class = 'ts'));`*`(argv[[1]],argv[[2]]); Time Series: Start = 1 End = 101 Frequency = 1 [1] 0 10 20 30 40 50 60 70 80 90 100 110 120 130 140 [16] 150 160 170 180 190 200 210 220 230 240 250 260 270 280 290 [31] 300 310 320 330 340 350 360 370 380 390 400 410 420 430 440 [46] 450 460 470 480 490 500 510 520 530 540 550 560 570 580 590 [61] 600 610 620 630 640 650 660 670 680 690 700 710 720 730 740 [76] 750 760 770 780 790 800 810 820 830 840 850 860 870 880 890 [91] 900 910 920 930 940 950 960 970 980 990 1000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators216# #argv <- list(1, 8);`*`(argv[[1]],argv[[2]]); [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators217# #argv <- list(0+1i, 2);`*`(argv[[1]],argv[[2]]); [1] 0+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators218# #argv <- list(2L, 5L);`*`(argv[[1]],argv[[2]]); [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators219# #argv <- list(0+2i, 3.14159265358979);`*`(argv[[1]],argv[[2]]); [1] 0+6.283185i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators22# #argv <- list(1, structure(list(x = 1:9, y = c(-0.626453810742332, 0.183643324222082, -0.835628612410047, 1.59528080213779, 0.329507771815361, -0.820468384118015, 0.487429052428485, 0.738324705129217, 0.575781351653492)), .Names = c('x', 'y'), row.names = c(NA, -9L), class = 'data.frame'));`+`(argv[[1]],argv[[2]]); x y 1 2 0.3735462 2 3 1.1836433 3 4 0.1643714 4 5 2.5952808 5 6 1.3295078 6 7 0.1795316 7 8 1.4874291 8 9 1.7383247 9 10 1.5757814 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators220# #argv <- list(structure(11323, class = 'Date'), c(12, 24, 36, 48, 60, 72, 84, 96, 108));`+`(argv[[1]],argv[[2]]); [1] "2001-01-13" "2001-01-25" "2001-02-06" "2001-02-18" "2001-03-02" [6] "2001-03-14" "2001-03-26" "2001-04-07" "2001-04-19" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators221# #argv <- list(3, 0+5i);`+`(argv[[1]],argv[[2]]); [1] 3+5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators222# #argv <- list(structure(c(68, 42, 37, 24, 66, 33, 47, 23, 63, 29, 57, 19), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')), structure(c(42, 30, 52, 43, 50, 23, 55, 47, 53, 27, 49, 29), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')));`+`(argv[[1]],argv[[2]]); 1 3 5 7 9 11 13 15 17 19 21 23 110 72 89 67 116 56 102 70 116 56 106 48 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators224# #argv <- list(structure(1:12, .Dim = 3:4), 3);`%%`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] 1 1 1 1 [2,] 2 2 2 2 [3,] 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators225# #argv <- list(0.02);`+`(argv[[1]]); [1] 0.02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators226# #argv <- list(1, structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8), .Tsp = c(1960.08333333333, 1961.66666666667, 12), class = 'ts'));`+`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec 1960 2 3 4 5 6 7 8 9 10 11 12 1961 1 2 3 4 5 6 7 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators227# #argv <- list(3.14159265358979, c(8.24339426780198e-14, 8.88066145332545e-14, 3.39607080058103e-14, 2.87112686384263e-14, -5.3372537031158e-14, 9.96185601455202e-14, -3.26659396832497e-14, 1.39086823244366e-13, 1.72881695621852e-13, 4.32507741831361e-14, -9.84603924440361e-14, 9.87208407136427e-14, -2.73032911651077e-14, -1.48736837028697e-13, 2.94392054503409e-14, -1.05171613093738e-13, -1.14029445758562e-13, 5.13338041611324e-15, -1.87531579189825e-13, -1.25627528672486e-13, 4.10267164560562e-14, 1.74236574669889e-13, 8.02066525165472e-14, 1.57764465352e-13, 1.23253351804626e-13, 1.6788749880341e-13, -1.39908165098147e-13, -1.58115885024452e-13, 1.81544497697974e-13, -1.14362367874561e-13, 1.56626365789358e-13, -1.81348445541539e-13, 1.34029870837468e-13, 5.83660521214748e-14, 1.66415892254192e-13, -1.55962501921682e-13, 5.56922447997358e-15, -1.90684901734508e-13, -1.56068620913678e-13, 1.42594677103356e-13, -1.5324035174056e-13, -1.72045664669025e-13, 6.15626207230525e-14, -1.70423231918929e-13, -2.2440318442518e-14, -6.47937716601402e-14, -1.03307295568126e-13, 7.89213836842498e-14, -9.01552844071197e-15, -1.39863491975671e-13, 1.21580502093206e-13, 1.74391617154328e-13, -7.68474764369541e-15, -9.62952541877272e-14, -5.3148471902392e-14, -2.21880305144443e-14, 5.26389742858333e-14, 2.7159840200832e-14, 1.87431554819324e-14, 4.56102486340353e-14, 1.11966090535737e-13, 9.46528420538298e-14, -1.10626253790834e-14, -1.20682584010224e-13, 1.09679727142136e-13, 1.85521222833898e-13, 1.28904258163856e-13, -7.30112958403796e-14, 4.38190249362539e-14, -5.25642067782032e-14, -1.07266296983526e-13, 4.48939091164837e-14, 4.09010010401022e-14, 1.576058154827e-13, -1.65586113176678e-13, 1.64953139323032e-13, -3.61017352519794e-14, -5.98713716165795e-14, 1.5553263601743e-13, -1.40329145253713e-13, -1.34306416738384e-13, 6.33760537168414e-15, -1.47719256195174e-13, 1.30439641217338e-13, -1.9949544714752e-13, 8.89585653992738e-14, 9.03099047696007e-14, -5.47032374550363e-14, 1.44655516265113e-13, 1.70556682807057e-13, -9.71359599142186e-14, -6.53941098287223e-14, -8.38818567534634e-14, 6.7826899389696e-14, 1.86838153280979e-13, 4.37228204318607e-14, 8.3759639291968e-14, -1.92868749423155e-13, -9.13894925944948e-14, 5.76515542011828e-14, 3.92733987046576e-14));`+`(argv[[1]],argv[[2]]); [1] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [9] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [17] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [25] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [33] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [41] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [49] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [57] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [65] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [73] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [81] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [89] 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 3.141593 [97] 3.141593 3.141593 3.141593 3.141593 3.141593 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators228# #argv <- list(4, 1:5);`+`(argv[[1]],argv[[2]]); [1] 5 6 7 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators229# #argv <- list(structure(c(1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 1, 1, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 1, 0, 0, 1, 0, 1, 1, 1, 0, 1, 1, 0, 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1, 1, 0, 1, 1, 0, 0, 1, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 0, 0), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100')), 0.1);`+`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 1.1 0.1 1.1 1.1 1.1 1.1 0.1 1.1 1.1 1.1 0.1 1.1 1.1 1.1 0.1 0.1 1.1 1.1 1.1 0.1 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 0.1 0.1 0.1 0.1 0.1 0.1 0.1 1.1 0.1 0.1 0.1 0.1 1.1 0.1 1.1 0.1 0.1 1.1 0.1 1.1 41 42 43 44 45 46 47 48 49 50 51 52 53 54 55 56 57 58 59 60 1.1 1.1 0.1 1.1 1.1 0.1 1.1 0.1 0.1 0.1 1.1 1.1 0.1 1.1 0.1 1.1 1.1 0.1 1.1 0.1 61 62 63 64 65 66 67 68 69 70 71 72 73 74 75 76 77 78 79 80 0.1 1.1 0.1 1.1 0.1 1.1 1.1 0.1 0.1 0.1 1.1 1.1 0.1 1.1 1.1 0.1 0.1 1.1 1.1 1.1 81 82 83 84 85 86 87 88 89 90 91 92 93 94 95 96 97 98 99 100 0.1 0.1 1.1 1.1 0.1 0.1 1.1 1.1 1.1 0.1 1.1 0.1 1.1 0.1 1.1 1.1 1.1 1.1 0.1 0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators23# #argv <- list(1:2, c(0+8i, 0+9i));`+`(argv[[1]],argv[[2]]); [1] 1+8i 2+9i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators230# #argv <- list(structure(1:10, .Tsp = c(1920.5, 1921.25, 12), class = 'ts'), 1);`+`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec 1920 2 3 4 5 6 7 1921 8 9 10 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators231# #argv <- list(1, 1);`-`(argv[[1]],argv[[2]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators232# #argv <- list(structure(c(68, 42, 37, 24, 66, 33, 47, 23, 63, 29, 57, 19, 42, 30, 52, 43, 50, 23, 55, 47, 53, 27, 49, 29), .Dim = c(12L, 2L), .Dimnames = list(c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), c('X', 'M'))), structure(c(68, 42, 37, 24, 66, 33, 47, 23, 63, 29, 57, 19, 42, 30, 52, 43, 50, 23, 55, 47, 53, 27, 49, 29), .Dim = c(12L, 2L), .Dimnames = list(c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), c('X', 'M'))));`-`(argv[[1]],argv[[2]]); X M 1 0 0 3 0 0 5 0 0 7 0 0 9 0 0 11 0 0 13 0 0 15 0 0 17 0 0 19 0 0 21 0 0 23 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators233# #argv <- list(structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), .Tsp = c(3, 10, 1), class = 'ts'), structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), .Tsp = c(3, 10, 1), class = 'ts'));`-`(argv[[1]],argv[[2]]); Time Series: Start = 3 End = 10 Frequency = 1 [1] 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators234# #argv <- list(c(-1.04843842027757e+143, -9.998687937523e+136, -9.53549188377803e+130, -9.09375370386458e+124, -8.67247934711978e+118, -8.27072081298779e+112, -7.88757401780305e+106, -7.52217676063816e+100, -7.17370678430818e+94, -6.84137992972049e+88, -6.5244483891549e+82, -6.22219909169008e+76, -5.93395235884653e+70, -5.65906136797865e+64, -5.39691448428537e+58, -5.14694833309681e+52, -4.90870165301755e+46, -4.68202458334831e+40, -4.46788150641526e+34, -4.27143012156591e+28, -4.11397031483551e+22, -40816513889983680, -45637199262.2201, -83492.8982026505, -1.56717399085881, -0.0019371698216247, -0.0388983050293216, 0.00184649674288725, -0.049895679671468, 0.0161192923654623, -0.0169866996250208));`-`(argv[[1]]); [1] 1.048438e+143 9.998688e+136 9.535492e+130 9.093754e+124 8.672479e+118 [6] 8.270721e+112 7.887574e+106 7.522177e+100 7.173707e+94 6.841380e+88 [11] 6.524448e+82 6.222199e+76 5.933952e+70 5.659061e+64 5.396914e+58 [16] 5.146948e+52 4.908702e+46 4.682025e+40 4.467882e+34 4.271430e+28 [21] 4.113970e+22 4.081651e+16 4.563720e+10 8.349290e+04 1.567174e+00 [26] 1.937170e-03 3.889831e-02 -1.846497e-03 4.989568e-02 -1.611929e-02 [31] 1.698670e-02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators235# #argv <- list(FALSE, c(-3L, -2L, -1L, 0L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 35L, 36L, 37L, 38L, 39L, 40L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 35L, 36L, 37L, 38L, 39L, 40L, 41L, 42L, 43L, 44L, 45L, 46L, 47L, 48L, 49L, 50L, 51L, 52L, 53L, 54L, 55L, 56L, 57L, 58L, 59L, 60L, 61L, 62L, 63L, 64L, 65L, 66L, 67L, 68L, 69L, 70L));`%%`(argv[[1]],argv[[2]]); [1] 0 0 0 NA 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [26] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [51] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [76] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators236# #argv <- list(structure(1395082079.75887, class = c('POSIXct', 'POSIXt')), 3600);`-`(argv[[1]],argv[[2]]); [1] "2014-03-17 17:47:59 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators237# #argv <- list(structure(c(2, 1, 0, 1, 0, NA, NA, NA, 0), .Dim = c(3L, 3L)), structure(c(1, 1, 1, 0.5, 0.5, 0.5, 0, 0, 0), .Dim = c(3L, 3L)));`-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] 1 0.5 NA [2,] 0 -0.5 NA [3,] -1 NA 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators238# #argv <- list(structure(2:10, .Tsp = c(2, 10, 1), class = 'ts'), structure(1:9, .Tsp = c(2, 10, 1), class = 'ts'));`-`(argv[[1]],argv[[2]]); Time Series: Start = 2 End = 10 Frequency = 1 [1] 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators239# #argv <- list(structure(0:100, .Tsp = c(1, 101, 1), class = 'ts'), 4);`-`(argv[[1]],argv[[2]]); Time Series: Start = 1 End = 101 Frequency = 1 [1] -4 -3 -2 -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 [26] 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 [51] 46 47 48 49 50 51 52 53 54 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 [76] 71 72 73 74 75 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 91 92 93 94 95 [101] 96 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators24# #argv <- list(c(14, 2, 2, -7), c(14, 2, 2, -7));`!=`(argv[[1]],argv[[2]]); [1] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators240#Ignored.OutputFormatting# #argv <- list(structure(numeric(0), .Dim = c(0L, 4L)), structure(numeric(0), .Dim = c(0L, 4L)));`-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators241# #argv <- list(structure(c(1L, 0L, 0L, 1L), .Dim = c(2L, 2L), .Dimnames = structure(list(x = c('1', '2'), y = c('1', '2')), .Names = c('x', 'y')), class = 'table'), 1);`-`(argv[[1]],argv[[2]]); y x 1 2 1 0 -1 2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators242# #argv <- list(5);`-`(argv[[1]]); [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators243# #argv <- list(structure(c(68, 42, 37, 24, 66, 33, 47, 23, 63, 29, 57, 19), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')), structure(c(68, 42, 37, 24, 66, 33, 47, 23, 63, 29, 57, 19), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')));`-`(argv[[1]],argv[[2]]); 1 3 5 7 9 11 13 15 17 19 21 23 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators244# #argv <- list(10, structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10), .Tsp = c(1, 10, 1), class = 'ts'));`-`(argv[[1]],argv[[2]]); Time Series: Start = 1 End = 10 Frequency = 1 [1] 9 8 7 6 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators245# #argv <- list(17L, 10L);`-`(argv[[1]],argv[[2]]); [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators246# #argv <- list(structure(100L, .Names = 'expsumNoisy'), 100L);`%%`(argv[[1]],argv[[2]]); expsumNoisy 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators247# #argv <- list(50, 51);`:`(argv[[1]],argv[[2]]); [1] 50 51 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators248# #argv <- list(-1, 1);`:`(argv[[1]],argv[[2]]); [1] -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators249# #argv <- list(1L, structure(15L, .Names = 'nc'));`:`(argv[[1]],argv[[2]]); [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators25# #argv <- list(c(-1, -2, -3, -4, -5, -6, -7, -8, -9, -10, -11, -12, -13, -14, -15, -16, -17, -18, -19, -20, -21, -22, -23, -24, -25, -26, -27, -28, -29, -30, -31, -32, -33, -34, -35, -36, -37, -38, -39, -40, -41, -42, -43, -44, -45, -46, -47, -48, -49, -50, -1000, -10000, -1e+05, -1e+06, -1e+07, -1e+08, -1e+09, -1e+10, -1e+20, -1e+50, -1e+150, -1e+250, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 1000, 10000, 1e+05, 1e+06, 1e+07, 1e+08, 1e+09, 1e+10, 1e+20, 1e+50, 1e+150, 1e+250));`+`(argv[[1]]); [1] -1.0e+00 -2.0e+00 -3.0e+00 -4.0e+00 -5.0e+00 -6.0e+00 -7.0e+00 [8] -8.0e+00 -9.0e+00 -1.0e+01 -1.1e+01 -1.2e+01 -1.3e+01 -1.4e+01 [15] -1.5e+01 -1.6e+01 -1.7e+01 -1.8e+01 -1.9e+01 -2.0e+01 -2.1e+01 [22] -2.2e+01 -2.3e+01 -2.4e+01 -2.5e+01 -2.6e+01 -2.7e+01 -2.8e+01 [29] -2.9e+01 -3.0e+01 -3.1e+01 -3.2e+01 -3.3e+01 -3.4e+01 -3.5e+01 [36] -3.6e+01 -3.7e+01 -3.8e+01 -3.9e+01 -4.0e+01 -4.1e+01 -4.2e+01 [43] -4.3e+01 -4.4e+01 -4.5e+01 -4.6e+01 -4.7e+01 -4.8e+01 -4.9e+01 [50] -5.0e+01 -1.0e+03 -1.0e+04 -1.0e+05 -1.0e+06 -1.0e+07 -1.0e+08 [57] -1.0e+09 -1.0e+10 -1.0e+20 -1.0e+50 -1.0e+150 -1.0e+250 0.0e+00 [64] 1.0e+00 2.0e+00 3.0e+00 4.0e+00 5.0e+00 6.0e+00 7.0e+00 [71] 8.0e+00 9.0e+00 1.0e+01 1.1e+01 1.2e+01 1.3e+01 1.4e+01 [78] 1.5e+01 1.6e+01 1.7e+01 1.8e+01 1.9e+01 2.0e+01 2.1e+01 [85] 2.2e+01 2.3e+01 2.4e+01 2.5e+01 2.6e+01 2.7e+01 2.8e+01 [92] 2.9e+01 3.0e+01 3.1e+01 3.2e+01 3.3e+01 3.4e+01 3.5e+01 [99] 3.6e+01 3.7e+01 3.8e+01 3.9e+01 4.0e+01 4.1e+01 4.2e+01 [106] 4.3e+01 4.4e+01 4.5e+01 4.6e+01 4.7e+01 4.8e+01 4.9e+01 [113] 5.0e+01 1.0e+03 1.0e+04 1.0e+05 1.0e+06 1.0e+07 1.0e+08 [120] 1.0e+09 1.0e+10 1.0e+20 1.0e+50 1.0e+150 1.0e+250 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators250# #argv <- list(-20, 10);`:`(argv[[1]],argv[[2]]); [1] -20 -19 -18 -17 -16 -15 -14 -13 -12 -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 [20] -1 0 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators251# #argv <- list(-7L, -1L);`:`(argv[[1]],argv[[2]]); [1] -7 -6 -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators252# #argv <- list(structure(c(0.618181818181818, 0.583333333333333, 0.415730337078652, 0.358208955223881, 0.568965517241379, 0.589285714285714, 0.46078431372549, 0.328571428571429, 0.543103448275862, 0.517857142857143, 0.537735849056604, 0.395833333333333), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')), 0);`<`(argv[[1]],argv[[2]]); 1 3 5 7 9 11 13 15 17 19 21 23 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators253# #argv <- list(c(1, 1, 1, 1, 1), -10);`<`(argv[[1]],argv[[2]]); [1] FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators254# #argv <- list(structure(c(1208822400, 1208908800, 1208995200, 1209081600, 1209168000, 1209254400), class = c('POSIXct', 'POSIXt'), tzone = 'GMT'), structure(1209168000, class = c('POSIXct', 'POSIXt'), tzone = 'GMT'));`<=`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators257# #argv <- list(structure(c(1, 1.4142135623731, 1.73205080756888, 2, 2.23606797749979, 2.44948974278318, 2.64575131106459, 2.82842712474619, 3, 3.16227766016838), id = 'test 1', class = structure('withId', package = '.GlobalEnv')), 1);`%%`(argv[[1]],argv[[2]]); [1] 0.0000000 0.4142136 0.7320508 0.0000000 0.2360680 0.4494897 0.6457513 [8] 0.8284271 0.0000000 0.1622777 attr(,"id") [1] "test 1" attr(,"class") [1] "withId" attr(,"class")attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators258# #argv <- list(2L, 1);`==`(argv[[1]],argv[[2]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators259# #argv <- list(structure(c(2L, NA, NA, 4L, 3L, 2L, 1L, 5L, 5L, 6L), .Label = c('NA', 'a', 'b', 'c', 'd', NA), class = 'factor'), structure(c(2L, NA, NA, 4L, 3L, 2L, 1L, 5L, 5L, 6L), .Label = c('NA', 'a', 'b', 'c', 'd', NA), class = 'factor'));`==`(argv[[1]],argv[[2]]); [1] TRUE NA NA TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators26# #argv <- list(structure(c(1+1i, 2+2i, 1.2+10i, 2.4+20i), .Dim = c(2L, 2L), .Dimnames = list(c('x', ''), c('a', 'b'))), 3.14159265358979);`+`(argv[[1]],argv[[2]]); a b x 4.141593+1i 4.34159+10i 5.141593+2i 5.54159+20i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators260# #argv <- list(c(-Inf, Inf), c(-Inf, Inf));`==`(argv[[1]],argv[[2]]); [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators261# #argv <- list(structure(list(VAR1 = c(1, 2, 3, 4, 5), VAR3 = c(1, 1, 1, 1, NA)), .Names = c('VAR1', 'VAR3'), class = 'data.frame', row.names = c(NA, -5L)), 1);`==`(argv[[1]],argv[[2]]); VAR1 VAR3 [1,] TRUE TRUE [2,] FALSE TRUE [3,] FALSE TRUE [4,] FALSE TRUE [5,] FALSE NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators262# #argv <- list(structure(1:20, .Dim = c(2L, 2L, 5L)), structure(1:20, .Dim = c(2L, 2L, 5L)));`==`(argv[[1]],argv[[2]]); , , 1 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE , , 2 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE , , 3 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE , , 4 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE , , 5 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators263# #argv <- list(structure(c(1L, 2L, NA), .Label = c('1', '2'), class = 'factor'), structure(c(1L, 2L, NA), .Label = c('1', '2'), class = 'factor'));`==`(argv[[1]],argv[[2]]); [1] TRUE TRUE NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators264# #argv <- list(c(5L, 2L, 4L), c(5, 2, 4));`==`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators265# #argv <- list(NULL, 'foo');`==`(argv[[1]],argv[[2]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators266# #argv <- list(structure(FALSE, .Names = 'd'), FALSE);`==`(argv[[1]],argv[[2]]); d TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators267# #argv <- list(c('1', '2', NA), c('1', '2', NA));`==`(argv[[1]],argv[[2]]); [1] TRUE TRUE NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators268# #argv <- list(-1:12, 2);`%%`(argv[[1]],argv[[2]]); [1] 1 0 1 0 1 0 1 0 1 0 1 0 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators269# #argv <- list(structure('(converted from warning) NAs produced\n', class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rnorm(1, sd = Inf))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), '(converted from warning) NAs produced\n');`==`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators27# #argv <- list(structure(c(1, 0.81, 0.64, 0.49, 0.36, 0.25, 0.16, 0.09, 0.04, 0.01, 0.81, 1, 0.81, 0.64, 0.49, 0.36, 0.25, 0.16, 0.09, 0.04, 0.64, 0.81, 1, 0.81, 0.64, 0.49, 0.36, 0.25, 0.16, 0.09, 0.49, 0.64, 0.81, 1, 0.81, 0.64, 0.49, 0.36, 0.25, 0.16, 0.36, 0.49, 0.64, 0.81, 1, 0.81, 0.64, 0.49, 0.36, 0.25, 0.25, 0.36, 0.49, 0.64, 0.81, 1, 0.81, 0.64, 0.49, 0.36, 0.16, 0.25, 0.36, 0.49, 0.64, 0.81, 1, 0.81, 0.64, 0.49, 0.09, 0.16, 0.25, 0.36, 0.49, 0.64, 0.81, 1, 0.81, 0.64, 0.04, 0.09, 0.16, 0.25, 0.36, 0.49, 0.64, 0.81, 1, 0.81, 0.01, 0.04, 0.09, 0.16, 0.25, 0.36, 0.49, 0.64, 0.81, 1), .Dim = c(10L, 10L)), structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1), .Dim = c(10L, 10L)));`+`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] 2.00 1.81 1.64 1.49 1.36 1.25 1.16 1.09 1.04 1.01 [2,] 1.81 2.00 1.81 1.64 1.49 1.36 1.25 1.16 1.09 1.04 [3,] 1.64 1.81 2.00 1.81 1.64 1.49 1.36 1.25 1.16 1.09 [4,] 1.49 1.64 1.81 2.00 1.81 1.64 1.49 1.36 1.25 1.16 [5,] 1.36 1.49 1.64 1.81 2.00 1.81 1.64 1.49 1.36 1.25 [6,] 1.25 1.36 1.49 1.64 1.81 2.00 1.81 1.64 1.49 1.36 [7,] 1.16 1.25 1.36 1.49 1.64 1.81 2.00 1.81 1.64 1.49 [8,] 1.09 1.16 1.25 1.36 1.49 1.64 1.81 2.00 1.81 1.64 [9,] 1.04 1.09 1.16 1.25 1.36 1.49 1.64 1.81 2.00 1.81 [10,] 1.01 1.04 1.09 1.16 1.25 1.36 1.49 1.64 1.81 2.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators270# #argv <- list(75.1931882101063, 0);`>`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators271# #argv <- list(3.001e+155, 0);`>`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators272#Ignored.OutputFormatting# #argv <- list(structure(c(4, 3, 2, 1, 0), .Tsp = c(-1, 3, 1), class = 'ts'), 1e-05);`>`(argv[[1]],argv[[2]]); Time Series: Start = -1 End = 3 Frequency = 1 [1] TRUE TRUE TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators273# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Dim = c(12L, 2L), .Dimnames = list(c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), c('X', 'M'))), 0.001);`>`(argv[[1]],argv[[2]]); X M 1 FALSE FALSE 3 FALSE FALSE 5 FALSE FALSE 7 FALSE FALSE 9 FALSE FALSE 11 FALSE FALSE 13 FALSE FALSE 15 FALSE FALSE 17 FALSE FALSE 19 FALSE FALSE 21 FALSE FALSE 23 FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators274# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 3.5527136788005e-15, 0, 0), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')), 0.001);`>`(argv[[1]],argv[[2]]); 1 3 5 7 9 11 13 15 17 19 21 23 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators275#Ignored.OutputFormatting# #argv <- list(structure(c(0, 1, 2, 3, 4, 5, 6, 7, 8), .Tsp = c(3, 11, 1), class = 'ts'), 1e-05);`>`(argv[[1]],argv[[2]]); Time Series: Start = 3 End = 11 Frequency = 1 [1] FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators276# #argv <- list(structure(c(13991, 13992, 13993, 13994, 13995), class = 'Date', labels = c('Apr 22', 'Apr 23', 'Apr 24', 'Apr 25', 'Apr 26')), 13991);`>=`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators277# #argv <- list(structure(3.00510204081633, base = 14, lens = 3L, .classes = c('R_system_version', 'package_version', 'numeric_version')), structure(2.92857142857143, base = 14, lens = 3L, .classes = c('package_version', 'numeric_version')));`>=`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators278# #argv <- list(2, c(1, 53.6315789473684, 106.263157894737, 158.894736842105, 211.526315789474, 264.157894736842, 316.789473684211, 369.421052631579, 422.052631578947, 474.684210526316, 527.315789473684, 579.947368421053, 632.578947368421, 685.210526315789, 737.842105263158, 790.473684210526, 843.105263157895, 895.736842105263, 948.368421052632, 1001));`^`(argv[[1]],argv[[2]]); [1] 2.000000e+00 1.395449e+16 9.736390e+31 6.793318e+47 4.739864e+63 [6] 3.307120e+79 2.307458e+95 1.609970e+111 1.123316e+127 7.837649e+142 [11] 5.468520e+158 3.815521e+174 2.662182e+190 1.857470e+206 1.296002e+222 [16] 9.042525e+237 6.309192e+253 4.402078e+269 3.071437e+285 2.143017e+301 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators279# #argv <- list(structure(1:12, .Dim = 12L), 3);`%%`(argv[[1]],argv[[2]]); [1] 1 2 0 1 2 0 1 2 0 1 2 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators28# #argv <- list(structure(5.5965311794562, .Names = 'thetas'), structure(c(3, 2, 2, 1, 1, 2), .Dim = 6L, .Dimnames = list(c('1', '2', '3', '4', '5', '6'))));`+`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 8.596531 7.596531 7.596531 6.596531 6.596531 7.596531 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators280# #argv <- list(c(4.17, 5.58, 5.18, 6.11, 4.5, 4.61, 5.17, 4.53, 5.33, 5.14, 4.81, 4.17, 4.41, 3.59, 5.87, 3.83, 6.03, 4.89, 4.32, 4.69), 2);`^`(argv[[1]],argv[[2]]); [1] 17.3889 31.1364 26.8324 37.3321 20.2500 21.2521 26.7289 20.5209 28.4089 [10] 26.4196 23.1361 17.3889 19.4481 12.8881 34.4569 14.6689 36.3609 23.9121 [19] 18.6624 21.9961 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators281# #argv <- list(c(2, 13954490295224484, 9.73638996997572e+31, 6.79331796732739e+47, 4.73986448237219e+63, 3.30711964599708e+79, 2.30745845026066e+95, 1.60997032753976e+111, 1.12331576556267e+127, 7.83764947450857e+142, 5.46852017646992e+158, 3.8155205865895e+174, 2.66218224983966e+190, 1.85746981847535e+206, 1.29600222777925e+222, 9.04252525506755e+237, 6.30919154580821e+253, 4.40207760983472e+269, 3.07143746426322e+285, 2.14301721437253e+301), 0.9);`^`(argv[[1]],argv[[2]]); [1] 1.866066e+00 3.390335e+14 6.159680e+28 1.119113e+43 2.033243e+57 [6] 3.694068e+71 6.711514e+85 1.219372e+100 2.215398e+114 4.025013e+128 [11] 7.312786e+142 1.328613e+157 2.413871e+171 4.385606e+185 7.967924e+199 [16] 1.447641e+214 2.630125e+228 4.778504e+242 8.681755e+256 1.577332e+271 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators282# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')), structure(c(TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE), .Names = c(' 100', '-1e-13', ' Inf', '-Inf', ' NaN', '3.14', ' NA')));`|`(argv[[1]],argv[[2]]); 100 -1e-13 Inf -Inf NaN 3.14 NA TRUE TRUE FALSE FALSE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators283# #argv <- list(10, structure(c(2.62236698682835, 2.59270366218715, 2.63940608371058, 2.64731958493827, 2.65803373028597, 2.71373162990423, 2.77064097627242, 2.76566849458896, 2.68535956033309, 2.6323339540094, 2.56646882037186, 2.60930482928073, 2.61873883018004, 2.58963301587663, 2.63649393196055, 2.64432599746861, 2.65480384168506, 2.71016075212057, 2.76665607635342, 2.76121751481566, 2.68040487260442, 2.62684815424423, 2.56043192269559, 2.60270233556967), .Tsp = c(1961, 1962.91666666667, 12), class = 'ts'));`^`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul Aug 1961 419.1476 391.4747 435.9193 443.9352 455.0234 517.2871 589.7134 582.9999 1962 415.6606 388.7165 433.0060 440.8857 451.6519 513.0513 584.3272 577.0554 Sep Oct Nov Dec 1961 484.5734 428.8782 368.5266 406.7287 1962 479.0765 423.4949 363.4393 400.5921 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators284#Ignored.ImplementationError# #argv <- list(10, -324:-307);`^`(argv[[1]],argv[[2]]); [1] 0.000000e+00 9.881313e-324 9.881313e-323 9.980126e-322 9.999889e-321 [6] 9.999889e-320 9.999987e-319 1.000000e-317 1.000000e-316 1.000000e-315 [11] 1.000000e-314 1.000000e-313 1.000000e-312 1.000000e-311 1.000000e-310 [16] 1.000000e-309 1.000000e-308 1.000000e-307 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators285# #argv <- list(structure(c(2, -2, -2, 2), .Dim = c(2L, 2L), .Dimnames = list(c('Milk', 'Tea'), c('Milk', 'Tea'))), 2);`^`(argv[[1]],argv[[2]]); Milk Tea Milk 4 4 Tea 4 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators286# #argv <- list(c(-0.672916599964862, -0.584338371560402, 0.572115715156077, -0.341116997543456, -0.218053452331652, 0.603114283893957, -0.415268358002702, -0.0134950134274691, 0.76321585191833, 0.804319710846886, 0.0536892937002835, 1.74635019377278, -0.471646028332481, 1.63758588525433, -0.578351427808452, 0.946667542637206, -0.329423655668059, -0.187791022191408, 0.794323068130594, 0.894218687970535, -1.22656982031204, 1.0590522527981, 0.612808669537666, -0.939425042488798, 2.69005530237799, -5.30421668373535, 2.81829750013497, -0.200427817155017, 0.828486397910241, 0.279395276763307, 0.0200169554117855, -0.787735991519008, -1.29364959334893, -0.511638483749587, 0.113049755514737, 1.10102046217428, -0.306657900899176, 0.268100169311174, -0.305146107712725, 0.396162277846222, 0.0150939553276523, 1.49211381144096, -1.92447564755755, 0.872283353434605, -1.19828539105242, 0.249023119183754, -0.888972367366677, -0.343085496017779, -0.789859289813313, 2.25212409468034, 2.24112978772768, -0.268185452742113, -0.258069470254978, -1.83609460856723, -0.0896167695808968, -0.0862703217063487, -0.00265875112142955, -0.414323880711934, -0.87767314293053, -2.22003587446461, -0.8313148988929, 0.832662806275473, -0.671837383858861, -1.85809916947114, -0.433937023889368, -0.851823367571459, -1.57641862799745, -0.880161315252144, -0.658071675968036, -1.21910415241982, -0.103154147995399, -1.92102359833593, 0.794527839025225, -1.0143657782449, 0.633288668140732, -0.0981774734963654, -0.927622152862583, -1.15272382197142, 3.28038998456465, -2.43807429671523, 0.0242203067253644, -0.377015290181077, 1.18353877313309, -5.69817122824189, -0.316441438096387, -0.0880345184260629, -0.161984388003683, -1.04890926431944, 3.34283466347557, -1.14655469197163, -0.0469559138168916, 4.57732396845363, -1.10972642208237, 6.74369483998494, -4.51689622564278, -0.942648739247179, 2.19288903907033, 1.26921808442688, -0.705352464586085, 0.00567568850361933), 2);`^`(argv[[1]],argv[[2]]); [1] 4.528168e-01 3.414513e-01 3.273164e-01 1.163608e-01 4.754731e-02 [6] 3.637468e-01 1.724478e-01 1.821154e-04 5.824984e-01 6.469302e-01 [11] 2.882540e-03 3.049739e+00 2.224500e-01 2.681688e+00 3.344904e-01 [16] 8.961794e-01 1.085199e-01 3.526547e-02 6.309491e-01 7.996271e-01 [21] 1.504474e+00 1.121592e+00 3.755345e-01 8.825194e-01 7.236398e+00 [26] 2.813471e+01 7.942801e+00 4.017131e-02 6.863897e-01 7.806172e-02 [31] 4.006785e-04 6.205280e-01 1.673529e+00 2.617739e-01 1.278025e-02 [36] 1.212246e+00 9.403907e-02 7.187770e-02 9.311415e-02 1.569446e-01 [41] 2.278275e-04 2.226404e+00 3.703607e+00 7.608782e-01 1.435888e+00 [46] 6.201251e-02 7.902719e-01 1.177077e-01 6.238777e-01 5.072063e+00 [51] 5.022663e+00 7.192344e-02 6.659985e-02 3.371243e+00 8.031165e-03 [56] 7.442568e-03 7.068958e-06 1.716643e-01 7.703101e-01 4.928559e+00 [61] 6.910845e-01 6.933273e-01 4.513655e-01 3.452533e+00 1.883013e-01 [66] 7.256030e-01 2.485096e+00 7.746839e-01 4.330583e-01 1.486215e+00 [71] 1.064078e-02 3.690332e+00 6.312745e-01 1.028938e+00 4.010545e-01 [76] 9.638816e-03 8.604829e-01 1.328772e+00 1.076096e+01 5.944206e+00 [81] 5.866233e-04 1.421405e-01 1.400764e+00 3.246916e+01 1.001352e-01 [86] 7.750076e-03 2.623894e-02 1.100211e+00 1.117454e+01 1.314588e+00 [91] 2.204858e-03 2.095189e+01 1.231493e+00 4.547742e+01 2.040235e+01 [96] 8.885866e-01 4.808762e+00 1.610915e+00 4.975221e-01 3.221344e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators287# #argv <- list(-3:4, 2);`^`(argv[[1]],argv[[2]]); [1] 9 4 1 0 1 4 9 16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators288# #argv <- list(0.9, Inf);`^`(argv[[1]],argv[[2]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators289#Ignored.ImplementationError# #argv <- list(0+0i, -3:3);`^`(argv[[1]],argv[[2]]); [1] Inf+0i Inf+0i Inf+0i 1+0i 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators29# #argv <- list(c(NA, 6.12, 19.92, 29.64, 35.4, 39.72, 45.24, 52.32, 63.48), c(6.12, 19.92, 29.64, 35.4, 39.72, 45.24, 52.32, 63.48, NA));`+`(argv[[1]],argv[[2]]); [1] NA 26.04 49.56 65.04 75.12 84.96 97.56 115.80 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators290# #argv <- list(structure(c(8L, 8L), .Names = c('y', 'x')), 8L);`%%`(argv[[1]],argv[[2]]); y x 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators291# #argv <- list(c(-Inf, -2, -1), -3);`^`(argv[[1]],argv[[2]]); [1] 0.000 -0.125 -1.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators292# #argv <- list(integer(0), 1:3);`^`(argv[[1]],argv[[2]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators293#Ignored.ImplementationError# #argv <- list(c(NA, -2L, -1L, 0L, 1L, 2L, NA, NA, NA), 0L);`^`(argv[[1]],argv[[2]]); [1] 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators294#Ignored.OutputFormatting# #argv <- list(c(-4+0i, -3+0i, -2+0i, -1+0i, 0+0i, 1+0i, 2+0i, 3+0i, 4+0i, 5+0i, 6+0i, 7+0i, 8+0i, 9+0i, 10+0i, 11+0i, 12+0i, -4+0i, -3+0i, -2+0i, -1+0i, 0+0i, 1+0i, 2+0i, 3+0i, 4+0i, 5+0i, 6+0i, 7+0i, 8+0i, 9+0i, 10+0i, 11+0i, 12+0i, -4+0i, -3+0i, -2+0i, -1+0i, 0+0i, 1+0i, 2+0i, 3+0i, 4+0i, 5+0i, 6+0i, 7+0i, 8+0i, 9+0i, 10+0i, 11+0i, 12+0i, -4+0i, -3+0i, -2+0i, -1+0i, 0+0i, 1+0i, 2+0i, 3+0i, 4+0i, 5+0i, 6+0i, 7+0i, 8+0i, 9+0i, 10+0i, 11+0i, 12+0i, -4+0i, -3+0i, -2+0i, -1+0i, 0+0i, 1+0i, 2+0i, 3+0i, 4+0i, 5+0i, 6+0i, 7+0i, 8+0i, 9+0i, 10+0i, 11+0i, 12+0i, -4+0i, -3+0i, -2+0i, -1+0i, 0+0i, 1+0i, 2+0i, 3+0i, 4+0i, 5+0i, 6+0i, 7+0i, 8+0i, 9+0i, 10+0i, 11+0i, 12+0i), c(-0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, -0.5, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 0.5, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 1.5, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2));`^`(argv[[1]],argv[[2]]); [1] 0.0000000-0.5000000i 0.0000000-0.5773503i 0.0000000-0.7071068i [4] 0.0000000-1.0000000i Inf+0.0000000i 1.0000000+0.0000000i [7] 0.7071068+0.0000000i 0.5773503+0.0000000i 0.5000000+0.0000000i [10] 0.4472136+0.0000000i 0.4082483+0.0000000i 0.3779645+0.0000000i [13] 0.3535534+0.0000000i 0.3333333+0.0000000i 0.3162278+0.0000000i [16] 0.3015113+0.0000000i 0.2886751+0.0000000i 1.0000000+0.0000000i [19] 1.0000000+0.0000000i 1.0000000+0.0000000i 1.0000000+0.0000000i [22] 1.0000000+0.0000000i 1.0000000+0.0000000i 1.0000000+0.0000000i [25] 1.0000000+0.0000000i 1.0000000+0.0000000i 1.0000000+0.0000000i [28] 1.0000000+0.0000000i 1.0000000+0.0000000i 1.0000000+0.0000000i [31] 1.0000000+0.0000000i 1.0000000+0.0000000i 1.0000000+0.0000000i [34] 1.0000000+0.0000000i 0.0000000+2.0000000i 0.0000000+1.7320508i [37] 0.0000000+1.4142136i 0.0000000+1.0000000i 0.0000000+0.0000000i [40] 1.0000000+0.0000000i 1.4142136+0.0000000i 1.7320508+0.0000000i [43] 2.0000000+0.0000000i 2.2360680+0.0000000i 2.4494897+0.0000000i [46] 2.6457513+0.0000000i 2.8284271+0.0000000i 3.0000000+0.0000000i [49] 3.1622777+0.0000000i 3.3166248+0.0000000i 3.4641016+0.0000000i [52] -4.0000000+0.0000000i -3.0000000+0.0000000i -2.0000000+0.0000000i [55] -1.0000000+0.0000000i 0.0000000+0.0000000i 1.0000000+0.0000000i [58] 2.0000000+0.0000000i 3.0000000+0.0000000i 4.0000000+0.0000000i [61] 5.0000000+0.0000000i 6.0000000+0.0000000i 7.0000000+0.0000000i [64] 8.0000000+0.0000000i 9.0000000+0.0000000i 10.0000000+0.0000000i [67] 11.0000000+0.0000000i 12.0000000+0.0000000i 0.0000000-8.0000000i [70] 0.0000000-5.1961524i 0.0000000-2.8284271i 0.0000000-1.0000000i [73] 0.0000000+0.0000000i 1.0000000+0.0000000i 2.8284271+0.0000000i [76] 5.1961524+0.0000000i 8.0000000+0.0000000i 11.1803399+0.0000000i [79] 14.6969385+0.0000000i 18.5202592+0.0000000i 22.6274170+0.0000000i [82] 27.0000000+0.0000000i 31.6227766+0.0000000i 36.4828727+0.0000000i [85] 41.5692194+0.0000000i 16.0000000+0.0000000i 9.0000000+0.0000000i [88] 4.0000000+0.0000000i 1.0000000+0.0000000i 0.0000000+0.0000000i [91] 1.0000000+0.0000000i 4.0000000+0.0000000i 9.0000000+0.0000000i [94] 16.0000000+0.0000000i 25.0000000+0.0000000i 36.0000000+0.0000000i [97] 49.0000000+0.0000000i 64.0000000+0.0000000i 81.0000000+0.0000000i [100] 100.0000000+0.0000000i 121.0000000+0.0000000i 144.0000000+0.0000000i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators295# #argv <- list(structure(c(26.2845882236184, 26.2845882236184, 26.2845882236184, 19.6276109953659, 19.6276109953659, 19.6276109953659, 19.6276109953659, 19.6276109953659, 16.7854987799975, 16.7854987799975, 16.7854987799975, 12.5343124120522, 12.5343124120522, 28.7031306388734, 28.7031306388734, 28.7031306388734, 28.7031306388734, 21.4336202544253, 21.4336202544253, 21.4336202544253, 21.4336202544253, 21.4336202544253, 21.4336202544253, 21.4336202544253, 28.044754781901, 28.044754781901, 28.044754781901, 28.044754781901, 28.044754781901, 28.044754781901, 28.044754781901, 24.2091543637699, 18.0778127599455, 18.0778127599455, 18.0778127599455, 18.0778127599455, 15.4601140250197, 15.4601140250197, 15.4601140250197, 15.4601140250197, 15.4601140250197, 15.4601140250197, 15.4601140250197, 15.4601140250197, 15.4601140250197, 15.4601140250197, 11.5446017812987, 11.5446017812987, 11.5446017812987, 11.5446017812987, 11.5446017812987, 26.436728414697, 26.436728414697, 26.436728414697, 26.436728414697, 26.436728414697, 26.436728414697, 26.436728414697, 26.436728414697, 19.7412193373284, 25.830337984867, 25.830337984867, 25.830337984867, 25.830337984867, 25.830337984867, 25.830337984867, 25.830337984867, 25.830337984867, 25.830337984867, 14.8736630467598, 14.8736630467598, 14.8736630467598, 11.1066785552923, 11.1066785552923, 11.1066785552923, 11.1066785552923, 11.1066785552923, 11.1066785552923, 9.49841217984702, 9.49841217984702, 9.49841217984702, 9.49841217984702, 9.49841217984702, 9.49841217984702, 9.49841217984702, 7.0927928470328, 7.0927928470328, 16.2422439293196, 16.2422439293196, 16.2422439293196, 12.1286452283118, 12.1286452283118, 12.1286452283118, 12.1286452283118, 12.1286452283118, 12.1286452283118, 12.1286452283118, 15.8696887052689, 15.8696887052689, 15.8696887052689, 15.8696887052689, 15.8696887052689, 15.8696887052689, 15.8696887052689, 13.6992370430272, 10.2296940445213, 10.2296940445213, 10.2296940445213, 10.2296940445213, 8.74841655179539, 8.74841655179539, 8.74841655179539, 8.74841655179539, 8.74841655179539, 8.74841655179539, 8.74841655179539, 8.74841655179539, 8.74841655179539, 8.74841655179539, 8.74841655179539, 6.53274517535593, 6.53274517535593, 6.53274517535593, 6.53274517535593, 6.53274517535593, 6.53274517535593, 14.959754634679, 14.959754634679, 14.959754634679, 14.959754634679, 14.959754634679, 14.959754634679, 14.959754634679, 14.959754634679, 14.959754634679, 11.170966121195, 14.6166164104337, 14.6166164104337, 14.6166164104337, 14.6166164104337, 14.6166164104337, 14.6166164104337, 14.6166164104337, 14.6166164104337, 14.6166164104337, 14.6166164104337), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100', '101', '102', '103', '104', '105', '106', '107', '108', '109', '110', '111', '112', '113', '114', '115', '116', '117', '118', '119', '120', '121', '122', '123', '124', '125', '126', '127', '128', '129', '130', '131', '132', '133', '134', '135', '136', '137', '138', '139', '140', '141', '142', '143', '144', '145', '146')), 2);`^`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 8 690.87958 690.87958 690.87958 385.24311 385.24311 385.24311 385.24311 385.24311 9 10 11 12 13 14 15 16 281.75297 281.75297 281.75297 157.10899 157.10899 823.86971 823.86971 823.86971 17 18 19 20 21 22 23 24 823.86971 459.40008 459.40008 459.40008 459.40008 459.40008 459.40008 459.40008 25 26 27 28 29 30 31 32 786.50827 786.50827 786.50827 786.50827 786.50827 786.50827 786.50827 586.08316 33 34 35 36 37 38 39 40 326.80731 326.80731 326.80731 326.80731 239.01513 239.01513 239.01513 239.01513 41 42 43 44 45 46 47 48 239.01513 239.01513 239.01513 239.01513 239.01513 239.01513 133.27783 133.27783 49 50 51 52 53 54 55 56 133.27783 133.27783 133.27783 698.90061 698.90061 698.90061 698.90061 698.90061 57 58 59 60 61 62 63 64 698.90061 698.90061 698.90061 389.71574 667.20636 667.20636 667.20636 667.20636 65 66 67 68 69 70 71 72 667.20636 667.20636 667.20636 667.20636 667.20636 221.22585 221.22585 221.22585 73 74 75 76 77 78 79 80 123.35831 123.35831 123.35831 123.35831 123.35831 123.35831 90.21983 90.21983 81 82 83 84 85 86 87 88 90.21983 90.21983 90.21983 90.21983 90.21983 50.30771 50.30771 263.81049 89 90 91 92 93 94 95 96 263.81049 263.81049 147.10404 147.10404 147.10404 147.10404 147.10404 147.10404 97 98 99 100 101 102 103 104 147.10404 251.84702 251.84702 251.84702 251.84702 251.84702 251.84702 251.84702 105 106 107 108 109 110 111 112 187.66910 104.64664 104.64664 104.64664 104.64664 76.53479 76.53479 76.53479 113 114 115 116 117 118 119 120 76.53479 76.53479 76.53479 76.53479 76.53479 76.53479 76.53479 76.53479 121 122 123 124 125 126 127 128 42.67676 42.67676 42.67676 42.67676 42.67676 42.67676 223.79426 223.79426 129 130 131 132 133 134 135 136 223.79426 223.79426 223.79426 223.79426 223.79426 223.79426 223.79426 124.79048 137 138 139 140 141 142 143 144 213.64548 213.64548 213.64548 213.64548 213.64548 213.64548 213.64548 213.64548 145 146 213.64548 213.64548 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators296# #argv <- list(17L, c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 35L, 36L, 37L, 38L, 39L, 40L, 41L, 42L, 43L, 44L, 45L, 46L, 47L, 48L, 49L, 50L, 51L, 52L, 53L, 54L, 55L, 56L, 57L, 58L, 59L, 60L, 61L, 62L, 63L, 64L, 65L, 66L, 67L, 68L, 69L, 70L, 71L, 72L, 73L, 74L, 75L, 76L, 77L, 78L, 79L, 80L, 81L, 82L, 83L, 84L, 85L, 86L, 87L, 88L, 89L, 90L, 91L, 92L, 93L, 94L, 95L, 96L, 97L, 98L, 99L, 100L, 77L, 50L, 49L, 48L, 47L, 46L, 45L, 44L, 43L, 42L, 41L, 40L, 10L));`^`(argv[[1]],argv[[2]]); [1] 1.700000e+01 2.890000e+02 4.913000e+03 8.352100e+04 1.419857e+06 [6] 2.413757e+07 4.103387e+08 6.975757e+09 1.185879e+11 2.015994e+12 [11] 3.427190e+13 5.826222e+14 9.904578e+15 1.683778e+17 2.862423e+18 [16] 4.866119e+19 8.272403e+20 1.406308e+22 2.390724e+23 4.064231e+24 [21] 6.909193e+25 1.174563e+27 1.996757e+28 3.394487e+29 5.770627e+30 [26] 9.810067e+31 1.667711e+33 2.835109e+34 4.819686e+35 8.193466e+36 [31] 1.392889e+38 2.367912e+39 4.025450e+40 6.843265e+41 1.163355e+43 [36] 1.977703e+44 3.362096e+45 5.715563e+46 9.716457e+47 1.651798e+49 [41] 2.808056e+50 4.773695e+51 8.115282e+52 1.379598e+54 2.345317e+55 [46] 3.987038e+56 6.777965e+57 1.152254e+59 1.958832e+60 3.330014e+61 [51] 5.661024e+62 9.623741e+63 1.636036e+65 2.781261e+66 4.728144e+67 [56] 8.037844e+68 1.366434e+70 2.322937e+71 3.948993e+72 6.713288e+73 [61] 1.141259e+75 1.940140e+76 3.298238e+77 5.607005e+78 9.531909e+79 [66] 1.620425e+81 2.754722e+82 4.683027e+83 7.961146e+84 1.353395e+86 [71] 2.300771e+87 3.911311e+88 6.649229e+89 1.130369e+91 1.921627e+92 [76] 3.266766e+93 5.553502e+94 9.440954e+95 1.604962e+97 2.728436e+98 [81] 4.638341e+99 7.885179e+100 1.340480e+102 2.278817e+103 3.873988e+104 [86] 6.585780e+105 1.119583e+107 1.903291e+108 3.235594e+109 5.500510e+110 [91] 9.350866e+111 1.589647e+113 2.702400e+114 4.594081e+115 7.809937e+116 [96] 1.327689e+118 2.257072e+119 3.837022e+120 6.522937e+121 1.108899e+123 [101] 5.553502e+94 3.330014e+61 1.958832e+60 1.152254e+59 6.777965e+57 [106] 3.987038e+56 2.345317e+55 1.379598e+54 8.115282e+52 4.773695e+51 [111] 2.808056e+50 1.651798e+49 2.015994e+12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators297# #argv <- list(c(-Inf, -2, -1), 0.5);`^`(argv[[1]],argv[[2]]); [1] NaN NaN NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators298# #argv <- list(structure(c(4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L), .Dim = 27L, .Dimnames = structure(list(groups = c('M01', 'M02', 'M03', 'M04', 'M05', 'M06', 'M07', 'M08', 'M09', 'M10', 'M11', 'M12', 'M13', 'M14', 'M15', 'M16', 'F01', 'F02', 'F03', 'F04', 'F05', 'F06', 'F07', 'F08', 'F09', 'F10', 'F11')), .Names = 'groups'), class = 'table'), 2);`^`(argv[[1]],argv[[2]]); groups M01 M02 M03 M04 M05 M06 M07 M08 M09 M10 M11 M12 M13 M14 M15 M16 F01 F02 F03 F04 16 16 16 16 16 16 16 16 16 16 16 16 16 16 16 16 16 16 16 16 F05 F06 F07 F08 F09 F10 F11 16 16 16 16 16 16 16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators299# #argv <- list(NA_integer_, structure(-2, .Names = 'power'));`^`(argv[[1]],argv[[2]]); power NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators3# #argv <- list(2.2250738585072e-308, c(0.0009765625, 0.001953125, 0.00390625, 0.0078125, 0.015625, 0.03125, 0.0625, 0.125, 0.25, 0.5, 1, 2, 4, 8, 1e+05, 1e+10));`*`(argv[[1]],argv[[2]]); [1] 2.172924e-311 4.345847e-311 8.691695e-311 1.738339e-310 3.476678e-310 [6] 6.953356e-310 1.390671e-309 2.781342e-309 5.562685e-309 1.112537e-308 [11] 2.225074e-308 4.450148e-308 8.900295e-308 1.780059e-307 2.225074e-303 [16] 2.225074e-298 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators30# #argv <- list(structure(c(-0.560475646552213+0i, 0.7424437487+0i, 1.39139505579429+0i, 0.928710764113827+0i, -0.469267985412949+0i, 0.7424437487+0i, 0.460916205989202+0i, -0.452623703774585+0i, -0.0945011868321433+0i, -0.331818442379127+0i, 1.39139505579429+0i, -0.452623703774585+0i, 0.400771450594052+0i, -0.927967220342259+0i, -0.790922791530657+0i, 0.928710764113827+0i, -0.0945011868321433+0i, -0.927967220342259+0i, 0.701355901563686+0i, -0.600841318509537+0i, -0.469267985412949+0i, -0.331818442379127+0i, -0.790922791530657+0i, -0.600841318509537+0i, -0.625039267849257+0i), .Dim = c(5L, 5L)), c(0-1.68669331074241i, 0+0.837787044494525i, 0+0.153373117836515i, 0-1.13813693701195i, 0+1.25381492106993i, 0+0.426464221476814i, 0-0.295071482992271i, 0+0.895125661045022i, 0+0.878133487533042i, 0+0.821581081637487i, 0+0.688640254100091i, 0+0.553917653537589i, 0-0.0619117105767217i, 0-0.305962663739917i, 0-0.380471001012383i, 0-0.694706978920513i, 0-0.207917278019599i, 0-1.26539635156826i, 0+2.16895596533851i, 0+1.20796199830499i, 0-1.12310858320335i, 0-0.402884835299076i, 0-0.466655353623219i, 0+0.779965118336318i, 0-0.0833690664718293i));`+`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] -0.5604756-1.686693i 0.7424437+0.4264642i 1.3913951+0.6886403i [2,] 0.7424437+0.837787i 0.4609162-0.2950715i -0.4526237+0.5539177i [3,] 1.3913951+0.153373i -0.4526237+0.8951257i 0.4007715-0.0619117i [4,] 0.9287108-1.138137i -0.0945012+0.8781335i -0.9279672-0.3059627i [5,] -0.4692680+1.253815i -0.3318184+0.8215811i -0.7909228-0.3804710i [,4] [,5] [1,] 0.9287108-0.6947070i -0.4692680-1.1231086i [2,] -0.0945012-0.2079173i -0.3318184-0.4028848i [3,] -0.9279672-1.2653964i -0.7909228-0.4666554i [4,] 0.7013559+2.1689560i -0.6008413+0.7799651i [5,] -0.6008413+1.2079620i -0.6250393-0.0833691i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators300# #argv <- list(c(-Inf, -2, -1, 0, 1, 2, Inf, NA, NaN), 0);`^`(argv[[1]],argv[[2]]); [1] 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators301# #argv <- list(structure(1:12, .Dim = 3:4, .Dimnames = list(c('Case_1', 'Case_2', 'Case_3'), NULL)), 5);`%%`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] Case_1 1 4 2 0 Case_2 2 0 3 1 Case_3 3 1 4 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators302# #argv <- list(structure(c(2L, 3L, 4L, 5L, 6L, 7L, 8L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 2L, 3L, 4L, 5L, 6L, 7L, 8L), .Names = c('2:', '3:', '4:', '5:', '6:', '7:', '8:', '2:', '3:', '4:', '5:', '6:', '7:', '8:', '2:', '3:', '4:', '5:', '6:', '7:', '8:', '2:', '3:', '4:', '5:', '6:', '7:', '8:', '2:', '3:', '4:', '5:', '6:', '7:', '8:', '2:', '3:', '4:', '5:', '6:', '7:', '8:', '2:', '3:', '4:', '5:', '6:', '7:', '8:', '2:', '3:', '4:', '5:', '6:', '7:', '8:', '2:', '3:', '4:', '5:', '6:', '7:', '8:')), structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 9L, 9L, 9L, 9L, 9L, 9L, 9L), .Names = c('1', '1', '1', '1', '1', '1', '1', '2', '2', '2', '2', '2', '2', '2', '3', '3', '3', '3', '3', '3', '3', '4', '4', '4', '4', '4', '4', '4', '5', '5', '5', '5', '5', '5', '5', '6', '6', '6', '6', '6', '6', '6', '7', '7', '7', '7', '7', '7', '7', '8', '8', '8', '8', '8', '8', '8', '9', '9', '9', '9', '9', '9', '9')));`^`(argv[[1]],argv[[2]]); 2: 3: 4: 5: 6: 7: 8: 2: 2 3 4 5 6 7 8 4 3: 4: 5: 6: 7: 8: 2: 3: 9 16 25 36 49 64 8 27 4: 5: 6: 7: 8: 2: 3: 4: 64 125 216 343 512 16 81 256 5: 6: 7: 8: 2: 3: 4: 5: 625 1296 2401 4096 32 243 1024 3125 6: 7: 8: 2: 3: 4: 5: 6: 7776 16807 32768 64 729 4096 15625 46656 7: 8: 2: 3: 4: 5: 6: 7: 117649 262144 128 2187 16384 78125 279936 823543 8: 2: 3: 4: 5: 6: 7: 8: 2097152 256 6561 65536 390625 1679616 5764801 16777216 2: 3: 4: 5: 6: 7: 8: 512 19683 262144 1953125 10077696 40353607 134217728 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators303#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`^`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘^’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators304# #argv <- list(0.8, structure(c(0L, 1L, 2L, 1L, 0L, 1L, 2L, 1L, 0L), .Dim = c(3L, 3L)));`^`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] 1.00 0.8 0.64 [2,] 0.80 1.0 0.80 [3,] 0.64 0.8 1.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators305# #argv <- list(structure(c(0, 0, 0, 0, 6, 0, 0, 0, 0, 6, 0, 0, 0, 0, 6, 0), .Dim = c(4L, 4L)), structure(c(0, 0, 0, 0, 6, 0, 0, 0, 0, 6, 0, 0, 0, 0, 6, 0), .Dim = c(4L, 4L)));`^`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] 1 46656 1 1 [2,] 1 1 46656 1 [3,] 1 1 1 46656 [4,] 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators306# #argv <- list(c(1.1, 2, Inf), -Inf);`^`(argv[[1]],argv[[2]]); [1] 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators307#Ignored.OutputFormatting# #argv <- list(logical(0), structure(logical(0), .Dim = c(0L, 0L), .Dimnames = list(NULL, NULL)));`|`(argv[[1]],argv[[2]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators308# #argv <- list(list());`|`(argv[[1]]); Error in |argv[[1]] : 1 argument passed to '|' which requires 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators309# #argv <- list(structure(c(TRUE, FALSE, TRUE, TRUE), .Dim = c(2L, 2L), .Dimnames = list(NULL, NULL)), structure(c(FALSE, FALSE, FALSE, FALSE), .Dim = c(2L, 2L), .Dimnames = list(NULL, NULL)));`|`(argv[[1]],argv[[2]]); [,1] [,2] [1,] TRUE TRUE [2,] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators31# #argv <- list(structure(FALSE, class = structure('foo', package = '.GlobalEnv')), NA);`+`(argv[[1]],argv[[2]]); [1] NA attr(,"class") [1] "foo" attr(,"class")attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators310# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE), .Dim = c(2L, 2L)), structure(c(FALSE, FALSE, FALSE, FALSE), .Dim = c(2L, 2L)));`|`(argv[[1]],argv[[2]]); [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators311# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53')), structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53')));`|`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 8 9 10 11 12 13 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 14 15 16 17 18 19 20 21 22 23 24 25 26 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 27 28 29 30 31 32 33 34 35 36 37 38 39 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 40 42 43 44 45 46 47 48 49 50 51 52 53 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators312#Ignored.OutputFormatting# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 0), .Dim = c(6L, 3L), .Dimnames = structure(list(` p L s` = c('. . .', '. | .', '. . |', '. | |', '. . ?', '. | ?'), c('perm', 'LDL', 'super')), .Names = c(' p L s', ''))), c(4, 2, 1));`%*%`(argv[[1]],argv[[2]]); p L s [,1] . . . 0 . | . 2 . . | 1 . | | 1 . . ? 0 . | ? 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators313# #argv <- list(structure(c(NA, FALSE, TRUE, NA, FALSE, TRUE, NA, FALSE, TRUE), .Names = c(NA, 'FALSE', 'TRUE', NA, 'FALSE', 'TRUE', NA, 'FALSE', 'TRUE')), structure(c(NA, NA, NA, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE), .Names = c(NA, NA, NA, 'FALSE', 'FALSE', 'FALSE', 'TRUE', 'TRUE', 'TRUE')));`|`(argv[[1]],argv[[2]]); FALSE TRUE FALSE TRUE FALSE TRUE NA NA TRUE NA FALSE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators314# #argv <- list(structure(120L, class = 'octmode'), '644');`|`(argv[[1]],argv[[2]]); [1] "774" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators315# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 1, 0, 0, 1, 0, 0, 0, 1, 0, 0, 1, 0, 0, 1, 0, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1), .Dim = c(9L, 5L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9'), c('(Intercept)', 'outcome2', 'outcome3', 'treatment2', 'treatment3')), assign = c(0L, 1L, 1L, 2L, 2L), contrasts = structure(list(outcome = 'contr.treatment', treatment = 'contr.treatment'), .Names = c('outcome', 'treatment'))), c(3.04452243772342, -0.454255272277594, -0.292987124681473, 1.33790930192987e-15, 1.42108546079721e-15));`%*%`(argv[[1]],argv[[2]]); [,1] 1 3.044522 2 2.590267 3 2.751535 4 3.044522 5 2.590267 6 2.751535 7 3.044522 8 2.590267 9 2.751535 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators316# #argv <- list(character(0));`!`(argv[[1]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators317# #argv <- list(structure(c(-1, 2), .Dim = c(2L, 1L), .Dimnames = list(NULL, 'x')), c(-1, 2));`%*%`(argv[[1]],argv[[2]]); [,1] [,2] [1,] 1 -2 [2,] -2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators318# #argv <- list(structure(c(0.94232064077615, 0.62152295589611, 0.178333356339776, 0.0222599883329273), .Dim = c(4L, 1L)), structure(c(0.941251786864296, 0.603637002512359, 0.159215730735261, 0.0172717433258791), .Dim = c(1L, 4L)));`%*%`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] 0.88696099 0.56881961 0.15003227 0.0162755202 [2,] 0.58500959 0.37517425 0.09895623 0.0107347850 [3,] 0.16785659 0.10764861 0.02839348 0.0030801280 [4,] 0.02095225 0.01343695 0.00354414 0.0003844688 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators319#Ignored.ImplementationError# #argv <- list(numeric(0), structure(numeric(0), .Dim = c(1L, 0L)));`%*%`(argv[[1]],argv[[2]]); <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators32# #argv <- list(2.11111111111111, structure(c(3, 2, 2, 1, 1, 2), .Dim = 6L, .Dimnames = list(c('1', '2', '3', '4', '5', '6'))));`+`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 5.111111 4.111111 4.111111 3.111111 3.111111 4.111111 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators320# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 68, 56, 60, 68, 71, 61, 68, 60, 63, 56, 49, 58, 72, 60, 70, 74, 73, 48, 60, 61, 62, 65, 74, 73, 59, 60, 76, 74, 74, 63, 68, 58, 62, 65, 57, 75, 68, 67, 64, 68, 63, 74, 51, 81, 73, 59, 61, 72, 63, 69, 72, 70, 58, 59, 75, 69, 75, 76, 49, 68, 66, 75, 60, 72, 70, 77, 48, 47, 67, 74, 56, 56, 73, 76, 71, 82, 59, 60, 62, 55, 69, 62, 62, 69, 57, 46, 65, 58, 43, 56, 74, 60, 39, 66, 51, 45, 72, 58, 53, 52, 70, 52, 63, 50, 63, 62, 55, 50, 60, 64, 76, 70, 57, 39, 75, 0, 0, 0, 0, 0, 0, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, NA, 1, 1, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0, 0, 1, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 0, 1, 1, 0, 1, 0, 0, 0, 1, 1, 0, 1, 1, 0, 0, 0, 0, 0, 1, 1, 1, 0, 1, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0, 1, 0, 1, 1, 1, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, NA, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Dim = c(115L, 5L), .Dimnames = list(c('2', '3', '5', '7', '8', '10', '12', '14', '18', '19', '22', '24', '25', '27', '28', '30', '32', '33', '34', '35', '36', '37', '39', '42', '43', '44', '46', '47', '49', '52', '53', '54', '56', '57', '58', '61', '66', '67', '68', '69', '71', '73', '77', '79', '80', '81', '88', '90', '91', '95', '96', '100', '101', '105', '110', '111', '114', '116', '117', '118', '119', '121', '122', '124', '125', '129', '130', '133', '135', '136', '138', '140', '141', '143', '147', '149', '150', '152', '153', '155', '156', '158', '161', '163', '166', '168', '170', '172', '174', '177', '180', '181', '182', '183', '185', '186', '187', '188', '190', '192', '196', '199', '203', '204', '205', '206', '207', '208', '211', '214', '218', '219', '220', '225', '226'), c('(Intercept)', 'age', 'factor(ph.ecog)1', 'factor(ph.ecog)2', 'factor(ph.ecog)3')), assign = c(0L, 1L, 2L, 2L, 2L), contrasts = structure(list(`factor(ph.ecog)` = 'contr.treatment'), .Names = 'factor(ph.ecog)')), structure(c(6.76534252253894, -0.00731543889899693, -0.256632132912267, -0.629047717825279, -1.48257717514349), .Names = c('(Intercept)', 'age', 'factor(ph.ecog)1', 'factor(ph.ecog)2', 'factor(ph.ecog)3')));`%*%`(argv[[1]],argv[[2]]); [,1] 2 6.267893 3 6.355678 5 6.326416 7 5.638845 8 5.616899 10 5.690053 12 5.638845 14 NA 18 5.675422 19 5.726630 22 6.406886 24 6.341047 25 6.238631 27 6.326416 28 4.770685 30 5.594952 32 5.602268 33 5.785154 34 5.697368 35 5.690053 36 5.682738 37 5.660791 39 5.594952 42 5.602268 43 6.333732 44 5.697368 46 5.580321 47 6.224000 49 6.224000 52 6.304470 53 6.267893 54 6.341047 56 6.311785 57 6.289839 58 5.719315 61 5.587637 66 5.638845 67 5.646160 68 6.297154 69 6.267893 71 6.304470 73 5.594952 77 6.392255 79 6.172792 80 6.231315 81 6.333732 88 6.319101 90 5.609583 91 6.304470 95 6.260577 96 5.609583 100 6.253262 101 6.341047 105 5.704684 110 5.587637 111 6.260577 114 6.216685 116 5.580321 117 5.777838 118 5.638845 119 5.653476 121 6.216685 122 5.697368 124 5.609583 125 6.253262 129 5.573006 130 6.414201 133 6.421517 135 6.275208 136 5.594952 138 5.726630 140 6.355678 141 5.602268 143 5.580321 147 6.245946 149 6.165477 150 6.333732 152 6.326416 153 6.311785 155 5.733946 156 5.631530 158 5.682738 161 6.311785 163 5.631530 166 6.348363 168 6.428832 170 6.289839 172 6.341047 174 6.450779 177 5.726630 180 6.224000 181 6.326416 182 6.480040 183 6.282524 185 6.392255 186 6.436148 187 5.609583 188 6.341047 190 6.377624 192 5.755892 196 6.253262 199 6.384940 203 6.304470 204 6.399571 205 6.304470 206 5.682738 207 6.362993 208 5.770523 211 6.326416 214 5.668107 218 5.580321 219 5.624214 220 6.348363 225 6.480040 226 5.587637 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators321# #argv <- list(structure(c(544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 544.790381900886, 398.486952468991, 440.879079007027, 273.26068924187, -165.547292067734, -289.908895455829, -336.563851641157, -433.491123254512, -446.830170210184, -229.698549757081, 7.43503106965538, 237.187718724823, 1539.44739946315, 1548.66655077773, 1557.88570209231, 1566.45228027983, 1575.01885846735, 1583.14083472285, 1591.26281097836, 1599.26100149451, 1607.25919201066, 1611.39689466313, 1615.5345973156, 1612.61129444623, 1609.68799157686, 1603.44643859537, 1597.20488561388, 1588.73002343463, 1580.25516125537, 1570.86127478964, 1561.46738832392, 1549.89535441445, 1538.32332050498, 1524.62526591843, 1510.92721133189, 1499.65830819836, 1488.38940506483, 1479.31388700637, 1470.23836894792, 1460.03887936132, 1449.83938977473, 1441.27547309544, 1432.71155641615, 1432.51830671501, 1432.32505701387, 1433.15763708544, 1433.99021715701, 1434.96142536256, 1435.9326335681, 1435.47421580154, 1435.01579803498, 1433.4368629411, 1431.85792784722, 1430.85617066215, 1429.85441347709, 1432.59097206397, 1435.32753065085, 1440.49425642708, 1445.66098220331, 1448.76676550395, 1451.87254880459, 1452.9163236715, 1453.96009853841, 1454.6961768366, 1455.43225513478, 1452.22362902495, 1449.01500291512, 1442.43484036078, 1435.85467780644, 1426.50159512644, 1417.14851244644, 1409.58997614642, 1402.0314398464, 1397.59624058751, 1393.16104132862, 1386.64426440334, 1380.12748747807, 1371.71107833433, 1363.2946691906, 1354.59002807904, 1345.88538696748, 1336.94914699242, 1328.01290701735, 1318.64960669271, 49.7622186359663, -84.1535032467218, -121.764781099341, 37.2870304782966, 82.528433600382, -44.2319392670254, 25.3010406627996, -34.7698782399993, 48.5709781995188, 110.301655093951, -1.96962838525201, -3.7990131710535, -51.4783734777507, 135.066608935635, 114.916035379091, -28.990712676497, -11.7078691876363, 7.04762066618673, -38.9035366827579, 16.5957688400649, -38.4931502947952, 52.0732838386475, 26.6377575984557, 329.153973076816, -13.1797869657194, 872.199160524634, 371.882552045056, -254.299568603192, -95.2920977069916, 8.63342236039193, 16.852295225008, -29.0271834604991, 13.5051131963112, 4.54091267164154, 25.5747517733375, 386.850855912621, 259.276984531009, -199.961168270532, -153.894877042003, 94.302447817031, -20.3106357794875, 21.0527247936745, -6.29056183593116, 13.9001511905426, -29.4973604406664, -31.7957066699985, -224.096013272965, -30.9544842287708, 22.3370692945275, 432.596723859509, 47.1608224545594, -304.956866078466, 50.1150369329559, 24.6852664308792, -14.4511512739648, -4.94371710626865, -19.024507596255, -56.8030453693573, -314.583543516094, 165.222305128756, 316.17817825271, 23.9168069434991, 11.9598796643579, -128.904953645213, 0.419804589665318, -6.80218287850425, 29.2691824505584, 53.9010951754703, 40.9447832426993, -26.2505972353374, -41.4479380870087, -214.837325417531), .Dim = c(72L, 3L), .Dimnames = list(NULL, c('seasonal', 'trend', 'remainder')), .Tsp = c(1974, 1979.91666666667, 12), class = c('mts', 'ts', 'matrix')), c(1, 1, 1));`%*%`(argv[[1]],argv[[2]]); [,1] [1,] 2134 [2,] 1863 [3,] 1877 [4,] 1877 [5,] 1492 [6,] 1249 [7,] 1280 [8,] 1131 [9,] 1209 [10,] 1492 [11,] 1621 [12,] 1846 [13,] 2103 [14,] 2137 [15,] 2153 [16,] 1833 [17,] 1403 [18,] 1288 [19,] 1186 [20,] 1133 [21,] 1053 [22,] 1347 [23,] 1545 [24,] 2066 [25,] 2020 [26,] 2750 [27,] 2283 [28,] 1479 [29,] 1189 [30,] 1160 [31,] 1113 [32,] 970 [33,] 999 [34,] 1208 [35,] 1467 [36,] 2059 [37,] 2240 [38,] 1634 [39,] 1722 [40,] 1801 [41,] 1246 [42,] 1162 [43,] 1087 [44,] 1013 [45,] 959 [46,] 1179 [47,] 1229 [48,] 1655 [49,] 2019 [50,] 2284 [51,] 1942 [52,] 1423 [53,] 1340 [54,] 1187 [55,] 1098 [56,] 1004 [57,] 970 [58,] 1140 [59,] 1110 [60,] 1812 [61,] 2263 [62,] 1820 [63,] 1846 [64,] 1531 [65,] 1215 [66,] 1075 [67,] 1056 [68,] 975 [69,] 940 [70,] 1081 [71,] 1294 [72,] 1341 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators322# #argv <- list(c(-1, 1), structure(c(1e-05, 1e-04, 0.001, 0.01, 0.1, 1, 10, 100, 1000, 10000, 1e+05), .Dim = c(1L, 11L)));`%*%`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [1,] -1e-05 -1e-04 -0.001 -0.01 -0.1 -1 -10 -100 -1000 -10000 -1e+05 [2,] 1e-05 1e-04 0.001 0.01 0.1 1 10 100 1000 10000 1e+05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators323# #argv <- list(structure(c(-0.560475646552213+0i, 0.7424437487+0.205661411508856i, 1.39139505579429-0.26763356813179i, 0.928710764113827-0.221714979045717i, -0.46926798541295+1.18846175213664i, 0.7424437487-0.205661411508856i, 0.460916205989202+0i, -0.452623703774585+0.170604003753717i, -0.094501186832143+0.54302538277632i, -0.331818442379127+0.612232958468282i, 1.39139505579429+0.26763356813179i, -0.452623703774585-0.170604003753717i, 0.400771450594052+0i, -0.927967220342259+0.479716843914174i, -0.790922791530657+0.043092176305418i, 0.928710764113827+0.221714979045717i, -0.094501186832143-0.54302538277632i, -0.927967220342259-0.479716843914174i, 0.701355901563686+0i, -0.600841318509537+0.213998439984336i, -0.46926798541295-1.18846175213664i, -0.331818442379127-0.612232958468282i, -0.790922791530657-0.043092176305418i, -0.600841318509537-0.213998439984336i, -0.625039267849257+0i), .Dim = c(5L, 5L)), structure(c(0.63829956885596+0i, -0.190923866036828-0.209348060979014i, -0.478761262752136-0.086103851005322i, -0.365383456834977+0.041833555661111i, -0.222902888615007-0.301211043305794i, 0.537261763078809+0i, 0.305061935059249+0.040985454461732i, 0.320062315956695-0.375563080684186i, 0.339383913939873+0.23302799386284i, -0.286918674221019+0.348301421162371i, 0.428338589082996+0.09065231252407i, -0.107969030611945+0.281263066654197i, 0.001811723298003+0.250507832255811i, 0.144305664871353+0.232873855829054i, 0.761400139936914+0i, -0.050390571101999+0.329984002238884i, 0.120127927801654-0.008394623232215i, -0.521562263306688+0.262168616442556i, 0.691801039177503+0i, -0.206933988216912-0.109088169082914i, -0.014684754774299-0.0242358465049725i, 0.848358097780775+0i, -0.232315601522623+0.249797304698912i, -0.362004462885974+0.102815998405382i, 0.086977040883207+0.118037795588006i), .Dim = c(5L, 5L)));`%*%`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] -1.7876455+0.0000000i 1.2917531+0.0000000i -0.6018269-0.1273689i [2,] 0.5347085+0.5863080i 0.7334687+0.0985424i 0.1516993-0.3951820i [3,] 1.3408366+0.2411456i 0.7695345-0.9029765i -0.0025455-0.3519700i [4,] 1.0233065-0.1171606i 0.8159900+0.5602756i -0.2027532-0.3271939i [5,] 0.6242701+0.8435828i -0.6898464+0.8374306i -1.0697871+0.0000000i [,4] [,5] [1,] -0.0702164+0.4598137i -0.01153373-0.01903537i [2,] 0.1673913-0.0116974i 0.66631933+0.00000000i [3,] -0.7267670+0.3653169i -0.18246584+0.19619636i [4,] 0.9639849-0.0000000i -0.28432636+0.08075397i [5,] -0.2883506-0.1520081i 0.06831370+0.09270951i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators324# #argv <- list(c(0, 0, 0, 0, 0, 0, 4.94065645841247e-324, 0, 0, 0, 0, 0), structure(c(73.0102287440125, 79.6161885135717, 81.5497837663961, 53.9710956454646, 43.6831159601594, 20.8581884349194, 7.6155030786098, 10.8008470888011, 14.7201505829463, 8.49167208457355, 101.686214382123, 921.711710792497), .Names = c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1')));`%*%`(argv[[1]],argv[[2]]); [,1] [1,] 3.952525e-323 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators325# #argv <- list(-97.5074316406251, structure(c(73.0102287440125, 79.6161885135717, 81.5497837663961, 53.9710956454646, 43.6831159601594, 20.8581884349194, 7.6155030786098, 10.8008470888011, 14.7201505829463, 8.49167208457355, 101.686214382123, 921.711710792497), .Dim = c(1L, 12L), .Dimnames = list(NULL, c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'))));`%*%`(argv[[1]],argv[[2]]); 1 1 1 1 1 1 1 [1,] -7119.04 -7763.17 -7951.71 -5262.583 -4259.428 -2033.828 -742.5681 1 1 1 1 1 [1,] -1053.163 -1435.324 -828.0011 -9915.162 -89873.74 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators326# #argv <- list(structure(c(0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11), .Tsp = c(1959, 1997.91666667, 12), class = 'ts'), 3);`%/%`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec 1959 0 0 0 1 1 1 2 2 2 3 3 3 1960 0 0 0 1 1 1 2 2 2 3 3 3 1961 0 0 0 1 1 1 2 2 2 3 3 3 1962 0 0 0 1 1 1 2 2 2 3 3 3 1963 0 0 0 1 1 1 2 2 2 3 3 3 1964 0 0 0 1 1 1 2 2 2 3 3 3 1965 0 0 0 1 1 1 2 2 2 3 3 3 1966 0 0 0 1 1 1 2 2 2 3 3 3 1967 0 0 0 1 1 1 2 2 2 3 3 3 1968 0 0 0 1 1 1 2 2 2 3 3 3 1969 0 0 0 1 1 1 2 2 2 3 3 3 1970 0 0 0 1 1 1 2 2 2 3 3 3 1971 0 0 0 1 1 1 2 2 2 3 3 3 1972 0 0 0 1 1 1 2 2 2 3 3 3 1973 0 0 0 1 1 1 2 2 2 3 3 3 1974 0 0 0 1 1 1 2 2 2 3 3 3 1975 0 0 0 1 1 1 2 2 2 3 3 3 1976 0 0 0 1 1 1 2 2 2 3 3 3 1977 0 0 0 1 1 1 2 2 2 3 3 3 1978 0 0 0 1 1 1 2 2 2 3 3 3 1979 0 0 0 1 1 1 2 2 2 3 3 3 1980 0 0 0 1 1 1 2 2 2 3 3 3 1981 0 0 0 1 1 1 2 2 2 3 3 3 1982 0 0 0 1 1 1 2 2 2 3 3 3 1983 0 0 0 1 1 1 2 2 2 3 3 3 1984 0 0 0 1 1 1 2 2 2 3 3 3 1985 0 0 0 1 1 1 2 2 2 3 3 3 1986 0 0 0 1 1 1 2 2 2 3 3 3 1987 0 0 0 1 1 1 2 2 2 3 3 3 1988 0 0 0 1 1 1 2 2 2 3 3 3 1989 0 0 0 1 1 1 2 2 2 3 3 3 1990 0 0 0 1 1 1 2 2 2 3 3 3 1991 0 0 0 1 1 1 2 2 2 3 3 3 1992 0 0 0 1 1 1 2 2 2 3 3 3 1993 0 0 0 1 1 1 2 2 2 3 3 3 1994 0 0 0 1 1 1 2 2 2 3 3 3 1995 0 0 0 1 1 1 2 2 2 3 3 3 1996 0 0 0 1 1 1 2 2 2 3 3 3 1997 0 0 0 1 1 1 2 2 2 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators327# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE), .Dim = 4L, .Dimnames = list(c('8', '10', '12', '14'))));`!`(argv[[1]]); 8 10 12 14 TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators328# #argv <- list(350L, 7);`%/%`(argv[[1]],argv[[2]]); [1] 50 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators329# #argv <- list(34, 2L);`%/%`(argv[[1]],argv[[2]]); [1] 17 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators33# #argv <- list(c(20.8, 11.2, 6.2, 12.8, 43.4), c(10.4, 5.6, 3.1, 6.4, 21.7, 0, 10.4, 5.6, 3.1, 6.4, 21.7));`+`(argv[[1]],argv[[2]]); [1] 31.2 16.8 9.3 19.2 65.1 20.8 21.6 11.8 15.9 49.8 42.5 Warning message: In argv[[1]] + argv[[2]] : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators330# #argv <- list(TRUE, 0:10);`%/%`(argv[[1]],argv[[2]]); [1] NA 1 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators331# #argv <- list(structure(1L, .Names = 'rate'), 2);`%/%`(argv[[1]],argv[[2]]); rate 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators332#Output.IgnoreWarningContext# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));`%/%`(argv[[1]]); [1] c0 <0 rows> (or 0-length row.names) Warning message: In Ops.factor(left) : ‘%/%’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators333#Output.IgnoreWarningContext# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));`%/%`(argv[[1]],argv[[2]]); [1] c0 <0 rows> (or 0-length row.names) Warning message: In Ops.factor(left, right) : ‘%/%’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators334# #argv <- list(c(0, -1, 0, -1, -1, 0, NA, NA, 0, 0, 0, 0, 0, 15, 0, 17, 18, 0, 0, 0, NA, 0, 0, 0, 0, 0, NA, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 31, 0, 33, 34, 0, 0, 35, 0, 37, 38, 0), 2);`%/%`(argv[[1]],argv[[2]]); [1] 0 -1 0 -1 -1 0 NA NA 0 0 0 0 0 7 0 8 9 0 0 0 NA 0 0 0 0 [26] 0 NA 0 0 0 0 0 0 0 0 0 0 15 0 16 17 0 0 17 0 18 19 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators335# #argv <- list(structure(numeric(0), .Dim = c(0L, 0L)));`&`(argv[[1]]); Error in &argv[[1]] : 1 argument passed to '&' which requires 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators336#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`&`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘&’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators337# #argv <- list(c(TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE), c(TRUE, TRUE, TRUE, NA, FALSE, FALSE, TRUE, NA));`&`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE FALSE FALSE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators338# #argv <- list(structure(c(FALSE, FALSE), .Names = c('(Intercept)', 'age')));`!`(argv[[1]]); (Intercept) age TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators339# #argv <- list(c(FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE), structure(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Names = c('is.R', 'is.array', 'is.atomic', 'is.call', 'is.character', 'is.complex', 'is.data.frame', 'is.double', 'is.element', 'is.environment', 'is.expression', 'is.factor', 'is.finite', 'is.function', 'is.infinite', 'is.integer', 'is.language', 'is.list', 'is.loaded', 'is.logical', 'is.matrix', 'is.na', 'is.na.POSIXlt', 'is.na.data.frame', 'is.na.numeric_version', 'is.name', 'is.nan', 'is.null', 'is.numeric', 'is.numeric.Date', 'is.numeric.POSIXt', 'is.numeric.difftime', 'is.numeric_version', 'is.object', 'is.ordered', 'is.package_version', 'is.pairlist', 'is.primitive', 'is.qr', 'is.raw', 'is.recursive', 'is.single', 'is.symbol', 'is.table', 'is.unsorted', 'is.vector')));`&`(argv[[1]],argv[[2]]); is.R is.array is.atomic FALSE TRUE TRUE is.call is.character is.complex TRUE TRUE TRUE is.data.frame is.double is.element TRUE TRUE FALSE is.environment is.expression is.factor TRUE TRUE TRUE is.finite is.function is.infinite TRUE TRUE TRUE is.integer is.language is.list TRUE TRUE TRUE is.loaded is.logical is.matrix FALSE TRUE TRUE is.na is.na.POSIXlt is.na.data.frame TRUE FALSE FALSE is.na.numeric_version is.name is.nan FALSE TRUE TRUE is.null is.numeric is.numeric.Date TRUE TRUE FALSE is.numeric.POSIXt is.numeric.difftime is.numeric_version FALSE FALSE TRUE is.object is.ordered is.package_version TRUE TRUE TRUE is.pairlist is.primitive is.qr TRUE TRUE TRUE is.raw is.recursive is.single TRUE TRUE FALSE is.symbol is.table is.unsorted TRUE TRUE FALSE is.vector TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators34#Output.IgnoreWarningContext# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));`+`(argv[[1]],argv[[2]]); [1] c0 <0 rows> (or 0-length row.names) Warning message: In Ops.factor(left, right) : ‘+’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators340#Ignored.OutputFormatting# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Tsp = c(1790, 1970, 0.1), class = 'ts'), c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE));`&`(argv[[1]],argv[[2]]); Time Series: Start = 1790 End = 1970 Frequency = 0.1 [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators341#Ignored.OutputFormatting# #argv <- list(structure(c(TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(101L, 3L), .Dimnames = list(NULL, c('t1', '10 * t1', 't1 - 4')), .Tsp = c(1, 101, 1), class = c('mts', 'ts', 'matrix')), structure(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = c(101L, 3L), .Dimnames = list(NULL, c('t1', '10 * t1', 't1 - 4'))));`&`(argv[[1]],argv[[2]]); Time Series: Start = 1 End = 101 Frequency = 1 t1 10 * t1 t1 - 4 1 TRUE TRUE TRUE 2 FALSE FALSE TRUE 3 FALSE FALSE TRUE 4 FALSE FALSE TRUE 5 FALSE FALSE TRUE 6 FALSE FALSE FALSE 7 FALSE FALSE FALSE 8 FALSE FALSE FALSE 9 FALSE FALSE FALSE 10 FALSE FALSE FALSE 11 FALSE FALSE FALSE 12 FALSE FALSE FALSE 13 FALSE FALSE FALSE 14 FALSE FALSE FALSE 15 FALSE FALSE FALSE 16 FALSE FALSE FALSE 17 FALSE FALSE FALSE 18 FALSE FALSE FALSE 19 FALSE FALSE FALSE 20 FALSE FALSE FALSE 21 FALSE FALSE FALSE 22 FALSE FALSE FALSE 23 FALSE FALSE FALSE 24 FALSE FALSE FALSE 25 FALSE FALSE FALSE 26 FALSE FALSE FALSE 27 FALSE FALSE FALSE 28 FALSE FALSE FALSE 29 FALSE FALSE FALSE 30 FALSE FALSE FALSE 31 FALSE FALSE FALSE 32 FALSE FALSE FALSE 33 FALSE FALSE FALSE 34 FALSE FALSE FALSE 35 FALSE FALSE FALSE 36 FALSE FALSE FALSE 37 FALSE FALSE FALSE 38 FALSE FALSE FALSE 39 FALSE FALSE FALSE 40 FALSE FALSE FALSE 41 FALSE FALSE FALSE 42 FALSE FALSE FALSE 43 FALSE FALSE FALSE 44 FALSE FALSE FALSE 45 FALSE FALSE FALSE 46 FALSE FALSE FALSE 47 FALSE FALSE FALSE 48 FALSE FALSE FALSE 49 FALSE FALSE FALSE 50 FALSE FALSE FALSE 51 FALSE FALSE FALSE 52 FALSE FALSE FALSE 53 FALSE FALSE FALSE 54 FALSE FALSE FALSE 55 FALSE FALSE FALSE 56 FALSE FALSE FALSE 57 FALSE FALSE FALSE 58 FALSE FALSE FALSE 59 FALSE FALSE FALSE 60 FALSE FALSE FALSE 61 FALSE FALSE FALSE 62 FALSE FALSE FALSE 63 FALSE FALSE FALSE 64 FALSE FALSE FALSE 65 FALSE FALSE FALSE 66 FALSE FALSE FALSE 67 FALSE FALSE FALSE 68 FALSE FALSE FALSE 69 FALSE FALSE FALSE 70 FALSE FALSE FALSE 71 FALSE FALSE FALSE 72 FALSE FALSE FALSE 73 FALSE FALSE FALSE 74 FALSE FALSE FALSE 75 FALSE FALSE FALSE 76 FALSE FALSE FALSE 77 FALSE FALSE FALSE 78 FALSE FALSE FALSE 79 FALSE FALSE FALSE 80 FALSE FALSE FALSE 81 FALSE FALSE FALSE 82 FALSE FALSE FALSE 83 FALSE FALSE FALSE 84 FALSE FALSE FALSE 85 FALSE FALSE FALSE 86 FALSE FALSE FALSE 87 FALSE FALSE FALSE 88 FALSE FALSE FALSE 89 FALSE FALSE FALSE 90 FALSE FALSE FALSE 91 FALSE FALSE FALSE 92 FALSE FALSE FALSE 93 FALSE FALSE FALSE 94 FALSE FALSE FALSE 95 FALSE FALSE FALSE 96 FALSE FALSE FALSE 97 FALSE FALSE FALSE 98 FALSE FALSE FALSE 99 FALSE FALSE FALSE 100 FALSE FALSE FALSE 101 FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators342# #argv <- list(structure(c(NA, FALSE, TRUE, NA, FALSE, TRUE, NA, FALSE, TRUE), .Names = c(NA, 'FALSE', 'TRUE', NA, 'FALSE', 'TRUE', NA, 'FALSE', 'TRUE')), structure(c(NA, NA, NA, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE), .Names = c(NA, NA, NA, 'FALSE', 'FALSE', 'FALSE', 'TRUE', 'TRUE', 'TRUE')));`&`(argv[[1]],argv[[2]]); FALSE TRUE FALSE TRUE FALSE TRUE NA FALSE NA FALSE FALSE FALSE NA FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators343# #argv <- list(structure(508L, class = 'octmode'), '755');`&`(argv[[1]],argv[[2]]); [1] "754" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators344# #argv <- list(list());`&`(argv[[1]]); Error in &argv[[1]] : 1 argument passed to '&' which requires 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators345# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100', '101', '102', '103', '104', '105', '106', '107', '108', '109', '110', '111', '112', '113', '114', '115', '116', '117', '118', '119', '120', '121', '122', '123', '124', '125', '126', '127', '128', '129', '130', '131', '132', '133', '134', '135', '136', '137', '138', '139', '140', '141', '142', '143', '144', '145', '146')));`(`(argv[[1]]); 1 2 3 4 5 6 7 8 9 10 11 12 13 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 14 15 16 17 18 19 20 21 22 23 24 25 26 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 27 28 29 30 31 32 33 34 35 36 37 38 39 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 40 41 42 43 44 45 46 47 48 49 50 51 52 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 53 54 55 56 57 58 59 60 61 62 63 64 65 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE 66 67 68 69 70 71 72 73 74 75 76 77 78 FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE 79 80 81 82 83 84 85 86 87 88 89 90 91 TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 92 93 94 95 96 97 98 99 100 101 102 103 104 TRUE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE FALSE FALSE 105 106 107 108 109 110 111 112 113 114 115 116 117 FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE FALSE FALSE FALSE 118 119 120 121 122 123 124 125 126 127 128 129 130 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE FALSE FALSE FALSE 131 132 133 134 135 136 137 138 139 140 141 142 143 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 144 145 146 FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators347# #argv <- list(c(1-0i, 1+0i, 1+0i, 9.99999999999989e-01-5e-15i, 1+0i, 1+0i, 1-0i, 1e+00+9e-16i, 9.99999999999999e-01+3e-15i, 9.99999999999997e-01-3e-15i, 1e+00-1e-15i, 1+0i, 1+0i, 1e+00+1e-15i, 1+0i, 1+0i, 1+0i, 1-0i, 1+0i, 1e+00-5e-15i, 1-0i, 1+0i, 1+0i, 1+0i));`(`(argv[[1]]); [1] 1+0i 1+0i 1+0i 1-0i 1+0i 1+0i 1+0i 1+0i 1+0i 1-0i 1-0i 1+0i 1+0i 1+0i 1+0i [16] 1+0i 1+0i 1+0i 1+0i 1-0i 1+0i 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators348# #argv <- list(structure(c(0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11), .Tsp = c(1959, 1997.91666667, 12), class = 'ts'));`(`(argv[[1]]); Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec 1959 0 1 2 3 4 5 6 7 8 9 10 11 1960 0 1 2 3 4 5 6 7 8 9 10 11 1961 0 1 2 3 4 5 6 7 8 9 10 11 1962 0 1 2 3 4 5 6 7 8 9 10 11 1963 0 1 2 3 4 5 6 7 8 9 10 11 1964 0 1 2 3 4 5 6 7 8 9 10 11 1965 0 1 2 3 4 5 6 7 8 9 10 11 1966 0 1 2 3 4 5 6 7 8 9 10 11 1967 0 1 2 3 4 5 6 7 8 9 10 11 1968 0 1 2 3 4 5 6 7 8 9 10 11 1969 0 1 2 3 4 5 6 7 8 9 10 11 1970 0 1 2 3 4 5 6 7 8 9 10 11 1971 0 1 2 3 4 5 6 7 8 9 10 11 1972 0 1 2 3 4 5 6 7 8 9 10 11 1973 0 1 2 3 4 5 6 7 8 9 10 11 1974 0 1 2 3 4 5 6 7 8 9 10 11 1975 0 1 2 3 4 5 6 7 8 9 10 11 1976 0 1 2 3 4 5 6 7 8 9 10 11 1977 0 1 2 3 4 5 6 7 8 9 10 11 1978 0 1 2 3 4 5 6 7 8 9 10 11 1979 0 1 2 3 4 5 6 7 8 9 10 11 1980 0 1 2 3 4 5 6 7 8 9 10 11 1981 0 1 2 3 4 5 6 7 8 9 10 11 1982 0 1 2 3 4 5 6 7 8 9 10 11 1983 0 1 2 3 4 5 6 7 8 9 10 11 1984 0 1 2 3 4 5 6 7 8 9 10 11 1985 0 1 2 3 4 5 6 7 8 9 10 11 1986 0 1 2 3 4 5 6 7 8 9 10 11 1987 0 1 2 3 4 5 6 7 8 9 10 11 1988 0 1 2 3 4 5 6 7 8 9 10 11 1989 0 1 2 3 4 5 6 7 8 9 10 11 1990 0 1 2 3 4 5 6 7 8 9 10 11 1991 0 1 2 3 4 5 6 7 8 9 10 11 1992 0 1 2 3 4 5 6 7 8 9 10 11 1993 0 1 2 3 4 5 6 7 8 9 10 11 1994 0 1 2 3 4 5 6 7 8 9 10 11 1995 0 1 2 3 4 5 6 7 8 9 10 11 1996 0 1 2 3 4 5 6 7 8 9 10 11 1997 0 1 2 3 4 5 6 7 8 9 10 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators349# #argv <- list(structure(c(FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE), .Dim = c(3L, 3L)));`!`(argv[[1]]); [,1] [,2] [,3] [1,] TRUE FALSE FALSE [2,] TRUE TRUE FALSE [3,] TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators35# #argv <- list(c(3, 1, 2, 2, 3.2, -1, 1, 3.2, 4, 3, 3.2, 3.2, 202, 241, 243), 0);`!=`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators350# #argv <- list(c(-Inf, 2.17292368994844e-311, 4.34584737989688e-311, 8.69169475979376e-311, 1.73833895195875e-310, 3.4766779039175e-310, 6.953355807835e-310, 1.390671161567e-309, 2.781342323134e-309, 5.562684646268e-309, 1.1125369292536e-308, 2.2250738585072e-308, 4.4501477170144e-308, 8.90029543402881e-308, 1.78005908680576e-307, 2.2250738585072e-303, 2.2250738585072e-298, 1.79769313486232e+298, 1.79769313486232e+303, 2.24711641857789e+307, 4.49423283715579e+307, 8.98846567431158e+307, 1.79769313486232e+308, Inf, Inf, NaN, NA));`(`(argv[[1]]); [1] -Inf 2.172924e-311 4.345847e-311 8.691695e-311 1.738339e-310 [6] 3.476678e-310 6.953356e-310 1.390671e-309 2.781342e-309 5.562685e-309 [11] 1.112537e-308 2.225074e-308 4.450148e-308 8.900295e-308 1.780059e-307 [16] 2.225074e-303 2.225074e-298 1.797693e+298 1.797693e+303 2.247116e+307 [21] 4.494233e+307 8.988466e+307 Inf Inf Inf [26] NaN NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators351#Ignored.OutputFormatting# #argv <- list(.Primitive('log'));`(`(argv[[1]]); function (x, base = exp(1)) .Primitive("log") ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators352# #argv <- list(structure(NA, .Dim = c(1L, 1L)));`(`(argv[[1]]); [,1] [1,] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators353# #argv <- list(structure(c(NA, 2, NA, 1, NA, 0), .Dim = 2:3));`(`(argv[[1]]); [,1] [,2] [,3] [1,] NA NA NA [2,] 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators354# #argv <- list(structure(list(A = c(1L, NA, 1L), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA, NA, NA), E = c(FALSE, NA, TRUE), F = structure(c(1L, NA, 2L), .Label = c('abc', 'def'), class = 'factor')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')));`(`(argv[[1]]); A B C D E F 1 1 1.1 1.1+0i NA FALSE abc 2 NA NA NA NA NA 3 1 2.0 3.0+0i NA TRUE def ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators355# #argv <- list(structure(NA, .Dim = c(1L, 1L), name = 'Sam', class = structure('Foo', package = '.GlobalEnv')));`(`(argv[[1]]); [,1] [1,] NA attr(,"name") [1] "Sam" attr(,"class") [1] "Foo" attr(,"class")attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators356# #argv <- list(structure(list(x = numeric(0), y = numeric(0), fac = structure(integer(0), .Label = c('A', 'B', 'C'), class = 'factor')), .Names = c('x', 'y', 'fac'), row.names = integer(0), class = 'data.frame'));`(`(argv[[1]]); [1] x y fac <0 rows> (or 0-length row.names) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators357# #argv <- list(structure(list(x = c(-2, -2, -2, -2, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, -1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 2, 2, 2, 2, 2, 2), y = c(1, 4, 5, 9, 0, 0, 1, 1, 1, 1, 2, 2, 2, 3, 3, 4, 4, 5, 5, 5, 6, 7, 8, 8, 9, 1, 1, 1, 1, 1, 2, 2, 2, 2, 2, 2, 2, 2, 3, 3, 3, 3, 3, 3, 4, 4, 4, 5, 5, 5, 5, 5, 6, 6, 6, 6, 6, 6, 7, 7, 7, 8, 8, 9, 9, 9, 0, 1, 1, 1, 1, 2, 3, 3, 3, 3, 3, 3, 3, 4, 4, 4, 5, 5, 7, 8, 8, 9, 9, 9, 9, 10, 10, 10, 1, 2, 3, 5, 5, 10), z = c(-2, 5, -1, 7, -8, 17, -4, -2, -1, 0, -8, -3, 6, -9, 4, -10, 4, -9, -3, 4, -3, 8, 2, 8, 14, -14, -2, -1, 8, 9, -13, -12, -9, 0, 0, 5, 12, 14, -3, -1, 3, 4, 6, 18, 2, 8, 12, -23, 0, 2, 3, 13, -12, -6, -2, 3, 5, 8, -1, 12, 15, -11, 3, 4, 8, 10, 0, -8, -5, 7, 8, 1, -11, -10, -7, -3, 2, 4, 18, -5, -3, 0, -18, -7, -16, -10, -5, -6, -5, -3, -3, -11, -1, 2, 20, 0, -7, -1, 9, 3), u = c(12, 2, 6, 36, 17, 38, 24, 25, 19, 21, 6, 5, 28, 41, 28, 10, 6, 48, 33, 2, 45, 45, 37, 0, 29, 8, 23, 21, 1, 48, 20, 24, 26, 34, 35, 5, 35, 26, 33, 20, 7, 17, 40, 9, 17, 48, 50, 47, 46, 42, 28, 1, 14, 17, 32, 48, 14, 20, 2, 19, 27, 37, 44, 41, 23, 50, 30, 19, 42, 16, 12, 35, 38, 30, 33, 17, 32, 4, 41, 13, 9, 41, 39, 31, 32, 32, 36, 33, 32, 19, 37, 27, 17, 39, 19, 48, 33, 33, 42, 44)), .Names = c('x', 'y', 'z', 'u'), row.names = c(67L, 84L, 24L, 14L, 81L, 28L, 97L, 98L, 99L, 72L, 46L, 74L, 91L, 75L, 1L, 45L, 35L, 6L, 3L, 58L, 54L, 65L, 80L, 13L, 52L, 71L, 12L, 86L, 32L, 89L, 78L, 5L, 88L, 2L, 90L, 57L, 66L, 76L, 77L, 41L, 62L, 23L, 27L, 16L, 33L, 29L, 47L, 82L, 26L, 79L, 49L, 53L, 34L, 38L, 17L, 42L, 69L, 7L, 36L, 37L, 10L, 64L, 51L, 60L, 100L, 30L, 85L, 48L, 8L, 44L, 92L, 22L, 9L, 31L, 94L, 63L, 20L, 87L, 21L, 73L, 39L, 59L, 55L, 40L, 96L, 68L, 15L, 43L, 83L, 25L, 50L, 18L, 19L, 93L, 56L, 70L, 4L, 61L, 95L, 11L), class = 'data.frame'));`(`(argv[[1]]); x y z u 67 -2 1 -2 12 84 -2 4 5 2 24 -2 5 -1 6 14 -2 9 7 36 81 -1 0 -8 17 28 -1 0 17 38 97 -1 1 -4 24 98 -1 1 -2 25 99 -1 1 -1 19 72 -1 1 0 21 46 -1 2 -8 6 74 -1 2 -3 5 91 -1 2 6 28 75 -1 3 -9 41 1 -1 3 4 28 45 -1 4 -10 10 35 -1 4 4 6 6 -1 5 -9 48 3 -1 5 -3 33 58 -1 5 4 2 54 -1 6 -3 45 65 -1 7 8 45 80 -1 8 2 37 13 -1 8 8 0 52 -1 9 14 29 71 0 1 -14 8 12 0 1 -2 23 86 0 1 -1 21 32 0 1 8 1 89 0 1 9 48 78 0 2 -13 20 5 0 2 -12 24 88 0 2 -9 26 2 0 2 0 34 90 0 2 0 35 57 0 2 5 5 66 0 2 12 35 76 0 2 14 26 77 0 3 -3 33 41 0 3 -1 20 62 0 3 3 7 23 0 3 4 17 27 0 3 6 40 16 0 3 18 9 33 0 4 2 17 29 0 4 8 48 47 0 4 12 50 82 0 5 -23 47 26 0 5 0 46 79 0 5 2 42 49 0 5 3 28 53 0 5 13 1 34 0 6 -12 14 38 0 6 -6 17 17 0 6 -2 32 42 0 6 3 48 69 0 6 5 14 7 0 6 8 20 36 0 7 -1 2 37 0 7 12 19 10 0 7 15 27 64 0 8 -11 37 51 0 8 3 44 60 0 9 4 41 100 0 9 8 23 30 0 9 10 50 85 1 0 0 30 48 1 1 -8 19 8 1 1 -5 42 44 1 1 7 16 92 1 1 8 12 22 1 2 1 35 9 1 3 -11 38 31 1 3 -10 30 94 1 3 -7 33 63 1 3 -3 17 20 1 3 2 32 87 1 3 4 4 21 1 3 18 41 73 1 4 -5 13 39 1 4 -3 9 59 1 4 0 41 55 1 5 -18 39 40 1 5 -7 31 96 1 7 -16 32 68 1 8 -10 32 15 1 8 -5 36 43 1 9 -6 33 83 1 9 -5 32 25 1 9 -3 19 50 1 9 -3 37 18 1 10 -11 27 19 1 10 -1 17 93 1 10 2 39 56 2 1 20 19 70 2 2 0 48 4 2 3 -7 33 61 2 5 -1 33 95 2 5 9 42 11 2 10 3 44 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators358# #argv <- list(structure(list(x = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1), y = c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10), fac = structure(c(1L, 2L, 2L, 3L, 1L, 3L, 3L, 2L, 2L, 1L), .Label = c('A', 'B', 'C'), class = 'factor'), char = structure(c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j'), class = 'AsIs')), .Names = c('x', 'y', 'fac', 'char'), row.names = c(NA, -10L), class = 'data.frame'));`(`(argv[[1]]); x y fac char 1 1 1 A a 2 1 2 B b 3 1 3 B c 4 1 4 C d 5 1 5 A e 6 1 6 C f 7 1 7 C g 8 1 8 B h 9 1 9 B i 10 1 10 A j ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators359# #argv <- list(c('«L', 'tin-1 ', '', '', 'ented ', 'h', 'rs»: éè øØ å<Å æ<Æ é éè'));`(`(argv[[1]]); [1] "«L" "tin-1 " [3] "" "" [5] "ented " "h" [7] "rs»: éè øØ å<Å æ<Æ é éè" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators36#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`+`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘+’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators360# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'), 'auto');`!=`(argv[[1]],argv[[2]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators361# #argv <- list(structure(c(6.36917889425777, 5.36917889425777, 6.36917889425777, 6.36917889425777, 6.36917889425777, 6.36917889425777, 6.36917889425777, 6.36917889425777, 6.36917889425777, 6.36917889425777, 6.36917889425777, 5.36917889425777, 6.36917889425777, 4.36917889425777, 5.36917889425777, 5.36917889425777, 6.36917889425777, 6.36917889425777, 4.36917889425777, 5.36917889425777, 6.36917889425777, 5.36917889425777, 6.36917889425777, 5.36917889425777, 6.36917889425777, 5.36917889425777, 6.36917889425777, 6.36917889425777, 6.36917889425777, 6.36917889425777, 6.36917889425777, 5.36917889425777, 6.36917889425777, 5.36917889425777, 6.36917889425777, 4.36917889425777, 5.36917889425777, 5.36917889425777), .Dim = 38L, .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38'))));`(`(argv[[1]]); 1 2 3 4 5 6 7 8 6.369179 5.369179 6.369179 6.369179 6.369179 6.369179 6.369179 6.369179 9 10 11 12 13 14 15 16 6.369179 6.369179 6.369179 5.369179 6.369179 4.369179 5.369179 5.369179 17 18 19 20 21 22 23 24 6.369179 6.369179 4.369179 5.369179 6.369179 5.369179 6.369179 5.369179 25 26 27 28 29 30 31 32 6.369179 5.369179 6.369179 6.369179 6.369179 6.369179 6.369179 5.369179 33 34 35 36 37 38 6.369179 5.369179 6.369179 4.369179 5.369179 5.369179 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators362# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE), .Dim = c(14L, 11L), .Dimnames = list(c('0-18', '18-19', '19-20', '20-21', '21-22', '22-23', '23-24', '24-25', '25-26', '26-27', '27-28', '28-29', '29-30', '30-31'), c('1954', '1955', '1956', '1957', '1958', '1959', '1960', '1961', '1962', '1963', '1964'))));`(`(argv[[1]]); 1954 1955 1956 1957 1958 1959 1960 1961 1962 1963 1964 0-18 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 18-19 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 19-20 FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 20-21 FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 21-22 FALSE FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE 22-23 FALSE FALSE FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE FALSE 23-24 FALSE FALSE FALSE FALSE FALSE TRUE TRUE FALSE FALSE FALSE FALSE 24-25 FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE FALSE FALSE FALSE 25-26 FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE FALSE FALSE 26-27 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE FALSE 27-28 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE 28-29 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE 29-30 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE 30-31 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators363# #argv <- list(structure(NA, .Tsp = c(1, 1, 1), .S3Class = 'ts', class = structure('ts', package = 'methods')));`(`(argv[[1]]); Time Series: Start = 1 End = 1 Frequency = 1 [1] NA attr(,".S3Class") [1] ts ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators364# #argv <- list(6, structure(c(-1, 1, -1), .Dim = 3L, .Dimnames = list(c('73', '312', '674'))));`*`(argv[[1]],argv[[2]]); 73 312 674 -6 6 -6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators365# #argv <- list(-0.0290053253855826, c(95, 175, 250, 350, 500, 675, 1000));`*`(argv[[1]],argv[[2]]); [1] -2.755506 -5.075932 -7.251331 -10.151864 -14.502663 -19.578595 -29.005325 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators366# #argv <- list(c(2L, 1L), c(2L, 2L));`*`(argv[[1]],argv[[2]]); [1] 4 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators367# #argv <- list(c(2.80068140446062, 1.8317224411983, 1.22900361620513, 0.0769946405427206, 2.80068140446062e-07), structure(c(-0.579458297883801, 0.378144472053104, 0.289151395420297, -0.322488635437406, 0.577604873429495, -0.439515769918701, -0.563213485796381, 0.19897761279598, -0.497766353148047, -0.449725499265461, -0.183421202297383, -0.367349618966443, -0.8113056422696, -0.10946638264776, 0.401511127970965, 0.369976492463818, -0.594590295135748, 0.453781444579942, 0.0303676587408212, 0.550218122031705, 0.548204365705284, 0.22652586176497, -0.112538595641497, -0.797072552569732, 0.012977588540091), .Dim = c(5L, 5L)));`*`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [1,] -1.622878e+00 -1.230944e+00 -5.137044e-01 1.036186e+00 1.535346e+00 [2,] 6.926557e-01 -1.031651e+00 -6.728825e-01 -1.089124e+00 4.149325e-01 [3,] 3.553681e-01 2.445442e-01 -9.970976e-01 5.576990e-01 -1.383103e-01 [4,] -2.482990e-02 -3.832534e-02 -8.428325e-03 2.338147e-03 -6.137031e-02 [5,] 1.617687e-07 -1.259538e-07 1.124505e-07 1.540986e-07 3.634609e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators368# #argv <- list(1.5, 1.5);`*`(argv[[1]],argv[[2]]); [1] 2.25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators369# #argv <- list(structure(c(0.853345363892062, -0.0256071578412401, -0.0612813871821256, -0.0612813871821256, -0.0256071578412401, -0.0612813871821256, -0.0256071578412401, -0.0612813871821256, -0.0256071578412401, 0, 0, 0.0786725879812683, 0.0786725879812683, 0.22692030644121, -0.254660745352065, -0.106413026892124, -0.254660745352065, -0.106413026892124, 0, 0, 0.11837902431235, 0.11837902431235, 0.243512113989909, -0.322431463531475, -0.134731829015137, -0.322431463531475, -0.134731829015137, 0, 0, 0.186882435497702, 0.186882435497702, 0.272137080615963, -0.439352693506895, -0.18358875815211, -0.439352693506895, -0.18358875815211, 0, 0, 0, 0, 0, 0, 0, 0.172822903136154, -0.345645806272308), .Dim = c(9L, 5L)), structure(c(1.03259546878074, -0.967404531219257, 0.032595468780743, 0.032595468780743, -0.967404531219257, 0.032595468780743, -0.967404531219257, 0.032595468780743, -0.967404531219257, 1.15961954033819, -0.840380459661814, 0.159619540338186, 0.159619540338186, -0.840380459661814, 0.159619540338186, -0.840380459661814, 0.159619540338186, -0.840380459661814, 1.16167819481816, -0.838321805181836, 0.161678194818164, 0.161678194818164, -0.838321805181836, 0.161678194818164, -0.838321805181836, 0.161678194818164, -0.838321805181836, 1.1652298823369, -0.834770117663101, 0.165229882336899, 0.165229882336899, -0.834770117663101, 0.165229882336899, -0.834770117663101, 0.165229882336899, -0.834770117663101, 1.17282290313615, -0.827177096863846, 0.172822903136154, 0.172822903136154, -0.827177096863846, 0.172822903136154, -0.827177096863846, 0.172822903136154, -0.827177096863846), .Dim = c(9L, 5L)));`*`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [1,] 0.881160556 0.00000000 0.00000000 0.00000000 0.00000000 [2,] 0.024772481 0.00000000 0.00000000 0.00000000 0.00000000 [3,] -0.001997496 0.01255768 0.01913931 0.03087856 0.00000000 [4,] -0.001997496 0.01255768 0.01913931 0.03087856 0.00000000 [5,] 0.024772481 -0.19069939 -0.20414151 -0.22717190 0.00000000 [6,] -0.001997496 -0.04064883 -0.05213014 -0.07259419 0.00000000 [7,] 0.024772481 0.08942743 0.11294863 0.15325441 0.00000000 [8,] -0.001997496 -0.04064883 -0.05213014 -0.07259419 0.02986776 [9,] 0.024772481 0.08942743 0.11294863 0.15325441 0.28591029 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators37# #argv <- list(logical(0));`+`(argv[[1]]); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators370# #argv <- list(0.5, structure(c(-1.12095129310443+0i, 1.4848874974+0.41132282301771i, 2.78279011158859-0.53526713626358i, 1.85742152822765-0.44342995809143i, -0.9385359708259+2.37692350427328i, 1.4848874974-0.41132282301771i, 0.921832411978405+0i, -0.90524740754917+0.341208007507433i, -0.18900237366429+1.08605076555264i, -0.66363688475825+1.22446591693656i, 2.78279011158859+0.53526713626358i, -0.90524740754917-0.341208007507433i, 0.801542901188104+0i, -1.85593444068452+0.95943368782835i, -1.58184558306131+0.08618435261084i, 1.85742152822765+0.44342995809143i, -0.18900237366429-1.08605076555264i, -1.85593444068452-0.95943368782835i, 1.40271180312737+0i, -1.20168263701907+0.42799687996867i, -0.9385359708259-2.37692350427328i, -0.66363688475825-1.22446591693656i, -1.58184558306131-0.08618435261084i, -1.20168263701907-0.42799687996867i, -1.25007853569851+0i), .Dim = c(5L, 5L)));`*`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] -0.5604756+0.0000000i 0.7424437-0.2056614i 1.3913951+0.2676336i [2,] 0.7424437+0.2056614i 0.4609162+0.0000000i -0.4526237-0.1706040i [3,] 1.3913951-0.2676336i -0.4526237+0.1706040i 0.4007715+0.0000000i [4,] 0.9287108-0.2217150i -0.0945012+0.5430254i -0.9279672+0.4797168i [5,] -0.4692680+1.1884618i -0.3318184+0.6122330i -0.7909228+0.0430922i [,4] [,5] [1,] 0.9287108+0.2217150i -0.4692680-1.1884618i [2,] -0.0945012-0.5430254i -0.3318184-0.6122330i [3,] -0.9279672-0.4797168i -0.7909228-0.0430922i [4,] 0.7013559+0.0000000i -0.6008413-0.2139984i [5,] -0.6008413+0.2139984i -0.6250393+0.0000000i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators371# #argv <- list(TRUE, TRUE);`!=`(argv[[1]],argv[[2]]); [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators372# #argv <- list(structure(1.6768574855882, .Names = 'x'), c(1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, NA));`*`(argv[[1]],argv[[2]]); [1] 1.676857 1.676857 1.676857 1.676857 1.676857 0.000000 0.000000 0.000000 [9] 0.000000 0.000000 0.000000 0.000000 0.000000 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators373# #argv <- list(structure(c(2134, 1863, 1877, 1877, 1492, 1249, 1280, 1131, 1209, 1492, 1621, 1846, 2103, 2137, 2153, 1833, 1403, 1288, 1186, 1133, 1053, 1347, 1545, 2066, 2020, 2750, 2283, 1479, 1189, 1160, 1113, 970, 999, 1208, 1467, 2059, 2240, 1634, 1722, 1801, 1246, 1162, 1087, 1013, 959, 1179, 1229, 1655, 2019, 2284, 1942, 1423, 1340, 1187, 1098, 1004, 970, 1140, 1110, 1812, 2263, 1820, 1846, 1531, 1215, 1075, 1056, 975), .Tsp = c(1974, 1979.58333333333, 12), class = 'ts'), c(-33.5, -32.5, -31.5, -30.5, -29.5, -28.5, -27.5, -26.5, -25.5, -24.5, -23.5, -22.5, -21.5, -20.5, -19.5, -18.5, -17.5, -16.5, -15.5, -14.5, -13.5, -12.5, -11.5, -10.5, -9.5, -8.5, -7.5, -6.5, -5.5, -4.5, -3.5, -2.5, -1.5, -0.5, 0.5, 1.5, 2.5, 3.5, 4.5, 5.5, 6.5, 7.5, 8.5, 9.5, 10.5, 11.5, 12.5, 13.5, 14.5, 15.5, 16.5, 17.5, 18.5, 19.5, 20.5, 21.5, 22.5, 23.5, 24.5, 25.5, 26.5, 27.5, 28.5, 29.5, 30.5, 31.5, 32.5, 33.5));`*`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul Aug 1974 -71489.0 -60547.5 -59125.5 -57248.5 -44014.0 -35596.5 -35200.0 -29971.5 1975 -45214.5 -43808.5 -41983.5 -33910.5 -24552.5 -21252.0 -18383.0 -16428.5 1976 -19190.0 -23375.0 -17122.5 -9613.5 -6539.5 -5220.0 -3895.5 -2425.0 1977 5600.0 5719.0 7749.0 9905.5 8099.0 8715.0 9239.5 9623.5 1978 29275.5 35402.0 32043.0 24902.5 24790.0 23146.5 22509.0 21586.0 1979 59969.5 50050.0 52611.0 45164.5 37057.5 33862.5 34320.0 32662.5 Sep Oct Nov Dec 1974 -30829.5 -36554.0 -38093.5 -41535.0 1975 -14215.5 -16837.5 -17767.5 -21693.0 1976 -1498.5 -604.0 733.5 3088.5 1977 10069.5 13558.5 15362.5 22342.5 1978 21825.0 26790.0 27195.0 46206.0 1979 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators374# #argv <- list(c(0.0125360439090882, 0.109084258765985, 0.283058130441221, 0.5, 0.716941869558779, 0.890915741234015, 0.987463956090912, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0.987463956090912, 0.890915741234015, 0.716941869558779, 0.5, 0.283058130441221, 0.109084258765985, 0.0125360439090882), structure(c(430.689117199391, 165.5304253221, 185.371733444809, 191.213041567518, -187.945650309773, -425.104342187064, -388.263034064356, -531.421725941647, -447.580417818938, -158.739109696229, -23.8978015735202, 206.943506549189, 469.784814671898, 509.626122794606, 531.467430917315, 217.308739040024, -206.849952837267, -316.008644714558, -412.167336591849, -459.32602846914, -533.484720346432, -233.643412223723, -29.8021041010139, 497.039204021695, 456.880512144404, 1192.72182026711, 731.563128389821, -66.5955634874696, -350.754255364761, -373.912947242052, -415.071639119343, -552.230330996634, -517.389022873925, -302.547714751216, -37.7064066285076, 560.134901494201, 746.97620961691, 146.817517739619, 240.658825862328, 325.500133985037, -223.658557892254, -301.817249769546, -370.975941646837, -439.134633524128, -487.293325401419, -261.45201727871, -205.610709156001, 226.230598966708, 596.071907089416, 866.913215212125, 530.754523334834, 17.5958314575429, -59.5628604197482, -206.721552297039, -289.880244174331, -378.038936051622, -406.197627928913, -230.356319806204, -254.515011683495, 453.326296439214, 910.167604561923, 473.008912684631, 504.85022080734, 195.691528930049, -114.467162947242, -248.625854824533, -261.784546701824, -336.943238579115, -366.101930456407, -219.260622333698, -0.419314210988802, 52.4219939117201), .Tsp = c(1974, 1979.91666666667, 12), class = 'ts'));`*`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May 1974 5.39913768 18.05676375 52.47097631 95.60652078 -134.74610591 1975 469.78481467 509.62612279 531.46743092 217.30873904 -206.84995284 1976 456.88051214 1192.72182027 731.56312839 -66.59556349 -350.75425536 1977 746.97620962 146.81751774 240.65882586 325.50013399 -223.65855789 1978 596.07190709 866.91321521 530.75452333 17.59583146 -59.56286042 1979 910.16760456 473.00891268 504.85022081 195.69152893 -114.46716295 Jun Jul Aug Sep Oct 1974 -378.73215012 -383.39575162 -531.42172594 -447.58041782 -158.73910970 1975 -316.00864471 -412.16733659 -459.32602847 -533.48472035 -233.64341222 1976 -373.91294724 -415.07163912 -552.23033100 -517.38902287 -302.54771475 1977 -301.81724977 -370.97594165 -439.13463352 -487.29332540 -261.45201728 1978 -206.72155230 -289.88024417 -378.03893605 -406.19762793 -230.35631981 1979 -245.50907019 -233.22797347 -241.56871540 -183.05096523 -62.06350184 Nov Dec 1974 -23.89780157 206.94350655 1975 -29.80210410 497.03920402 1976 -37.70640663 560.13490149 1977 -205.61070916 226.23059897 1978 -254.51501168 453.32629644 1979 -0.04574058 0.65716442 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators375# #argv <- list(structure(c(12L, 23L), .Dim = 2L, .Dimnames = structure(list(c('1', '2')), .Names = ''), class = 'table'), 1:2);`*`(argv[[1]],argv[[2]]); 1 2 12 46 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators376# #argv <- list(3, structure(2.39313505864491, .Names = 'x'));`*`(argv[[1]],argv[[2]]); x 7.179405 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators377# #argv <- list(30, 1:100);`*`(argv[[1]],argv[[2]]); [1] 30 60 90 120 150 180 210 240 270 300 330 360 390 420 450 [16] 480 510 540 570 600 630 660 690 720 750 780 810 840 870 900 [31] 930 960 990 1020 1050 1080 1110 1140 1170 1200 1230 1260 1290 1320 1350 [46] 1380 1410 1440 1470 1500 1530 1560 1590 1620 1650 1680 1710 1740 1770 1800 [61] 1830 1860 1890 1920 1950 1980 2010 2040 2070 2100 2130 2160 2190 2220 2250 [76] 2280 2310 2340 2370 2400 2430 2460 2490 2520 2550 2580 2610 2640 2670 2700 [91] 2730 2760 2790 2820 2850 2880 2910 2940 2970 3000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators378# #argv <- list(1, structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE), .Dim = c(14L, 11L), .Dimnames = list(c('0-18', '18-19', '19-20', '20-21', '21-22', '22-23', '23-24', '24-25', '25-26', '26-27', '27-28', '28-29', '29-30', '30-31'), c('1954', '1955', '1956', '1957', '1958', '1959', '1960', '1961', '1962', '1963', '1964'))));`*`(argv[[1]],argv[[2]]); 1954 1955 1956 1957 1958 1959 1960 1961 1962 1963 1964 0-18 0 0 0 0 0 0 0 0 0 0 0 18-19 0 0 0 0 0 0 0 0 0 0 0 19-20 0 1 1 0 0 0 0 0 0 0 0 20-21 0 0 1 1 0 0 0 0 0 0 0 21-22 0 0 0 1 1 0 0 0 0 0 0 22-23 0 0 0 0 1 1 0 0 0 0 0 23-24 0 0 0 0 0 1 1 0 0 0 0 24-25 0 0 0 0 0 0 1 1 0 0 0 25-26 0 0 0 0 0 0 0 1 1 0 0 26-27 0 0 0 0 0 0 0 0 1 1 0 27-28 0 0 0 0 0 0 0 0 0 1 1 28-29 0 0 0 0 0 0 0 0 0 0 1 29-30 0 0 0 0 0 0 0 0 0 0 0 30-31 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators379# #argv <- list(structure(c(125.462606837607, 127.867786930034, 130.144676735994, 132.324464274255, 134.336734211717, 136.082072800639, 137.721118421779, 140.845055930758, 143.28591535884, 145.768223343737, 146.185327931547, 145.802002908545, 149.002460060179, 153.598715100046, 155.183805036251, 159.724429366298, 161.673726141005, 170.116738471067, 169.947660568386, 170.006973600711, 170.719702563484, 171.765986080317, 174.613600436266, 179.048948110372, 179.883872548102, 181.827282092545, 184.331859119525, 182.743207226061, 183.03021399043, 184.153788490888, 191.745076839764, 194.148810101473, 199.10701170422, 199.286358868728, 202.588173234443, 206.570808710438, 208.901416980527, 210.197793333945, 208.990030330146, 213.988947898492, 221.910492791482, 225.858547195805, 224.629928649936, 225.693827143939, 226.925133971988, 227.909074259919, 228.294198948883, 226.413286455683, 224.858486784216, 224.205996780539, 218.296565215286, 217.952397420454, 218.203297324152, 222.634503912979, 229.136665168488, 238.199012563706, 241.084558136518, 244.474599589944, 246.541678441215, 249.943070595034, 252.738029658228, 257.655553126827, 261.948737901648, 259.38828865138, 260.581624400595, 261.35845107056, 266.721536928548, 274.727021103557, 279.519739428079, 285.613419212625, 290.081183406543, 292.578703689536, 298.536510073918, 301.854944861174, 306.72012690062, 308.552564035999, 308.960906756251, 310.45531361152, 314.471901471993, 316.180279500694, 321.131980519447, 324.487238338646, 326.432439140534, 330.587069598829, 332.257828918305, 334.897103376149, 336.500107838622, 341.040184577164, 343.37680996925, 346.04109648055, 350.540519967376, 353.909804788829, 360.713606630499, 365.246028758837, 368.653301499587, 371.870254918956, 371.890026901483, 370.974100279234, 368.423988230309, 364.248564265975, 359.879991232458, 359.533794053725, 361.493423852232, 366.272105696357, 374.712558672268, 373.691234302716, 377.311059795731, 378.958918379956, 378.434557854932, 383.493556594665, 388.051875855736, 394.72909801417, 399.975945122541, 406.14684914494, 404.223720368284, 407.657133649615, 412.1384117511, 418.253339402259, 423.102585806067, 430.610654889479, 439.381586214864, 443.452574204404, 446.154893648303, 437.948767898975, 448.065211483223, 452.98477480065, 456.22724907891, 460.426882491713, 459.053158913271, 461.490725714314, 468.825080012951, 470.090114620358), .Tsp = c(1950, 1960.91666666667, 12), class = 'ts'), structure(c(0.885377815022177, 0.956702662008391, 1.05604790005129, 0.99999180855271, 0.919180306022048, 1.08513403180744, 1.17950860096112, 1.17526020717901, 1.07399050289666, 0.935173924204861, 0.814655016855593, 0.918977224438701, 0.904886860495219, 0.974651014130265, 1.07318431817519, 1.01267995772422, 0.926294652616773, 1.09129604332202, 1.2136804527299, 1.19513265851781, 1.09196097114148, 0.920716625833028, 0.792428126174694, 0.944665370656132, 0.947060673767712, 0.975861204272186, 1.11889468518085, 1.01760687119493, 1.00966041750694, 1.06261400924208, 1.18646278417314, 1.17953219321689, 1.08299041001682, 0.934768432861068, 0.819582111385122, 0.933541960135008, 0.949299218066574, 0.984712956742138, 1.07274478711742, 1.00035738265237, 1.00344619530389, 1.136720297344, 1.19466716852011, 1.22110179994975, 1.06180417436075, 0.949583554116272, 0.837964127353819, 0.93707048913996, 0.942302022727904, 0.95126138690835, 1.10787035072032, 1.06044554393152, 1.0212841877174, 1.09777947829535, 1.18237485006198, 1.21101795468964, 1.05077474260124, 0.934482494680629, 0.806219558496273, 0.905507672627939, 0.919955309911582, 0.877743501942818, 1.0879384725907, 1.04844380534261, 1.05308404040641, 1.15209925173403, 1.2652951992685, 1.2229795664526, 1.06552999327079, 0.93588195611389, 0.816986956383517, 0.912235531149947, 0.943381852486145, 0.894360852742568, 1.04386693859046, 1.0412387923364, 1.04235110100738, 1.18519852082375, 1.32667886524828, 1.24804193460951, 1.09707745322343, 0.950576085705186, 0.817003170713368, 0.935893112057161, 0.94836946371363, 0.908951898620782, 1.03731973240637, 1.02419763657726, 1.03406277428866, 1.19743269363204, 1.31822462831668, 1.26862748613699, 1.10235655952769, 0.945803515760855, 0.82528228386107, 0.929397385899463, 0.948173569563647, 0.902518233330453, 1.05026106742455, 1.02180458893893, 1.03392834532348, 1.21128679495018, 1.32344975581348, 1.30039314766586, 1.11343783106856, 0.948475302349546, 0.826576551185179, 0.912962090088511, 0.926561968385747, 0.87353380715788, 1.00678775995668, 0.979149663293728, 1.01788806209298, 1.21041189004384, 1.34524520684843, 1.34901427843594, 1.0909897186673, 0.956150231433401, 0.823434379283845, 0.897915761073492, 0.942043948926554, 0.884990150921632, 1.03141421940795, 0.994229969777015, 1.03800763998638, 1.17962620510919, 1.3518161330406, 1.3629765592452, 1.11127249087291, 0.966786065425125, 0.843497574054032, 0.924445014403716), .Tsp = c(1950, 1960.91666666667, 12), class = 'ts'));`*`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul Aug 1950 111.0818 122.3315 137.4390 132.3234 123.4797 147.6673 162.4432 165.5296 1951 134.8304 149.7051 166.5408 161.7497 149.7575 185.6477 206.2622 203.1809 1952 170.3609 177.4382 206.2479 185.9607 184.7984 195.6844 227.4984 229.0048 1953 198.3100 206.9845 224.1930 214.0654 222.6752 256.7380 268.3580 275.5951 1954 211.8846 213.2785 241.8443 231.1266 222.8476 244.4036 270.9254 288.4633 1955 232.5077 226.1555 284.9841 271.9540 274.4143 301.1109 337.4815 335.9855 1956 281.6339 269.9672 320.1750 321.2769 322.0457 367.9512 417.2032 394.6062 1957 315.1032 304.4054 349.0582 349.2926 355.0732 414.3609 462.0911 448.9797 1958 352.6163 334.8109 386.9414 372.1909 372.0901 435.4985 478.4184 476.2977 1959 350.6431 334.9946 390.6859 386.4989 407.1307 491.6050 543.7800 549.9353 1960 413.9168 392.4512 460.1705 435.4218 465.0951 534.3527 616.7354 627.5510 Sep Oct Nov Dec 1950 153.8877 136.3186 119.0906 133.9887 1951 186.4193 158.1478 138.3687 169.1413 1952 215.6310 186.2866 166.0376 192.8425 1953 240.9501 216.4187 191.3023 212.1652 1954 253.3256 228.4572 198.7667 226.3254 1955 297.8367 267.3004 236.9925 266.9007 1956 352.3067 308.4498 266.6963 309.3942 1957 397.6350 345.4510 304.2430 345.6152 1958 417.2191 354.4369 311.8765 345.9751 1959 449.6388 399.9130 348.3972 386.6521 1960 510.1331 446.1628 395.4528 434.5725 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators38# #argv <- list(structure(c(0.2, -1.84560926910116e-17, -3.69226410848886e-17, 2.11212282911474e-17, 9.44321399451751e-18, 3.05608209061811e-17, 0.2, -5.35638147485559e-17, 5.12150597333887e-17, 1.92692213766805e-17, 6.57361167807833e-17, -7.28393619263486e-17, 0.2, 7.17735727503349e-17, 3.10850404080861e-17, -2.28831714606547e-17, 2.83709294123644e-17, 7.98995130974544e-17, 0.2, 0, 8.8841915809257e-17, -1.17177477007305e-16, -1.30709215062431e-16, 1.04641694001652e-16, 0.2), .Dim = c(5L, 5L), fracs = c('1/5', '0', '0', '0', '0', '0', '1/5', '0', '0', '0', '0', '0', '1/5', '0', '0', '0', '0', '0', '1/5', '0', '0', '0', '0', '0', '1/5'), class = c('fractions', 'matrix')), 1);`+`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [1,] 1.2 1.0 1.0 1.0 1.0 [2,] 1.0 1.2 1.0 1.0 1.0 [3,] 1.0 1.0 1.2 1.0 1.0 [4,] 1.0 1.0 1.0 1.2 1.0 [5,] 1.0 1.0 1.0 1.0 1.2 attr(,"fracs") [1] "1/5" "0" "0" "0" "0" "0" "1/5" "0" "0" "0" "0" "0" [13] "1/5" "0" "0" "0" "0" "0" "1/5" "0" "0" "0" "0" "0" [25] "1/5" attr(,"class") [1] "fractions" "matrix" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators380# #argv <- list(-3:3, 0+1i);`*`(argv[[1]],argv[[2]]); [1] 0-3i 0-2i 0-1i 0+0i 0+1i 0+2i 0+3i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators381# #argv <- list(181L, 3.14159265358979);`*`(argv[[1]],argv[[2]]); [1] 568.6283 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators39# #argv <- list(structure(c(-24.5833333333333, -5.08333333333333, 10.25, 19.4166666666667), .Dim = 4L, .Dimnames = structure(list(N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = 'N'), strata = structure('Within', .Names = 'N'), class = 'mtable'), structure(103.972222222222, class = 'mtable'));`+`(argv[[1]],argv[[2]]); N 0.0cwt 0.2cwt 0.4cwt 0.6cwt 79.38889 98.88889 114.22222 123.38889 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators4#Output.IgnoreWarningContext# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));`*`(argv[[1]],argv[[2]]); [1] c0 <0 rows> (or 0-length row.names) Warning message: In Ops.factor(left, right) : ‘*’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators40# #argv <- list(structure(1.2728543779194, .Names = 'Var1'), 1);`-`(argv[[1]],argv[[2]]); Var1 0.2728544 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators41# #argv <- list(1.15);`-`(argv[[1]]); [1] -1.15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators42# #argv <- list(structure(c(6316.53846153846, 6350.69230769231), .Dim = 2L, .Dimnames = list(c('1', '2'))), c(6314.13609467456, 6338.60946745562));`-`(argv[[1]],argv[[2]]); 1 2 2.402367 12.082840 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators43# #argv <- list(1, c(0.588534374722704, 0.346372710230244, 0.203852246436365, 0.119974054392244, 0.0706088550846872, 0.0244569805019377));`-`(argv[[1]],argv[[2]]); [1] 0.4114656 0.6536273 0.7961478 0.8800259 0.9293911 0.9755430 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators44# #argv <- list(structure(c(-0.560475646552213+0i, 0.7424437487+0i, 1.39139505579429+0i, 0.928710764113827+0i, -0.469267985412949+0i, 0.7424437487+0i, 0.460916205989202+0i, -0.452623703774585+0i, -0.0945011868321433+0i, -0.331818442379127+0i, 1.39139505579429+0i, -0.452623703774585+0i, 0.400771450594052+0i, -0.927967220342259+0i, -0.790922791530657+0i, 0.928710764113827+0i, -0.0945011868321433+0i, -0.927967220342259+0i, 0.701355901563686+0i, -0.600841318509537+0i, -0.469267985412949+0i, -0.331818442379127+0i, -0.790922791530657+0i, -0.600841318509537+0i, -0.625039267849257+0i), .Dim = c(5L, 5L)), structure(c(-0.560475646552213+0i, 0.742443748700001+0i, 1.39139505579429+0i, 0.928710764113827+0i, -0.469267985412949+0i, 0.742443748700001+0i, 0.460916205989202+0i, -0.452623703774585+0i, -0.094501186832143+0i, -0.331818442379127+0i, 1.39139505579429+0i, -0.452623703774585+0i, 0.400771450594052+0i, -0.927967220342258+0i, -0.790922791530656+0i, 0.928710764113827+0i, -0.094501186832143+0i, -0.927967220342258+0i, 0.701355901563685+0i, -0.600841318509537+0i, -0.469267985412949+0i, -0.331818442379127+0i, -0.790922791530656+0i, -0.600841318509537+0i, -0.625039267849256+0i), .Dim = c(5L, 5L)));`-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] 0.000000e+00+0i -9.992007e-16+0i 0.000000e+00+0i 0.000000e+00+0i [2,] -9.992007e-16+0i 0.000000e+00+0i 0.000000e+00+0i -3.053113e-16+0i [3,] 0.000000e+00+0i 0.000000e+00+0i 0.000000e+00+0i -9.992007e-16+0i [4,] 0.000000e+00+0i -3.053113e-16+0i -9.992007e-16+0i 9.992007e-16+0i [5,] 0.000000e+00+0i 0.000000e+00+0i -9.992007e-16+0i 0.000000e+00+0i [,5] [1,] 0.000000e+00+0i [2,] 0.000000e+00+0i [3,] -9.992007e-16+0i [4,] 0.000000e+00+0i [5,] -9.992007e-16+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators45# #argv <- list(38, 24L);`-`(argv[[1]],argv[[2]]); [1] 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators46# #argv <- list(structure(c(14, 2, 0, 2, -7, 0), .Dim = c(3L, 2L)), 0);`!=`(argv[[1]],argv[[2]]); [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE [3,] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators47# #argv <- list(1979.91666666667, structure(1979.91666666667, .Names = 'data'));`-`(argv[[1]],argv[[2]]); data 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators48# #argv <- list(41L, 0L);`-`(argv[[1]],argv[[2]]); [1] 41 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators49# #argv <- list(7.12801378828154e+22);`-`(argv[[1]]); [1] -7.128014e+22 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators5#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`*`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘*’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators50# #argv <- list(structure(c(315.42, 316.31, 316.5, 317.56, 318.13, 318, 316.39, 314.65, 313.68, 313.18, 314.66, 315.43, 316.27, 316.81, 317.42, 318.87, 319.87, 319.43, 318.01, 315.74, 314, 313.68, 314.84, 316.03), .Tsp = c(1959, 1960.91666666667, 12), class = 'ts'), structure(c(-0.234444444444459, 0.192638888888913, 0.743888888888894, 2.15972222222219, 3.13138888888888, 2.65888888888892, 0.480138888888822, -1.31611111111111, -2.34527777777775, -2.93819444444447, -1.58527777777776, -0.947361111111074, -0.234444444444459, 0.192638888888913, 0.743888888888894, 2.15972222222219, 3.13138888888888, 2.65888888888892, 0.480138888888822, -1.31611111111111, -2.34527777777775, -2.93819444444447, -1.58527777777776, -0.947361111111074), .Tsp = c(1959, 1960.91666666667, 12), class = 'ts'));`-`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul Aug 1959 315.6544 316.1174 315.7561 315.4003 314.9986 315.3411 315.9099 315.9661 1960 316.5044 316.6174 316.6761 316.7103 316.7386 316.7711 317.5299 317.0561 Sep Oct Nov Dec 1959 316.0253 316.1182 316.2453 316.3774 1960 316.3453 316.6182 316.4253 316.9774 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators51# #argv <- list(structure(c(94694400, 126230400, 157766400, 189302400, 220924800, 252460800, 283996800, 315532800, 362793600, 394329600, 425865600, 489024000, 567993600, 631152000, 662688000, 709948800, 741484800, 773020800, 820454400, 867715200, 915148800, 1136073600, 1230768000, 1341100800), class = c('POSIXct', 'POSIXt')), structure(c(78796800, 94694400, 126230400, 157766400, 189302400, 220924800, 252460800, 283996800, 315532800, 362793600, 394329600, 425865600, 489024000, 567993600, 631152000, 662688000, 709948800, 741484800, 773020800, 820454400, 867715200, 1136073600, 1230768000, 1341100800), class = c('POSIXct', 'POSIXt')));`-`(argv[[1]],argv[[2]]); Time differences in secs [1] 15897600 31536000 31536000 31536000 31622400 31536000 31536000 31536000 [9] 47260800 31536000 31536000 63158400 78969600 63158400 31536000 47260800 [17] 31536000 31536000 47433600 47260800 47433600 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators52# #argv <- list(structure(c(9, 12, 12, 15, 9, 9, 13, 11, 15, 10, 13, 13, 13, 15, 8, 13, 13, 10, 7, 9, 6, 11, 3, 5, 9, 3, 5, 1, 1, 2, NA, 10, 1, 4, 7, 4, NA, NA, 5, 2, 4, 3, 3, 6, 1, 1, 63, 41, 59, 50, 290, 226, 60, 36, 32, 121, 70, 51, 79, 32, 42, 39, 76, 60, 56, 88, 57, 309, 254, 146, 43, 78, 88, 314, 149, 78, NA, 238, 153, 159, 222, 203, NA, NA, 74, 100, 111, 9, 180, 50, 256, 107), .Dim = c(23L, 4L), .Dimnames = list(NULL, c('V1', 'V2', 'V3', 'V4'))), structure(c(10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 10.8260869565217, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 3.85, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 95.2608695652174, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9, 137.9), .Dim = c(23L, 4L)));`-`(argv[[1]],argv[[2]]); V1 V2 V3 V4 [1,] -1.826087 1.15 -32.26087 8.1 [2,] 1.173913 5.15 -54.26087 -94.9 [3,] 1.173913 -0.85 -36.26087 -59.9 [4,] 4.173913 1.15 -45.26087 -49.9 [5,] -1.826087 -2.85 194.73913 176.1 [6,] -1.826087 -2.85 130.73913 11.1 [7,] 2.173913 -1.85 -35.26087 -59.9 [8,] 0.173913 NA -59.26087 NA [9,] 4.173913 6.15 -63.26087 100.1 [10,] -0.826087 -2.85 25.73913 15.1 [11,] 2.173913 0.15 -25.26087 21.1 [12,] 2.173913 3.15 -44.26087 84.1 [13,] 2.173913 0.15 -16.26087 65.1 [14,] 4.173913 NA -63.26087 NA [15,] -2.826087 NA -53.26087 NA [16,] 2.173913 1.15 -56.26087 -63.9 [17,] 2.173913 -1.85 -19.26087 -37.9 [18,] -0.826087 0.15 -35.26087 -26.9 [19,] -3.826087 -0.85 -39.26087 -128.9 [20,] -1.826087 -0.85 -7.26087 42.1 [21,] -4.826087 2.15 -38.26087 -87.9 [22,] 0.173913 -2.85 213.73913 118.1 [23,] -7.826087 -2.85 158.73913 -30.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators53# #argv <- list(structure(c(58.56, 2.776, 61.341, 0, 0), .Names = c('user.self', 'sys.self', 'elapsed', 'user.child', 'sys.child'), class = 'proc_time'), structure(c(40.692, 0.307, 41, 0, 0), .Names = c('user.self', 'sys.self', 'elapsed', 'user.child', 'sys.child'), class = 'proc_time'));`-`(argv[[1]],argv[[2]]); user system elapsed 17.868 2.469 20.341 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators54# #argv <- list(0+1e-04i);`-`(argv[[1]]); [1] 0-1e-04i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators55# #argv <- list(structure(c(1.05569354979237, 0.694336127879446, -0.0222037058662105), .Dim = c(1L, 3L)), 0.055);`-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] 1.000694 0.6393361 -0.07720371 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators56# #argv <- list(structure(c(-50, 175, 149, 214, 247, 237, 225, 329, 729, 809, 530, 489, 540, 457, 195, 176, 337, 239, 128, 102, 232, 429, 3, 98, 43, -141, -77, -13, 125, 361, -45, 184), .Tsp = c(1951, 1958.75, 4), class = 'ts'), structure(c(NA, NA, 159.125, 204, 221.25, 245.125, 319.75, 451.5, 561.125, 619.25, 615.625, 548, 462.125, 381.125, 316.625, 264, 228.375, 210.75, 188.375, 199, 207.125, 191, 166.875, 72, -9.25, -33.125, -36.75, 36.25, 103, 131.625, NA, NA), .Tsp = c(1951, 1958.75, 4), class = 'ts'));`-`(argv[[1]],argv[[2]]); Qtr1 Qtr2 Qtr3 Qtr4 1951 NA NA -10.125 10.000 1952 25.750 -8.125 -94.750 -122.500 1953 167.875 189.750 -85.625 -59.000 1954 77.875 75.875 -121.625 -88.000 1955 108.625 28.250 -60.375 -97.000 1956 24.875 238.000 -163.875 26.000 1957 52.250 -107.875 -40.250 -49.250 1958 22.000 229.375 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators57# #argv <- list(structure(c(0, 1, 0, 2), .Names = c('age', 'strata(ss)', 'age2', 'age:strata(ss)')), 1);`!=`(argv[[1]],argv[[2]]); age strata(ss) age2 age:strata(ss) TRUE FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators58#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'), 1L);`-`(argv[[1]],argv[[2]]); [1] NA Warning message: In Ops.factor(argv[[1]], argv[[2]]) : ‘-’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators59# #argv <- list(50, structure(c(1, 2, 1, 3, 4, 4, 4, 1, 2, 2, 1, 4, 2, 1, 5, 5, 5, 1, 1, 5, 2, 4, 5, 2, 3, 2, 1, 1, 1, 3, 2, 2, 5, 5, 2, 1, 1, 4, 1, 1, 1, 6, 4, 1, 4, 2, 4, 1, 1, 1, 7, 7, 7, 8, 8, 9, 10, 7, 7, 10, 8, 7, 8, 9, 11, 7, 9, 10, 12, 7, 9, 7, 12, 9, 7, 7, 8, 8, 9, 11, 7, 7, 7, 13, 9, 10, 7, 8, 10, 8, 9, 9, 7, 7, 9, 10, 10, 7, 11, 10, 14, 14, 12, 14, 14, 15, 14, 14, 15, 13, 8, 12, 12, 15, 15, 12, 13, 13, 15, 15, 12, 14, 15, 12, 13, 13, 12, 13, 15, 13, 15, 13, 15, 13, 14, 12, 14, 13, 9, 12, 12, 8, 14, 14, 12, 12, 12, 12, 13, 13, 4, 1, 4, 2, 1, 1, 1, 4, 3, 3, 4, 3, 1, 4, 1, 4, 1, 4, 2, 4, 3, 1, 4, 1, 4, 3, 2, 4, 2, 2, 3, 1, 4, 4, 1, 2, 2, 1, 4, 2, 4, 2, 1, 4, 3, 1, 1, 4, 4, 2, 10, 10, 8, 12, 7, 10, 7, 10, 8, 7, 7, 10, 7, 10, 7, 11, 10, 7, 8, 10, 13, 11, 13, 10, 10, 10, 7, 9, 10, 7, 8, 10, 10, 14, 10, 7, 10, 12, 7, 7, 13, 10, 10, 10, 10, 7, 7, 10, 7, 7, 15, 15, 15, 13, 15, 14, 13, 15, 14, 12, 9, 15, 13, 14, 14, 13, 14, 14, 14, 14, 13, 13, 14, 8, 14, 14, 8, 9, 14, 12, 12, 9, 14, 9, 13, 15, 13, 14, 13, 8, 15, 12, 15, 15, 15, 8, 15, 13, 14, 14), .Dim = c(150L, 2L), .Dimnames = list(NULL, c('cluster', 'neighbor'))));`-`(argv[[1]],argv[[2]]); cluster neighbor [1,] 49 46 [2,] 48 49 [3,] 49 46 [4,] 47 48 [5,] 46 49 [6,] 46 49 [7,] 46 49 [8,] 49 46 [9,] 48 47 [10,] 48 47 [11,] 49 46 [12,] 46 47 [13,] 48 49 [14,] 49 46 [15,] 45 49 [16,] 45 46 [17,] 45 49 [18,] 49 46 [19,] 49 48 [20,] 45 46 [21,] 48 47 [22,] 46 49 [23,] 45 46 [24,] 48 49 [25,] 47 46 [26,] 48 47 [27,] 49 48 [28,] 49 46 [29,] 49 48 [30,] 47 48 [31,] 48 47 [32,] 48 49 [33,] 45 46 [34,] 45 46 [35,] 48 49 [36,] 49 48 [37,] 49 48 [38,] 46 49 [39,] 49 46 [40,] 49 48 [41,] 49 46 [42,] 44 48 [43,] 46 49 [44,] 49 46 [45,] 46 47 [46,] 48 49 [47,] 46 49 [48,] 49 46 [49,] 49 46 [50,] 49 48 [51,] 43 40 [52,] 43 40 [53,] 43 42 [54,] 42 38 [55,] 42 43 [56,] 41 40 [57,] 40 43 [58,] 43 40 [59,] 43 42 [60,] 40 43 [61,] 42 43 [62,] 43 40 [63,] 42 43 [64,] 41 40 [65,] 39 43 [66,] 43 39 [67,] 41 40 [68,] 40 43 [69,] 38 42 [70,] 43 40 [71,] 41 37 [72,] 43 39 [73,] 38 37 [74,] 41 40 [75,] 43 40 [76,] 43 40 [77,] 42 43 [78,] 42 41 [79,] 41 40 [80,] 39 43 [81,] 43 42 [82,] 43 40 [83,] 43 40 [84,] 37 36 [85,] 41 40 [86,] 40 43 [87,] 43 40 [88,] 42 38 [89,] 40 43 [90,] 42 43 [91,] 41 37 [92,] 41 40 [93,] 43 40 [94,] 43 40 [95,] 41 40 [96,] 40 43 [97,] 40 43 [98,] 43 40 [99,] 39 43 [100,] 40 43 [101,] 36 35 [102,] 36 35 [103,] 38 35 [104,] 36 37 [105,] 36 35 [106,] 35 36 [107,] 36 37 [108,] 36 35 [109,] 35 36 [110,] 37 38 [111,] 42 41 [112,] 38 35 [113,] 38 37 [114,] 35 36 [115,] 35 36 [116,] 38 37 [117,] 37 36 [118,] 37 36 [119,] 35 36 [120,] 35 36 [121,] 38 37 [122,] 36 37 [123,] 35 36 [124,] 38 42 [125,] 37 36 [126,] 37 36 [127,] 38 42 [128,] 37 41 [129,] 35 36 [130,] 37 38 [131,] 35 38 [132,] 37 41 [133,] 35 36 [134,] 37 41 [135,] 36 37 [136,] 38 35 [137,] 36 37 [138,] 37 36 [139,] 41 37 [140,] 38 42 [141,] 38 35 [142,] 42 38 [143,] 36 35 [144,] 36 35 [145,] 38 35 [146,] 38 42 [147,] 38 35 [148,] 38 37 [149,] 37 36 [150,] 37 36 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators6# #argv <- list(structure(5.34872109992236, .Names = 'x'), structure(-17494.4659893938, .Names = 'x'));`*`(argv[[1]],argv[[2]]); x -93573.02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators60# #argv <- list(structure(c(1L, 1L, 1L, 2L, 2L, 2L, 3L, 3L, 3L), .Dim = c(3L, 3L)), structure(c(1L, 2L, 3L, 1L, 2L, 3L, 1L, 2L, 3L), .Dim = c(3L, 3L)));`-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] 0 1 2 [2,] -1 0 1 [3,] -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators61# #argv <- list(structure(c(1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1), .Dim = c(7L, 7L), .Dimnames = list(NULL, NULL)), c(1, 0, 0, 0, 0, 0, 0));`-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [1,] 0 -1 -1 -1 -1 -1 -1 [2,] 0 1 0 0 0 0 0 [3,] 0 0 1 0 0 0 0 [4,] 0 0 0 1 0 0 0 [5,] 0 0 0 0 1 0 0 [6,] 0 0 0 0 0 1 0 [7,] 0 0 0 0 0 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators62# #argv <- list(c(1, 0, 0, 0, 0, 0, 0, 0, 0, 0), structure(c(1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1), .Dim = c(10L, 10L)));`-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] 0 1 1 1 1 1 1 1 1 1 [2,] 0 -1 0 0 0 0 0 0 0 0 [3,] 0 0 -1 0 0 0 0 0 0 0 [4,] 0 0 0 -1 0 0 0 0 0 0 [5,] 0 0 0 0 -1 0 0 0 0 0 [6,] 0 0 0 0 0 -1 0 0 0 0 [7,] 0 0 0 0 0 0 -1 0 0 0 [8,] 0 0 0 0 0 0 0 -1 0 0 [9,] 0 0 0 0 0 0 0 0 -1 0 [10,] 0 0 0 0 0 0 0 0 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators63# #argv <- list(structure(list(war = c(1L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 2L, 1L, 1L, 2L), fly = c(1L, 2L, 1L, 1L, 1L, 1L, 2L, 2L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), ver = c(1L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 1L, 2L), end = c(1L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 2L, 1L, 2L, 1L, NA, 1L, 1L, 2L, 1L, 1L, NA, 2L), gro = c(2L, 2L, 1L, 1L, 2L, 2L, 2L, 1L, 2L, 1L, NA, 2L, 2L, 1L, NA, 2L, 2L, NA, 1L, 2L), hai = c(1L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 2L, 1L, 2L, 1L)), .Names = c('war', 'fly', 'ver', 'end', 'gro', 'hai'), class = 'data.frame', row.names = c('ant', 'bee', 'cat', 'cpl', 'chi', 'cow', 'duc', 'eag', 'ele', 'fly', 'fro', 'her', 'lio', 'liz', 'lob', 'man', 'rab', 'sal', 'spi', 'wha')), 1);`-`(argv[[1]],argv[[2]]); war fly ver end gro hai ant 0 0 0 0 1 0 bee 0 1 0 0 1 1 cat 1 0 1 0 0 1 cpl 0 0 0 0 0 1 chi 1 0 1 1 1 1 cow 1 0 1 0 1 1 duc 1 1 1 0 1 0 eag 1 1 1 1 0 0 ele 1 0 1 1 1 0 fly 0 1 0 0 0 0 fro 0 0 1 1 NA 0 her 0 0 1 0 1 0 lio 1 0 1 NA 1 1 liz 0 0 1 0 0 0 lob 0 0 0 0 NA 0 man 1 0 1 1 1 1 rab 1 0 1 0 1 1 sal 0 0 1 0 NA 0 spi 0 0 0 NA 0 1 wha 1 0 1 1 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators64#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`-`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘-’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators65# #argv <- list(c(41L, 36L, 12L, 18L, NA, 28L, 23L, 19L, 8L, NA, 7L, 16L, 11L, 14L, 18L, 14L, 34L, 6L, 30L, 11L, 1L, 11L, 4L, 32L, NA, NA, NA, 23L, 45L, 115L, 37L, NA, NA, NA, NA, NA, NA, 29L, NA, 71L, 39L, NA, NA, 23L, NA, NA, 21L, 37L, 20L, 12L, 13L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 135L, 49L, 32L, NA, 64L, 40L, 77L, 97L, 97L, 85L, NA, 10L, 27L, NA, 7L, 48L, 35L, 61L, 79L, 63L, 16L, NA, NA, 80L, 108L, 20L, 52L, 82L, 50L, 64L, 59L, 39L, 9L, 16L, 78L, 35L, 66L, 122L, 89L, 110L, NA, NA, 44L, 28L, 65L, NA, 22L, 59L, 23L, 31L, 44L, 21L, 9L, NA, 45L, 168L, 73L, NA, 76L, 118L, 84L, 85L, 96L, 78L, 73L, 91L, 47L, 32L, 20L, 23L, 21L, 24L, 44L, 21L, 28L, 9L, 13L, 46L, 18L, 13L, 24L, 16L, 13L, 23L, 36L, 7L, 14L, 30L, NA, 14L, 18L, 20L));`-`(argv[[1]]); [1] -41 -36 -12 -18 NA -28 -23 -19 -8 NA -7 -16 -11 -14 -18 [16] -14 -34 -6 -30 -11 -1 -11 -4 -32 NA NA NA -23 -45 -115 [31] -37 NA NA NA NA NA NA -29 NA -71 -39 NA NA -23 NA [46] NA -21 -37 -20 -12 -13 NA NA NA NA NA NA NA NA NA [61] NA -135 -49 -32 NA -64 -40 -77 -97 -97 -85 NA -10 -27 NA [76] -7 -48 -35 -61 -79 -63 -16 NA NA -80 -108 -20 -52 -82 -50 [91] -64 -59 -39 -9 -16 -78 -35 -66 -122 -89 -110 NA NA -44 -28 [106] -65 NA -22 -59 -23 -31 -44 -21 -9 NA -45 -168 -73 NA -76 [121] -118 -84 -85 -96 -78 -73 -91 -47 -32 -20 -23 -21 -24 -44 -21 [136] -28 -9 -13 -46 -18 -13 -24 -16 -13 -23 -36 -7 -14 -30 NA [151] -14 -18 -20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators66# #argv <- list(structure(c(0.163529648037515, 0.690300939958932, 1.33873438218701, 1.66977334065937, 2.08385700655167, 1.90103052674775, 1.24826888183738, -0.346530864750065, -2.02114485014442, -1.391176571206, -0.974900546993623, -0.592397172772186, 1.12800897451332, 1.28932367812798, 1.52806194332292, 0.902674841819288, -0.592397172772186, -1.58883249200006, -2.79944983904467, -2.38660462363888, 1.11301751209174, 0.656516272159253, 0.0219290473645453, -0.905668755424301, -1.30280742075591, -1.17239032526075, -0.455509560368709, -0.00488221008611145, 1.01557266990962, 1.33518324209154, 1.7902682423845, 1.2223240303426, -0.642532985196542, -2.3156528876666, -2.94255068268534, -2.71429203070436, -2.52857488490927, -1.36967036598504, -0.673867141366977, 0.557834355527559, -1.17239032526075, -0.455509560368709, -0.00488221008611145, 1.01557266990962, 1.33518324209154, 1.7902682423845, 1.2223240303426, -0.642532985196542, -2.3156528876666, -2.94255068268534, -2.71429203070436, -2.52857488490927, -1.36967036598504, -0.673867141366977, 0.557834355527559, 1.69565743430218, 1.55297632585292, -0.231087508986891, -1.95215197865747, -1.57567440742255, 1.27884061694483, 1.52424121861625, -1.01140094921315, -0.834671205684972, -0.234500481583131, 0.163529648037515, 0.690300939958932, 1.33873438218701, 1.66977334065937, 2.08385700655167, 1.90103052674775, 1.24826888183738, -0.346530864750065, -2.02114485014442, -1.391176571206, -0.974900546993623, -0.592397172772186, 1.12800897451332, 1.28932367812798, 1.52806194332292, -0.720008297364832, -0.01169886906521, 0.795118935598027, 1.30411137828236, 1.35630335130608, 1.05258722945331, -0.0781544111924379, -0.905668755424301, -1.14228052378938, -1.10485411827026, -0.292564282537893, 0.785919238699603, 1.49889320873226, 2.20687990315498, 1.74950266694519, -0.073778036592639, -1.06484878365656, -0.447016940323056, -0.725579342414288, 0.0582966915354195, 1.55297632585292, -0.231087508986891, -1.95215197865747, -1.57567440742255, -0.647687635785206, 0.0245710568273836, 0.569377384809234, 1.54435558280902, 2.246266557697, 2.14425394955264, 1.63506382167997, 0.909232242365448, -0.762567911783628, -0.660691720208413), .Dim = c(114L, 1L), .Dimnames = list(NULL, 'Series 1'), .Tsp = c(1, 114, 1), class = 'ts'), structure(c(-1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16, -1.79193891693885e-16), .Dim = c(114L, 1L)));`-`(argv[[1]],argv[[2]]); Time Series: Start = 1 End = 114 Frequency = 1 Series 1 [1,] 0.16352965 [2,] 0.69030094 [3,] 1.33873438 [4,] 1.66977334 [5,] 2.08385701 [6,] 1.90103053 [7,] 1.24826888 [8,] -0.34653086 [9,] -2.02114485 [10,] -1.39117657 [11,] -0.97490055 [12,] -0.59239717 [13,] 1.12800897 [14,] 1.28932368 [15,] 1.52806194 [16,] 0.90267484 [17,] -0.59239717 [18,] -1.58883249 [19,] -2.79944984 [20,] -2.38660462 [21,] 1.11301751 [22,] 0.65651627 [23,] 0.02192905 [24,] -0.90566876 [25,] -1.30280742 [26,] -1.17239033 [27,] -0.45550956 [28,] -0.00488221 [29,] 1.01557267 [30,] 1.33518324 [31,] 1.79026824 [32,] 1.22232403 [33,] -0.64253299 [34,] -2.31565289 [35,] -2.94255068 [36,] -2.71429203 [37,] -2.52857488 [38,] -1.36967037 [39,] -0.67386714 [40,] 0.55783436 [41,] -1.17239033 [42,] -0.45550956 [43,] -0.00488221 [44,] 1.01557267 [45,] 1.33518324 [46,] 1.79026824 [47,] 1.22232403 [48,] -0.64253299 [49,] -2.31565289 [50,] -2.94255068 [51,] -2.71429203 [52,] -2.52857488 [53,] -1.36967037 [54,] -0.67386714 [55,] 0.55783436 [56,] 1.69565743 [57,] 1.55297633 [58,] -0.23108751 [59,] -1.95215198 [60,] -1.57567441 [61,] 1.27884062 [62,] 1.52424122 [63,] -1.01140095 [64,] -0.83467121 [65,] -0.23450048 [66,] 0.16352965 [67,] 0.69030094 [68,] 1.33873438 [69,] 1.66977334 [70,] 2.08385701 [71,] 1.90103053 [72,] 1.24826888 [73,] -0.34653086 [74,] -2.02114485 [75,] -1.39117657 [76,] -0.97490055 [77,] -0.59239717 [78,] 1.12800897 [79,] 1.28932368 [80,] 1.52806194 [81,] -0.72000830 [82,] -0.01169887 [83,] 0.79511894 [84,] 1.30411138 [85,] 1.35630335 [86,] 1.05258723 [87,] -0.07815441 [88,] -0.90566876 [89,] -1.14228052 [90,] -1.10485412 [91,] -0.29256428 [92,] 0.78591924 [93,] 1.49889321 [94,] 2.20687990 [95,] 1.74950267 [96,] -0.07377804 [97,] -1.06484878 [98,] -0.44701694 [99,] -0.72557934 [100,] 0.05829669 [101,] 1.55297633 [102,] -0.23108751 [103,] -1.95215198 [104,] -1.57567441 [105,] -0.64768764 [106,] 0.02457106 [107,] 0.56937738 [108,] 1.54435558 [109,] 2.24626656 [110,] 2.14425395 [111,] 1.63506382 [112,] 0.90923224 [113,] -0.76256791 [114,] -0.66069172 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators67# #argv <- list(c(4L, 3L, 2L, 1L, 2L, 3L, 4L, 5L), 0+5i);`-`(argv[[1]],argv[[2]]); [1] 4-5i 3-5i 2-5i 1-5i 2-5i 3-5i 4-5i 5-5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators68# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'), structure(integer(0), .Label = character(0), class = 'factor'));`!=`(argv[[1]],argv[[2]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators69#Output.IgnoreWarningContext# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));`-`(argv[[1]],argv[[2]]); [1] c0 <0 rows> (or 0-length row.names) Warning message: In Ops.factor(left, right) : ‘-’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators7# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 0, 0, 1, 1, 1, 1, 0, 0, 0.5, 0.5, 1, 1, 0, 0, 0, 0, 0, 1), .Dim = c(6L, 4L)), c(1, 1, 1, 0, 0, 0));`*`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] 1 0 0.0 0 [2,] 1 0 0.0 0 [3,] 1 1 0.5 0 [4,] 0 0 0.0 0 [5,] 0 0 0.0 0 [6,] 0 0 0.0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators70# #argv <- list(1, structure(c(0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59), .Tsp = c(0, 59, 1), class = 'ts'));`-`(argv[[1]],argv[[2]]); Time Series: Start = 0 End = 59 Frequency = 1 [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 [20] -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 -34 -35 -36 [39] -37 -38 -39 -40 -41 -42 -43 -44 -45 -46 -47 -48 -49 -50 -51 -52 -53 -54 -55 [58] -56 -57 -58 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators71# #argv <- list(-3.14159265358979, 3.14159265358979);`:`(argv[[1]],argv[[2]]); [1] -3.1415927 -2.1415927 -1.1415927 -0.1415927 0.8584073 1.8584073 2.8584073 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators72#Ignored.ImplementationError# #argv <- list(structure(c(1L, 1L, 1L, 2L, 2L, 2L), .Label = c('1', '2'), class = 'factor'), structure(c(1L, 1L, 2L, 2L, 3L, 3L), .Label = c('1', '2', '3'), class = 'factor'));`:`(argv[[1]],argv[[2]]); [1] 1:1 1:1 1:2 2:2 2:3 2:3 Levels: 1:1 1:2 1:3 2:1 2:2 2:3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators74# #argv <- list(0.5, -0.5);`:`(argv[[1]],argv[[2]]); [1] 0.5 -0.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators75# #argv <- list(101L, 1L);`:`(argv[[1]],argv[[2]]); [1] 101 100 99 98 97 96 95 94 93 92 91 90 89 88 87 86 85 84 [19] 83 82 81 80 79 78 77 76 75 74 73 72 71 70 69 68 67 66 [37] 65 64 63 62 61 60 59 58 57 56 55 54 53 52 51 50 49 48 [55] 47 46 45 44 43 42 41 40 39 38 37 36 35 34 33 32 31 30 [73] 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 [91] 11 10 9 8 7 6 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators76# #argv <- list(FALSE, 1);`:`(argv[[1]],argv[[2]]); [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators77# #argv <- list(structure(c(0, 4.44089209850063e-16, 8.88178419700125e-16, 1.66533453693773e-15, 2.22044604925031e-16, 3.33066907387547e-16, 2.77555756156289e-16, 5.55111512312578e-17, 8.32667268468867e-17, 1.66533453693773e-16, 8.88178419700125e-16, 1.11022302462516e-16, 2.44249065417534e-15, 2.22044604925031e-16, 1.11022302462516e-16, 1.88737914186277e-15, 1.11022302462516e-16, 2.22044604925031e-16, 1.4432899320127e-15, 8.88178419700125e-16, 3.33066907387547e-16, 1.66533453693773e-16, 1.11022302462516e-16, 7.7715611723761e-16, 1.11022302462516e-16), .Dim = c(5L, 5L)), 2.22044604925031e-13);`<`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [,5] [1,] TRUE TRUE TRUE TRUE TRUE [2,] TRUE TRUE TRUE TRUE TRUE [3,] TRUE TRUE TRUE TRUE TRUE [4,] TRUE TRUE TRUE TRUE TRUE [5,] TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators78# #argv <- list(1, 4);`<`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators79# #argv <- list(NULL, NULL);`!=`(argv[[1]],argv[[2]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators8# #argv <- list(0.5, c(0.0945457474962427, 0.369817831189094, 0.485958087431202, 0.498816870239398, 0.499902671395055));`+`(argv[[1]],argv[[2]]); [1] 0.5945457 0.8698178 0.9859581 0.9988169 0.9999027 ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators80# #argv <- list(structure(1L, .Label = c('A', 'B', 'C'), class = c('ordered', 'factor')), structure(3L, .Label = c('A', 'B', 'C'), class = c('ordered', 'factor')));`<`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators81# #argv <- list(structure(1386500270.17764, class = c('POSIXct', 'POSIXt')), structure(c(1383854025.35606, 1386388510.66806), class = c('POSIXct', 'POSIXt')));`<`(argv[[1]],argv[[2]]); [1] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators82# #argv <- list(c(0.999998001700552, -0.0013118835870674, -0.000526551904329415, 0.999999038344567, -0.000903475278483392, -0.000381296378838388, 0.999999057686544, -0.000896140095625969, -0.000373156128147092, 0.999998405868953, -0.00114777435393854, -0.000526063245555164, 0.99999814161282, -0.00120795166706622, -0.000631851641234638, 0.999997792453059, -0.00139185834612791, -0.000519877304541034, 0.999998020546725, -0.00127080900255349, -0.00060373324887666, 0.999998059330159, -0.00123814735894241, -0.000638480377887232, 0.999998337108097, -0.00115570987192407, -0.000572034814304861, 0.999998571810103, -0.00106400147389197, -0.00054414035107764, 0.999999136998844, -0.000829344110491764, -0.000418555560445895, 0.999999436800894, -0.000688792506748533, -0.00029793232712181, 0.999999182435777, -0.000786088000160243, -0.000446798847724984, 0.999998035855459, -0.00125214214514046, -0.000629508325517675, 0.999995461301925, -0.00191759993645823, -0.000928163756226527, 0.999990501294199, -0.00282586497589704, -0.00123008240127283, 0.99998523015117, -0.00349306924843624, -0.00160252859811979, 0.999980247693918, -0.00393070891026528, -0.00207399213858218, 0.999258133391236, -0.0212608113487506, 0.0170086490790013, 0.999752823870685, -0.0151150534926454, -0.00431858671218418, 0.998521231438773, -0.0331918414882689, 0.0193619075348229, 0.973987730061349, 0.0773006134969334, -0.139141104294479, 0.997923156801661, -0.0321910695742469, 0.0321910695742468, 0.999947758503179, -0.00259457124676546, -0.006745885241587, -0.0013118835870674, 0.138748425090248, -0.345681325192261, -0.000903475278483392, 0.151184975864853, -0.358227947918666, -0.000896140095625969, 0.147770769059702, -0.354871477867884, -0.00114777435393854, 0.173602465164251, -0.378765536799718, -0.00120795166706622, 0.214831416406957, -0.410703566802515, -0.00139185834612791, 0.122433312766354, -0.327782640513123, -0.00127080900255349, 0.184140620360657, -0.387596745778816, -0.00123814735894241, 0.21006198499474, -0.407350481092054, -0.00115570987192407, 0.196781639012774, -0.397564195941878, -0.00106400147389197, 0.207318901950479, -0.405384561552842, -0.000829344110491764, 0.203000309817415, -0.402231893588506, -0.000688792506748533, 0.157606764246543, -0.364371236069974, -0.000786088000160243, 0.244176387845927, -0.429597092087573, -0.00125214214514046, 0.201759382472957, -0.401311557517518, -0.00191759993645823, 0.189814026846399, -0.392149187005707, -0.00282586497589704, 0.159305169670633, -0.365949514378666, -0.00349306924843624, 0.173889122744829, -0.378998013455332, -0.00393070891026528, 0.217788926857211, -0.412724435577854, -0.0212608113487506, 0.000452357688250284, -0.00036188615058233, -0.0151150534926454, 0.000228521327097438, 6.52918077527545e-05, -0.0331918414882689, 0.00110332991097693, -0.000643609114746404, 0.0773006134969334, 0.00613496932514866, -0.0110429447852694, -0.0321910695742469, 0.0010384215991718, -0.00103842159917336, -0.00259457124676546, 6.73215168555691e-06, 1.75035942027152e-05, -0.000526551904329415, -0.345681325192261, 0.861253573209199, -0.000381296378838388, -0.358227947918666, 0.848815985790579, -0.000373156128147092, -0.354871477867884, 0.852230173253752, -0.000526063245555164, -0.378765536799718, 0.826399128966796, -0.000631851641234638, -0.410703566802515, 0.785170441980223, -0.000519877304541034, -0.327782640513123, 0.877568894780586, -0.00060373324887666, -0.387596745778816, 0.815861359092619, -0.000638480377887232, -0.407350481092054, 0.789939955675102, -0.000572034814304861, -0.397564195941878, 0.803220023879128, -0.00054414035107764, -0.405384561552842, 0.792682526239419, -0.000418555560445895, -0.402231893588506, 0.797000553183741, -0.00029793232712181, -0.364371236069974, 0.842393798952562, -0.000446798847724984, -0.429597092087573, 0.755824429718295, -0.000629508325517675, -0.401311557517518, 0.798242581671585, -0.000928163756226527, -0.392149187005707, 0.810190511851676, -0.00123008240127283, -0.365949514378666, 0.840704329035169, -0.00160252859811979, -0.378998013455332, 0.826125647104002, -0.00207399213858218, -0.412724435577854, 0.782230825448871, 0.0170086490790013, -0.00036188615058233, 0.00028950892043616, -0.00431858671218418, 6.52918077527545e-05, 1.86548021961656e-05, 0.0193619075348229, -0.000643609114746404, 0.000375438650284673, -0.139141104294479, -0.0110429447852694, 0.0198773006134874, 0.0321910695742468, -0.00103842159917336, 0.00103842159917592, -0.006745885241587, 1.75035942027152e-05, 4.55093454284494e-05), 0.692636183089874);`<`(argv[[1]],argv[[2]]); [1] FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE [13] FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE [25] FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE [37] FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE [49] FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE [61] FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE [73] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [85] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [97] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [109] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [121] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [133] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [145] TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE [157] TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE [169] TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE [181] TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE [193] TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE TRUE TRUE TRUE TRUE [205] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators83# #argv <- list(20, structure(c(-1, -1, -1, -1, -1, -1, -1, 8, 9, 10, 11, 12, 13, 14, 15, 100, 17, 18, 19, 20, 21, 200, 200, 24, 25, 26, 27, 28), .Dim = c(7L, 4L), .Dimnames = list(NULL, NULL)));`<`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] FALSE FALSE FALSE TRUE [2,] FALSE FALSE TRUE TRUE [3,] FALSE FALSE FALSE TRUE [4,] FALSE FALSE FALSE TRUE [5,] FALSE FALSE FALSE TRUE [6,] FALSE FALSE FALSE TRUE [7,] FALSE FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators84#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`<`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘<’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators85# #argv <- list(c(2.00256647265648e-308, 2.22284878464869e-308, 2.22507363599982e-308, 2.2250738585072e-308, 2.22507408101459e-308, 2.22729893236571e-308, 2.44758124435792e-308, 1.61792382137608e+308, 1.79589544172745e+308, 1.797692955093e+308, 1.79769313486232e+308), 1);`<`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators86#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'), 1L);`<`(argv[[1]],argv[[2]]); [1] NA Warning message: In Ops.factor(argv[[1]], argv[[2]]) : ‘<’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators87# #argv <- list(structure(c(629, 1026, 1422, 1819, 2214, 2611), class = 'difftime', units = 'days', .Names = c('1', '2', '3', '4', '5', '6')), 0);`<`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators88# #argv <- list(c(1, 2, 3, 4, 5, 6, 7, NA, 9, 10, 11, 12), 2);`<`(argv[[1]],argv[[2]]); [1] TRUE FALSE FALSE FALSE FALSE FALSE FALSE NA FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators89# #argv <- list(structure(3.0625, base = 4, lens = 3L, .classes = c('R_system_version', 'package_version', 'numeric_version')), structure(3.25, .Names = 'gridSVG2', base = 4, lens = structure(2L, .Names = 'gridSVG2'), .classes = 'numeric_version'));`<`(argv[[1]],argv[[2]]); gridSVG2 TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators9# #argv <- list(structure(1:10, class = structure('NumericNotStructure', package = '.GlobalEnv')), 1);`+`(argv[[1]],argv[[2]]); [1] 2 3 4 5 6 7 8 9 10 11 attr(,"class") [1] "NumericNotStructure" attr(,"class")attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators90# #argv <- list(c(1, 0, 0, 1, 0, 1, 2, 2, 1, 2, 1, 2, 1, NA, 1, 1, 1, 2, 2, 1, 1, 0, 1, 0, 0, 1, 0, 3, 1, 2, 1, 2, 2, 2, 2, 2, 2, 1, 2, 1, 1, 2, 0, 2, 1, 2, 0, 1, 0, 1, 1, 0, 0, 0, 1, 0, 0, 2, 1, 1, 2, 1, 1, 1, 1, 2, 2, 0, 0, 1, 0, 1, 2, 1, 1, 1, 0, 1, 0, 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 2, 0, 1, 1, 1, 0, 2, 1, 1, 1, 0, 0, 1, 1, 1, 2, 1, 1, 1, 1, 2, 0, 1, 1, 0, 1, 2, 2, 2, 2, 1, 0, 2, 1, 2, 0, 1, 1, 1, 2, 0, 1, 1, 0, 1, 0, 2, 1, 2, 1, 0, 2, 1, 2, 1, 1, 1, 0, 1, 0, 0, 1, 0, 0, 1, 2, 2, 1, 2, 1, 1, 0, 1, 2, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 2, 1, 1, 0, 0, 0, 0, 1, 0, 0, 2, 0, 1, 0, 1, 2, 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 0, 0, 0, 2, 0, 2, 1, 1, 0, 1, 1, 2, 1, 1, 1, 2, 2, 0, 1, 1, 1, 1, 0, 2, 1, 1), 1);`!=`(argv[[1]],argv[[2]]); [1] FALSE TRUE TRUE FALSE TRUE FALSE TRUE TRUE FALSE TRUE FALSE TRUE [13] FALSE NA FALSE FALSE FALSE TRUE TRUE FALSE FALSE TRUE FALSE TRUE [25] TRUE FALSE TRUE TRUE FALSE TRUE FALSE TRUE TRUE TRUE TRUE TRUE [37] TRUE FALSE TRUE FALSE FALSE TRUE TRUE TRUE FALSE TRUE TRUE FALSE [49] TRUE FALSE FALSE TRUE TRUE TRUE FALSE TRUE TRUE TRUE FALSE FALSE [61] TRUE FALSE FALSE FALSE FALSE TRUE TRUE TRUE TRUE FALSE TRUE FALSE [73] TRUE FALSE FALSE FALSE TRUE FALSE TRUE TRUE TRUE FALSE FALSE FALSE [85] FALSE FALSE FALSE TRUE FALSE TRUE TRUE FALSE FALSE FALSE TRUE TRUE [97] FALSE FALSE FALSE TRUE TRUE FALSE FALSE FALSE TRUE FALSE FALSE FALSE [109] FALSE TRUE TRUE FALSE FALSE TRUE FALSE TRUE TRUE TRUE TRUE FALSE [121] TRUE TRUE FALSE TRUE TRUE FALSE FALSE FALSE TRUE TRUE FALSE FALSE [133] TRUE FALSE TRUE TRUE FALSE TRUE FALSE TRUE TRUE FALSE TRUE FALSE [145] FALSE FALSE TRUE FALSE TRUE TRUE FALSE TRUE TRUE FALSE TRUE TRUE [157] FALSE TRUE FALSE FALSE TRUE FALSE TRUE FALSE FALSE TRUE FALSE TRUE [169] FALSE TRUE FALSE TRUE FALSE TRUE FALSE FALSE TRUE FALSE FALSE TRUE [181] TRUE TRUE TRUE FALSE TRUE TRUE TRUE TRUE FALSE TRUE FALSE TRUE [193] FALSE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE FALSE TRUE TRUE [205] TRUE TRUE TRUE TRUE FALSE FALSE TRUE FALSE FALSE TRUE FALSE FALSE [217] FALSE TRUE TRUE TRUE FALSE FALSE FALSE FALSE TRUE TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators91# #argv <- list(structure(list(c(3L, 0L, 1L)), class = c('R_system_version', 'package_version', 'numeric_version')), structure('3.1', .Names = 'gridSVG2'));`<`(argv[[1]],argv[[2]]); TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators92# #argv <- list(structure(c(0, 0.414213562373095, 0.732050807568877, 0, 0.23606797749979, 0.449489742783178, 0.645751311064591, 0.82842712474619, 0, 0.16227766016838), id = 'test 1', class = structure('withId', package = '.GlobalEnv')), 0.01);`<`(argv[[1]],argv[[2]]); [1] TRUE FALSE FALSE TRUE FALSE FALSE FALSE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators93# #argv <- list(NULL, NULL);`<`(argv[[1]],argv[[2]]); logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators94# #argv <- list('a', 'b');`<`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators95# #argv <- list(structure(c(1386478800, 1386651600, 1386824400, 1386997200, 1387170000, 1387342800, 1387515600, 1387688400, 1387861200, 1388034000, 1388206800, 1388379600, 1388552400, 1388725200), class = c('POSIXct', 'POSIXt'), tzone = ''), structure(1387538790.57927, class = c('POSIXct', 'POSIXt')));`<=`(argv[[1]],argv[[2]]); [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators96# #argv <- list(c(17, 45.1, 39.7, 36.5, 43.5), 6);`<=`(argv[[1]],argv[[2]]); [1] FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators97# #argv <- list(structure(c(69, 35, 26, 21, 18, 16, 13, 12, 12), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9')), 0);`<=`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 8 9 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators98# #argv <- list(c(0L, 1L, 2L, 2L, 2L, 3L, 4L, 5L, 5L, 5L, 6L, 7L, 7L, 7L, 8L, 9L, 9L, 9L, 10L, 11L, 11L, 11L, 12L, 12L, 12L, 13L, 14L, 14L, 14L), 1L);`<=`(argv[[1]],argv[[2]]); [1] TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_operators.testoperators99# #argv <- list(150000, 3e+09);`<=`(argv[[1]],argv[[2]]); [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testContinue# #{ options(continue="abc"); identical(getOption("continue"), "abc") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testEditor# #{ f<-function(){}; options(editor=f); identical(getOption("editor"), f) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testEditor# #{ options(editor="") } Error in options(editor = "") : invalid value for 'editor' ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testEditor# #{ options(editor="vi"); identical(getOption("editor"), "vi") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testEditor# #{ options(editor=NULL); identical(getOption("editor"), NULL) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('CBoundsCheck') } $CBoundsCheck [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('OutDec') } $OutDec [1] "." ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('PCRE_limit_recursion') } $PCRE_limit_recursion [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('PCRE_study') } $PCRE_study [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('PCRE_use_JIT') } $PCRE_use_JIT [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('browserNLdisabled') } $browserNLdisabled [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('check.bounds') } $check.bounds [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('continue') } $continue [1] "+ " ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('deparse.cutoff') } $deparse.cutoff [1] 60 ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('digits') } $digits [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('echo') } $echo [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('expressions') } $expressions [1] 5000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('keep.parse.data') } $keep.parse.data [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('keep.parse.data.pkgs') } $keep.parse.data.pkgs [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory#Ignored.Unknown# #{ options('keep.source') } $keep.source [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('keep.source.pkgs') } $keep.source.pkgs [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('matprod') } $matprod [1] "default" ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('max.print') } $max.print [1] 99999 ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('nwarnings') } $nwarnings [1] 50 ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('prompt') } $prompt [1] "> " ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('rl_word_breaks') } $rl_word_breaks [1] " \t\n\"\\'`><=%;,|&{()}" ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('show.error.messages') } $show.error.messages [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('verbose') } $verbose [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory#Ignored.Unknown# #{ options('warn') } $warn [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('warning.length') } $warning.length [1] 1000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options('width') } $width [1] 80 ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(CBoundsCheck=NULL) } Error in options(CBoundsCheck = NULL) : option 'CBoundsCheck' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(OutDec=NULL) } Error in options(OutDec = NULL) : option 'OutDec' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(PCRE_limit_recursion=NULL) } Error in options(PCRE_limit_recursion = NULL) : option 'PCRE_limit_recursion' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(PCRE_study=NULL) } Error in options(PCRE_study = NULL) : option 'PCRE_study' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(PCRE_use_JIT=NULL) } Error in options(PCRE_use_JIT = NULL) : option 'PCRE_use_JIT' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(browserNLdisabled=NULL) } Error in options(browserNLdisabled = NULL) : option 'browserNLdisabled' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(check.bounds=NULL) } Error in options(check.bounds = NULL) : option 'check.bounds' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(continue=NULL) } Error in options(continue = NULL) : option 'continue' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(deparse.cutoff=NULL) } Error in options(deparse.cutoff = NULL) : option 'deparse.cutoff' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(digits=NULL) } Error in options(digits = NULL) : option 'digits' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(echo=NULL) } Error in options(echo = NULL) : option 'echo' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(expressions=NULL) } Error in options(expressions = NULL) : option 'expressions' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(keep.parse.data.pkgs=NULL) } Error in options(keep.parse.data.pkgs = NULL) : option 'keep.parse.data.pkgs' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(keep.parse.data=NULL) } Error in options(keep.parse.data = NULL) : option 'keep.parse.data' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(keep.source.pkgs=NULL) } Error in options(keep.source.pkgs = NULL) : option 'keep.source.pkgs' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(keep.source=NULL) } Error in options(keep.source = NULL) : option 'keep.source' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(matprod=NULL) } Error in options(matprod = NULL) : option 'matprod' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(max.print=NULL) } Error in options(max.print = NULL) : option 'max.print' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(nwarnings=NULL) } Error in options(nwarnings = NULL) : option 'nwarnings' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(prompt=NULL) } Error in options(prompt = NULL) : option 'prompt' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(rl_word_breaks=NULL) } Error in options(rl_word_breaks = NULL) : option 'rl_word_breaks' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(show.error.messages=NULL) } Error in options(show.error.messages = NULL) : option 'show.error.messages' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(verbose=NULL) } Error in options(verbose = NULL) : option 'verbose' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(warn=NULL) } Error in options(warn = NULL) : option 'warn' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(warning.length=NULL) } Error in options(warning.length = NULL) : option 'warning.length' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testMandatory# #{ options(width=NULL) } Error in options(width = NULL) : option 'width' cannot be deleted ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testOptions# #{ getOption(NULL) } Error in getOption(NULL) : 'x' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testOptions# #{ getOption(character()) } Error in getOption(character()) : 'x' must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testOptions# #{ options("timeout", "width") } $timeout [1] 60 $width [1] 80 ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testOptions# #{ options(list(aaa = 42, bbb = 'hello')); x <- options('aaa', 'bbb'); options(aaa=NULL, bbb=NULL); x } $aaa [1] 42 $bbb [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testOptions# #{ options(lll = list(aaa = 42, bbb = 'hello')); x <- options('lll', 'aaa', 'bbb'); options(aaa=NULL, bbb=NULL, lll=NULL); x } $lll $lll$aaa [1] 42 $lll$bbb [1] "hello" $aaa NULL $bbb NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testOptions# #{ options(options(digits = 5)) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testPrompt# #{ options(prompt="abc"); identical(getOption("prompt"), "abc") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testoptions1# #argv <- list('survfit.print.n'); .Internal(options(argv[[1]])) $survfit.print.n NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testoptions2# #argv <- list('contrasts'); .Internal(options(argv[[1]])) $contrasts unordered ordered "contr.treatment" "contr.poly" ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testoptions3#Ignored.OutputFormatting# #argv <- list('str'); .Internal(options(argv[[1]])) $str $str$strict.width [1] "no" $str$digits.d [1] 3 $str$vec.len [1] 4 $str$list.len [1] 99 $str$deparse.lines NULL $str$drop.deparse.attr [1] TRUE $str$formatNum function (x, ...) format(x, trim = TRUE, drop0trailing = TRUE, ...) ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testoptions4# #argv <- list('ts.eps'); .Internal(options(argv[[1]])) $ts.eps [1] 1e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testoptions5#Ignored.ReferenceError# #argv <- list(NULL); .Internal(options(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testoptions5# #options(NA); Error in options(NA) : invalid argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testoptions5#Ignored.ReferenceError# #options(NULL); ##com.oracle.truffle.r.test.builtins.TestBuiltin_options.testoptions5# #options(list(NULL)); Error in options(list(NULL)) : list argument has no valid names ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #invisible(Sys.setlocale('LC_COLLATE', 'en_US.utf8')); str(as.data.frame(list(a=c('A wo','Far ','abc ')))); invisible(Sys.setlocale('LC_COLLATE', 'C')); str(as.data.frame(list(a=c('A wo','Far ','abc ')))); 'data.frame': 3 obs. of 1 variable: $ a: chr "A wo" "Far " "abc " 'data.frame': 3 obs. of 1 variable: $ a: chr "A wo" "Far " "abc " ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #order(NULL) Error in order(NULL) : argument 1 is not a vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #order(c('40 50', '405', '40 51', '4028', '40 20', '40 30', '404')) [1] 5 6 1 3 4 7 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #order(c(1,2,0), decreasing=NA) Error in order(c(1, 2, 0), decreasing = NA) : 'decreasing' elements must be TRUE or FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #order(c(NULL, c(1,2,0))) [1] 3 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order() } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(1:3) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(3:1) } [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(7) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(FALSE) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c("a","c","b","d","e","f")) } [1] 1 3 2 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(-1480, -974, -1576, -970), c("a", "b", "c", "d")) } [1] 3 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(0/0, -1/0, 2)) } [1] 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(0/0, -1/0, 2), na.last=NA) } [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1,1,1), 3:1) } [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1,1,1), 3:1, decreasing=FALSE) } [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1,1,1), 3:1, decreasing=TRUE, na.last=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1,1,1), 3:1, decreasing=TRUE, na.last=NA) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1,1,1), 3:1, decreasing=TRUE, na.last=TRUE) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1,1,1,1),c("d","c","b","a")) } [1] 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1,1,1,1),c(4,3,2,1)) } [1] 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1,2,3,NA)) } [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1,2,3,NA), na.last=FALSE) } [1] 4 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1,2,3,NA), na.last=FALSE, decreasing=TRUE) } [1] 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(1i,2i,3i)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(3+1i,2+2i,1+3i)) } [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(3+1i,2+3i,2+2i,1+3i)) } [1] 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(3i,1i,2i)) } [1] 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(5,2,2,1,7,4)) } [1] 4 2 3 6 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(5,2,2,1,7,4),c("a","c","b","d","e","f")) } [1] 4 3 2 6 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(NA,NA,1), c(1,2,3)) } [1] 3 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(NA,NA,1), c(2,1,3)) } [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(c(TRUE, FALSE)) } [1] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ order(character()) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ x<-c(40, 40, 1, 40, 1, 20, 40, 10, 40, 10, 16, 40, 10, 26, 40, 10, 39, 40, 11, 40, 12, 40, 12, 20); order(x, decreasing=FALSE) } [1] 3 5 8 10 13 16 19 21 23 11 6 24 14 17 1 2 4 7 9 12 15 18 20 22 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testOrder# #{ x<-c(40, 40, 1, 40, 1, 20, 40, 10, 40, 10, 16, 40, 10, 26, 40, 10, 39, 40, 11, 40, 12, 40, 12, 20); order(x, decreasing=TRUE) } [1] 1 2 4 7 9 12 15 18 20 22 17 14 6 24 11 21 23 19 8 10 13 16 3 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder1# #argv <- list(TRUE, FALSE, structure(c(1, 1, 1, 2, 2, 2, 3, 4), .Names = c('CsparseMatrix', 'nsparseMatrix', 'generalMatrix', 'nMatrix', 'sparseMatrix', 'compMatrix', 'Matrix', 'mMatrix'))); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 3 4 5 6 7 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder10# #argv <- list(TRUE, FALSE, c(1L, 1L), c(5L, 5L)); .Internal(order(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder11# #argv <- list(TRUE, FALSE, structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75')), structure(c(-0.57247143337844, -0.539950178656569, -0.58297623976228, -0.439751638938155, -0.617930515617237, -0.533331856784678, -0.289352731546361, -0.478093191632667, -0.602269400145547, -0.580175322433967, -0.49540432777895, -0.513696058484476, -0.458241390525053, -0.626325772726431, -0.638174891061199, -0.617196984678001, -0.64409821087924, -0.612729425695224, -0.60380450668859, -0.478765912376981, -0.577566470585813, -0.611603489866172, -0.630689749726753, -0.617142933166765, -0.649085924500709, -0.663752033681209, -0.644167702381979, -0.638179039688751, -0.597653338464853, -0.60376057262344, -0.663213279051883, -0.675292341303314, -0.666589501747572, -0.670209631751109, -0.683375351812861, -0.683923564367218, -0.679841016050066, -0.687830656102281, -0.686865903442208, -0.681095489258746, -0.579001929374462, -0.669393058957547, -0.678452540432172, -0.638743740817659, -0.558515347237012, -0.337270659711893, -0.279950203607686, -0.295246094585692, -0.592252570503069, -0.558321756708791, -0.597079745476187, -0.573971559450555, -0.603793132961681, -0.544974758961613, -0.495274888248239, -0.488092985753192, -0.528409363716152, -0.552865045250698, -0.502907194303865, -0.482819909399495, -0.590008262166764, -0.582409343486053, -0.548676506410172, -0.642096376280899, -0.622604552864479, -0.581608072840875, -0.637160558239849, -0.640205884259342, -0.643944208731097, -0.627870005742383, -0.638070667609366, -0.648245104552262, -0.582808968033345, -0.593416716949551, -0.631441868159251), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75'))); .Internal(order(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 72 17 69 64 68 15 71 67 75 70 14 65 5 16 18 19 9 74 61 3 73 62 66 10 1 [26] 63 2 6 12 11 20 8 13 4 7 38 39 36 35 40 37 43 32 34 42 33 26 31 25 27 [51] 44 28 23 24 22 53 30 29 51 49 41 21 52 45 50 58 54 57 59 55 56 60 46 48 47 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder12# #argv <- list(TRUE, FALSE, c(FALSE, FALSE)); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder13# #argv <- list(TRUE, FALSE, structure(c(-0.00544194018731062, -0.00542949133552226, -1.20718999105839e-05, -0.00505497198006266, -0.827687885653788, -0.00315385274195005, -0.0023164952286401, -0.00117183915211372, -2.09167441982205, -0.00193959227691399, -0.00358084102808485, -3.39138861812986e-05, -0.00163051710052444, -0.00168735925488057, -0.0167253073891896, -0.237074502262169, -0.0118967636015583, -0.00307437031103621, -0.00114371252369823, -0.000860763872820255, -0.00028432076263802, -0.00329557354736053, -0.000123683950933913, -0.00026114238659798, -0.00471892942651347, -0.00317288091968884, -6.76955217513137e-05, -0.0119061189538054, -0.00233356124758579, -0.00672098496026968, -0.134965372025281, -0.00102115420103838, -0.00114816901125044), .Names = c('Craig Dunain', 'Ben Rha', 'Ben Lomond', 'Goatfell', 'Bens of Jura', 'Cairnpapple', 'Scolty', 'Traprain', 'Lairig Ghru', 'Dollar', 'Lomonds', 'Cairn Table', 'Eildon Two', 'Cairngorm', 'Seven Hills', 'Knock Hill', 'Black Hill', 'Creag Beag', 'Kildcon Hill', 'Meall Ant-Suidhe', 'Half Ben Nevis', 'Cow Hill', 'N Berwick Law', 'Creag Dubh', 'Burnswark', 'Largo Law', 'Criffel', 'Acmony', 'Ben Nevis', 'Knockfarrel', 'Two Breweries', 'Cockleroi', 'Moffat Chase'))); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 9 5 16 31 15 28 17 30 1 2 4 25 11 22 26 6 18 29 7 10 14 13 8 33 19 [26] 32 20 21 24 23 27 12 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder14# #argv <- list(TRUE, FALSE, c(2L, 1L, NA)); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 2 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder15# #argv <- list(TRUE, FALSE, structure(c(1, 2, 2, 2, 2), .Names = c('character', 'vector', 'data.frameRowLabels', 'SuperClassMethod', 'atomicVector'))); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder16# #argv <- list(TRUE, FALSE, c(1, 2, NA)); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder17# #argv <- list(TRUE, FALSE, c(39.39, NA, 60.99, 45.82, 55.4, 59.49, 63.73, 55.09, 57.2, 33.22, 61.18, 59.52, 59.9, 59.06, 65.44, 54.3, 53.28, 70.87, 60.04, 59.33, 55.63, 53.68, 24.46, 49.87, 57.13, 65.51, 57.97, 66.11, 64.68, 57.81, 61.2, 49.34, 61.72, 61.11, 55.13, 55.25, 56.49, 58.31, 25.18, 58.39, 49.21, 55.27, 64.56, 72.18, 55.37, 53.91, 54.08, 61.58)); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 23 39 10 1 4 41 32 24 17 22 46 47 16 8 35 36 42 45 5 21 37 25 9 30 27 [26] 38 40 14 20 6 12 13 19 3 34 11 31 48 33 7 43 29 15 26 28 18 44 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder18# #argv <- list(TRUE, FALSE, c(FALSE, TRUE)); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder19# #argv <- list(TRUE, TRUE, c(2572.90550008339, 915.064609071159, 419.980933101553, 456.632018115023, 366.745362912885, 308.301779528581, 258.104614655539, 166.131403923756, 208.43876984087, 174.152165416129, 157.072337453686, 157.072337453686, 93.6287479850051, 145.261798316303, 140.969649074553, 80.9227484547009, 115.221543203043, 115.221543203043, 43.2054741656531, 92.6549620292801, 92.6549620292801, 90.9360919542674, 90.9360919542674, 95.4200045428049, 94.2845517186135, 90.4677652619726, 76.0356310934324, 76.0356310934324, 26.1565478253913, 79.2808369338756, 69.8160310537133, 69.8160310537133, 74.7131802385517, 72.7892236613541, 20.782836979896, 60.876337906218, 60.876337906218, 70.8748882290923, 66.7853490283529, 66.7853490283529, 16.5058357149619, 54.5274774202162, 54.5274774202162, 64.009437139127, 13.2377600042936, 49.2149340764437, 49.2149340764437, 60.372612826631, 55.4228623592615, 55.4228623592615, 55.598407412763, 8.99100195370794, 49.6125680940682, 49.6125680940682, 51.620171425175, 39.8798475138868, 39.8798475138868, 7.62805946796798, 35.458438379179, 35.458438379179, 38.2201699179466, 38.2201699179466, 29.6856293315566, 29.6856293315566, 34.3600931672689, 34.3600931672689, 47.6686025497685, 47.0350049752776, 5.57838460483725, 5.07382264677001, 15.9316203363047, 23.4957538578271, 23.4957538578271, 41.4311176038551, 11.9119569568831, 34.7321001383969, 4.21976444063592, 39.2901755793811, 29.1992830783774, 29.1992830783774, 11.1832867499603, 42.0546965543942, 27.0745572919711, 7.44159556589097, 28.1216021055426, 6.46699019595805, 2.05951624519943, 4.77172378340461, 38.0398197891428, 1.66021670517454, 1.03505989993491, 2.69814683135512, 1.8306332549612, 2.29820560404041, 3.42336057523814e-06, 3.42336062193255e-06, 2.86123099075901, 0.773887754953459, 0.213086170361661, 0.416100454072758)); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 4 3 5 6 7 9 10 8 11 12 14 15 17 18 24 25 [19] 13 20 21 22 23 26 16 30 27 28 33 34 38 31 32 39 40 44 [37] 36 37 48 51 49 50 42 43 55 53 54 46 47 67 68 19 82 74 [55] 56 57 78 61 62 89 59 60 76 65 66 63 64 79 80 85 83 29 [73] 72 73 35 41 71 45 75 81 52 58 84 86 69 70 88 77 97 92 [91] 94 87 93 90 91 98 100 99 96 95 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder2# #argv <- list(TRUE, FALSE, structure(c(1, 2, 2.1, 2.3, 2.3, 3, 4, 5, 7, 8, 11, 13, 14, 15), .Names = c('\\title', '\\name', '\\alias', '\\keyword', '\\keyword', '\\description', '\\usage', '\\arguments', '\\details', '\\value', '\\author', '\\references', '\\seealso', '\\examples')), c('', '', 'LOGLIN', '', '', '', '', '', '', '', '', '', '', ''), c('', '', 'loglin', '', '', '', '', '', '', '', '', '', '', '')); .Internal(order(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder21# #argv <- structure(list(1, 1, 1, na.last = NA), .Names = c('', '', '', 'na.last'));do.call('order', argv) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder22# #argv <- structure(list(1, na.last = NA), .Names = c('', 'na.last'));do.call('order', argv) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder3# #argv <- list(TRUE, FALSE, c(NA, 'Ripley', 'Venables & Smith')); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder4# #argv <- list(TRUE, TRUE, structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 4L, 2L, 1L, 1L, 1L, 2L, 2L, 2L, 1L, 1L, 1L, 2L, 1L, 3L, 4L, 2L, 5L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 3L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 2L, 1L, 1L, 2L, 3L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 2L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L), .Names = c('1008', '1011', '1013', '1014', '1015', '1016', '1027', '1028', '1030', '1032', '1051', '1052', '1083', '1093', '1095', '1096', '110', '1102', '111', '1117', '112', '113', '116', '117', '1219', '125', '1250', '1251', '126', '127', '128', '1291', '1292', '1293', '1298', '1299', '130', '1308', '135', '1376', '1377', '1383', '1408', '1409', '141', '1410', '1411', '1413', '1418', '1422', '1438', '1445', '1456', '1492', '2001', '2316', '262', '266', '269', '270', '2708', '2714', '2715', '272', '2728', '2734', '280', '283', '286', '290', '3501', '411', '412', '475', '5028', '5042', '5043', '5044', '5045', '5047', '5049', '5050', '5051', '5052', '5053', '5054', '5055', '5056', '5057', '5058', '5059', '5060', '5061', '5062', '5066', '5067', '5068', '5069', '5070', '5072', '5073', '5115', '5160', '5165', '655', '724', '885', '931', '942', '952', '955', '958', 'c118', 'c168', 'c203', 'c204', 'c266'))); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 24 8 22 21 39 74 9 13 14 15 19 23 25 36 37 38 41 42 [19] 49 58 59 64 68 70 73 75 85 86 87 88 89 90 92 102 104 109 [37] 110 111 112 1 2 3 4 5 6 7 10 11 12 16 17 18 20 26 [55] 27 28 29 30 31 32 33 34 35 40 43 44 45 46 47 48 50 51 [73] 52 53 54 55 56 57 60 61 62 63 65 66 67 69 71 72 76 77 [91] 78 79 80 81 82 83 84 91 93 94 95 96 97 98 99 100 101 103 [109] 105 106 107 108 113 114 115 116 117 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder5# #argv <- list(TRUE, FALSE); .Internal(order(argv[[1]], argv[[2]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder6# #argv <- list(TRUE, FALSE, c(25, 50, 100, 250, 500, 1e+05)); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder7# #argv <- list(TRUE, FALSE, c(1L, 2L, NA)); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder8# #argv <- list(TRUE, FALSE, c(-1.90479340955971, 0.152878714793717)); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_order.testorder9# #argv <- list(TRUE, FALSE, structure(numeric(0), .Dim = c(0L, 0L), .Dimnames = list(NULL, NULL))); .Internal(order(argv[[1]], argv[[2]], argv[[3]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_packBits.testPackBits# #packBits(as.raw(c(1L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L,0L)), type="integer") [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_packBits.testPackBits# #packBits(as.raw(c(1L,3L,5L,7L,9L,11L,13L,15L))) [1] ff ##com.oracle.truffle.r.test.builtins.TestBuiltin_packBits.testPackBits# #packBits(c(1L,3L,5L,7L,9L,11L,13L,15L)) [1] ff ##com.oracle.truffle.r.test.builtins.TestBuiltin_packBits.testPackBits# #packBits(c(1L,3L,5L,7L,9L,11L,13L,NA)) Error in packBits(c(1L, 3L, 5L, 7L, 9L, 11L, 13L, NA)) : argument 'x' must not contain NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_packBits.testPackBits# #packBits(c(TRUE)) Error in packBits(c(TRUE)) : argument 'x' must be a multiple of 8 long ##com.oracle.truffle.r.test.builtins.TestBuiltin_packBits.testPackBits# #packBits(c(TRUE,FALSE,TRUE,FALSE,TRUE,FALSE,TRUE,FALSE)) [1] 55 ##com.oracle.truffle.r.test.builtins.TestBuiltin_packBits.testPackBits# #packBits(c(TRUE,FALSE,TRUE,FALSE,TRUE,FALSE,TRUE,NA)) Error in packBits(c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, NA)) : argument 'x' must not contain NAs ##com.oracle.truffle.r.test.builtins.TestBuiltin_packBits.testPackBits#Output.IgnoreErrorMessage# #packBits(c(TRUE,NA),type="wrongType") Error in match.arg(type) : 'arg' should be one of “raw”, “integer” ##com.oracle.truffle.r.test.builtins.TestBuiltin_packBits.testPackBits#Output.IgnoreErrorMessage# #packBits(c(TRUE,TRUE,FALSE,TRUE,FALSE,TRUE,FALSE,TRUE),type="wrongType") Error in match.arg(type) : 'arg' should be one of “raw”, “integer” ##com.oracle.truffle.r.test.builtins.TestBuiltin_packageEvent.testpackageEvent1# #argv <- structure(list(pkgname = 'stats4', event = 'onLoad'), .Names = c('pkgname', 'event'));do.call('packageEvent', argv) [1] "UserHook::stats4::onLoad" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pairlist.testPairList# #{ x<-7; y<-c(foo=42); z<-pairlist(x, y); list(z, typeof(z)) } [[1]] [[1]][[1]] [1] 7 [[1]][[2]] foo 42 [[2]] [1] "pairlist" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pairlist.testPairListAssignment# #{ l1 <- pairlist(a=1); l2 <- pairlist(a=42); l1['a'] <- l2 } ##com.oracle.truffle.r.test.builtins.TestBuiltin_pairlist.testPairListAssignment# #{ l1 <- pairlist(a=1); l2 <- pairlist(a=42); l1['a'] <- l2['a'] } ##com.oracle.truffle.r.test.builtins.TestBuiltin_pairlist.testPairListAssignment# #{ l1 <- pairlist(a=1, b=2); l2 <- pairlist(a=41, b=42); l1[c('a', 'b')] <- l2 } ##com.oracle.truffle.r.test.builtins.TestBuiltin_pairlist.testpairlist1# #argv <- list();do.call('pairlist', argv) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenv.testParentEnv# #e <- new.env(); parent.env(e) ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenv.testParentEnv# #parent.env() Error in parent.env() : argument "env" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenv.testParentEnv# #parent.env(1) Error in parent.env(1) : argument is not an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenv.testParentEnv# #parent.env(NULL) Error in parent.env(NULL) : argument is not an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenv.testParentEnv# #parent.env(c(1,2,3)) Error in parent.env(c(1, 2, 3)) : argument is not an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenvassign.testParentEnv#Output.ContainsReferences# #e <- new.env(); e2 <- new.env(); parent.env(e) <- e2; parent.env(e) ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenvassign.testParentEnv#Output.IgnoreErrorContext# #e <- new.env(); parent.env(e) <- 44 Error in `parent.env<-`(`*tmp*`, value = 44) : 'parent' is not an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenvassign.testParentEnv#Output.IgnoreErrorContext#Output.IgnoreErrorMessage# #e <- new.env(); parent.env(e) <- NULL Error in `parent.env<-`(`*tmp*`, value = NULL) : use of NULL environment is defunct ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenvassign.testParentEnv#Output.IgnoreErrorContext# #e <- new.env(); parent.env(e) <- c(1,2,3) Error in `parent.env<-`(`*tmp*`, value = c(1, 2, 3)) : 'parent' is not an environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenvassign.testParentEnv# #e <- new.env(); parent.env(e) <- emptyenv(); parent.env(e) ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenvassign.testParentEnv# #parent.env() <- new.env() Error in parent.env() <- new.env() : invalid (NULL) left side of assignment ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenvassign.testParentEnv# #parent.env(1) <- new.env() Error in parent.env(1) <- new.env() : target of assignment expands to non-language object ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenvassign.testParentEnv# #parent.env(NULL) <- new.env() Error in parent.env(NULL) <- new.env() : invalid (NULL) left side of assignment ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenvassign.testParentEnv# #parent.env(c(1,2,3)) <- new.env() Error in parent.env(c(1, 2, 3)) <- new.env() : target of assignment expands to non-language object ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentenvassign.testParentEnv# #parent.env(emptyenv()) <- new.env() Error in parent.env(emptyenv()) <- new.env() : invalid (NULL) left side of assignment ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.frameAccessCommonTest# #{ foo <- function(x) sapply(1:7, function(fr) sort(tolower(ls(parent.frame(fr)))));bar <- function(ba) do.call(foo, list(ba));boo <- function(bo) bar(bo);callboo <- function(cb) do.call("boo", list(cb));fun <- function(f) callboo(f);fun(42);} [[1]] [1] "fun" "i" "x" [[2]] [1] "fun" "simplify" "use.names" "x" [[3]] [1] "x" [[4]] [1] "ba" [[5]] [1] "bo" [[6]] [1] "cb" [[7]] [1] "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testParentFrame# #parent.frame() ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testParentFrame# #parent.frame(-1) Error in parent.frame(-1) : invalid 'n' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testParentFrame# #parent.frame(0) Error in parent.frame(0) : invalid 'n' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testParentFrame# #{ f <- function() parent.frame() ; g <- function() { n <- 100; f() }; r <- g(); ls(r) } [1] "n" ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testParentFrame# #{ f <- function() parent.frame() } ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testParentFrame# #{ f <- function() parent.frame(2); g <- function() f(); g() } ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testParentFrame# #{ f <- function() parent.frame(3); g <- function() f(); g() } ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testParentFramePromises# #{ f <- function(frame) frame; g <- function() f(parent.frame()); g() } ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testParentFramePromises# #{ f <- function(frame) frame; g <- function() f(parent.frame(3)); g() } ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testS3ParentFrame# #a <- 0; f <- function(x) { a <- 1; UseMethod('f') }; f.default <- function(x) { a <- 2; (function(x) get('a', envir = parent.frame(x)))(x) }; f(1); f(2); f(3) [1] 2 [1] 0 [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testS3ParentFrame# #a <- 0; f <- function(x) { a <- 1; UseMethod('f') }; f.default <- function(x) { a <- 2; get('a', envir = parent.frame()) }; f(1) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_parentframe.testS3ParentFrame# #a <- 0; f <- function(x) { a <- 1; UseMethod('f') }; f.foo <- function(x) { a <- 2; NextMethod(); };<<>>f.default <- function(x) { a <- 3; (function(x) get('a', envir = parent.frame(x)))(x) }; v <- 1; class(v) <- 'foo'; f(v); v <- 2; class(v) <- 'foo'; f(v) [1] 3 [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.test# #{ parse(text="NULL") } expression(NULL) ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.test# #{ typeof(parse(text = "foo", keep.source = FALSE, srcfile = NULL)[[1]]) } [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testArgumentsCasts# #.Internal(parse(stdin(), c(1,2), c('expr1', 'expr2'), '?', ' $wholeSrcref is.null ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testParseIdentifier#Ignored.ImplementationError# #attributes(parse(text='somethingthatdoesnotexist')) $srcref $srcref[[1]] somethingthatdoesnotexist $srcfile $wholeSrcref somethingthatdoesnotexist ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testParseIdentifier# #parse(text='is.null') expression(is.null) ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testParseIdentifier# #parse(text='somethingthatdoesnotexist') expression(somethingthatdoesnotexist) ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testParseVector# #parse(text=deparse(c(1, 2, 3))) expression(c(1, 2, 3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testParseVector# #{ parse(text=c("for (i in 1:10) {", " x[i] <- i", "}")) } expression(for (i in 1:10) { x[i] <- i }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testSource# #{ source("test/r/simple/data/tree2/setx.r") ; x } Error in file(filename, "r", encoding = encoding) : cannot open the connection In addition: Warning message: In file(filename, "r", encoding = encoding) : cannot open file 'test/r/simple/data/tree2/setx.r': No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testSource# #{ source("test/r/simple/data/tree2/setx.r", local=TRUE) ; x } Error in file(filename, "r", encoding = encoding) : cannot open the connection In addition: Warning message: In file(filename, "r", encoding = encoding) : cannot open file 'test/r/simple/data/tree2/setx.r': No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testSource# #{ x <- 1; f <- function() { source("test/r/simple/data/tree2/incx.r", local=FALSE) ; x } ; c(f(), x) } Error in file(filename, "r", encoding = encoding) : cannot open the connection In addition: Warning message: In file(filename, "r", encoding = encoding) : cannot open file 'test/r/simple/data/tree2/incx.r': No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testSource# #{ x <- 1; f <- function() { source("test/r/simple/data/tree2/incx.r", local=TRUE) ; x } ; c(f(), x) } Error in file(filename, "r", encoding = encoding) : cannot open the connection In addition: Warning message: In file(filename, "r", encoding = encoding) : cannot open file 'test/r/simple/data/tree2/incx.r': No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testSource# #{ x <- 1; f <- function() { source("test/r/simple/data/tree2/setx.r", local=FALSE) ; x } ; c(f(), x) } Error in file(filename, "r", encoding = encoding) : cannot open the connection In addition: Warning message: In file(filename, "r", encoding = encoding) : cannot open file 'test/r/simple/data/tree2/setx.r': No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testSource# #{ x <- 1; f <- function() { source("test/r/simple/data/tree2/setx.r", local=TRUE) ; x } ; c(f(), x) } Error in file(filename, "r", encoding = encoding) : cannot open the connection In addition: Warning message: In file(filename, "r", encoding = encoding) : cannot open file 'test/r/simple/data/tree2/setx.r': No such file or directory ##com.oracle.truffle.r.test.builtins.TestBuiltin_parse.testSrcfile# #parse(text='', srcfile=srcfile(system.file('testfile'))) expression() ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ a <- as.raw(200) ; b <- as.raw(255) ; paste(a, b) } [1] "c8 ff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste('a', 'a', 1:3, 'b', 'b', sep='.') } [1] "a.a.1.b.b" "a.a.2.b.b" "a.a.3.b.b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste('a', 1:3, 'b', sep='.') } [1] "a.1.b" "a.2.b" "a.3.b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste('a', 1:3, sep='.') } [1] "a.1" "a.2" "a.3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste() } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste(1:2, 1:3, FALSE, collapse="-", sep="+") } [1] "1+1+FALSE-2+2+FALSE-1+3+FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste(1:2, 1:3, FALSE, collapse=NULL) } [1] "1 1 FALSE" "2 2 FALSE" "1 3 FALSE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste(1:3, 'b', sep='.') } [1] "1.b" "2.b" "3.b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste(1:3, sep='.') } [1] "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste(NA) } [1] "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste(NULL, list(), sep = "=") } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste(c(1,NA)) } [1] "1" "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste(character(0),31415) } [1] " 31415" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ paste(sep="") } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPaste# #{ s<-c('1',NA); paste(s); s; } [1] "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPasteWithS3AsCharacter# #{ as.character.myc <- function(x) '42'; val <- 'hello'; class(val) <- 'myc'; paste(val, 'world') } [1] "hello world" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPasteWithS3AsCharacter# #{ as.character.myc <- function(x) '42'; val <- 3.14; class(val) <- 'myc'; paste(val, 'world') } [1] "42 world" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPasteWithS3AsCharacter# #{ as.character.myc <- function(x) 42; val <- 3.14; class(val) <- 'myc'; paste(val, 'world') } Error in paste(val, "world") : non-string argument to .Internal(paste) ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPasteWithS3AsCharacter# #{ as.character.myc <- function(x) NULL; val <- 3.14; class(val) <- 'myc'; paste(val, 'world') } Error in paste(val, "world") : non-string argument to .Internal(paste) ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testPasteWithS3AsCharacter# #{ assign('as.character.myc', function(x) '42', envir=.__S3MethodsTable__.); val <- 3.14; class(val) <- 'myc'; res <- paste(val, 'world'); rm('as.character.myc', envir=.__S3MethodsTable__.); res } [1] "42 world" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameter# #{ paste('hello', c(), recycle0=FALSE) } [1] "hello " ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameter# #{ paste('hello', c(), recycle0=TRUE) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameter# #{ paste(1:3, 11:13, c(), sep=':', collapse='-', recycle0=FALSE) } [1] "1:11:-2:12:-3:13:" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameter# #{ paste(1:3, 11:13, c(), sep=':', collapse='-', recycle0=TRUE) } [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameter# #{ paste(1:3, 11:13, c(), sep=':', collapse=NULL, recycle0=FALSE) } [1] "1:11:" "2:12:" "3:13:" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameter# #{ paste(1:3, 11:13, c(), sep=':', collapse=NULL, recycle0=TRUE) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameterWrongValues# #{ paste('hello', recycle0=':') } [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameterWrongValues# #{ paste('hello', recycle0=42) } [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameterWrongValues# #{ paste('hello', recycle0=NA) } [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameterWrongValues# #{ paste('hello', recycle0=NULL) } [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameterWrongValues# #{ paste('hello', recycle0=c(FALSE, TRUE)) } [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testRecycleParameterWrongValues# #{ paste('hello', recycle0=c(TRUE, FALSE)) } [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testStringSequence# #{ ISOdate(2010, 01, 01, 1:10) } [1] "2010-01-01 01:00:00 GMT" "2010-01-01 02:00:00 GMT" [3] "2010-01-01 03:00:00 GMT" "2010-01-01 04:00:00 GMT" [5] "2010-01-01 05:00:00 GMT" "2010-01-01 06:00:00 GMT" [7] "2010-01-01 07:00:00 GMT" "2010-01-01 08:00:00 GMT" [9] "2010-01-01 09:00:00 GMT" "2010-01-01 10:00:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testStringSequence# #{ paste("a", 1, TRUE, 1:4) } [1] "a 1 TRUE 1" "a 1 TRUE 2" "a 1 TRUE 3" "a 1 TRUE 4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testStringSequence# #{ paste("a", 1, TRUE, 1:4, 1.2) } [1] "a 1 TRUE 1 1.2" "a 1 TRUE 2 1.2" "a 1 TRUE 3 1.2" "a 1 TRUE 4 1.2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testStringSequence# #{ paste(1:4, 1.2) } [1] "1 1.2" "2 1.2" "3 1.2" "4 1.2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste1# #argv <- list(list('%% ~~objects to See Also as', '\\code{\\link{~~fun~~}}, ~~~'), ' ', NULL); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) [1] "%% ~~objects to See Also as \\code{\\link{~~fun~~}}, ~~~" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste10# #argv <- list(list('(', structure(c(' 1.124', ' 1.056', ' 1.059', ' 0.932'), .Dim = c(2L, 2L)), ','), '', NULL); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) [1] "( 1.124," "( 1.056," "( 1.059," "( 0.932," ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste11# #argv <- list(list(character(0)), ' ', ''); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste2# #argv <- list(list(c('[', 'cox.zph', NA)), ' ', '\r'); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) [1] "[\rcox.zph\rNA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste3# #argv <- list(list(), ' ', NULL); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste4# #argv <- list(list('package', structure('pkgA', .Names = 'name')), ':', NULL); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) [1] "package:pkgA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste5# #argv <- list(list(c('[', 'as.data.frame', 'plot', 'print', 'summary', 'as.character', 'print', 'print', 'plot', 'update', 'dim', 'dimnames', 'dimnames<-', '[', 't', 'summary', 'print', 'barchart', 'barchart', 'barchart', 'barchart', 'barchart', 'barchart', 'bwplot', 'bwplot', 'densityplot', 'densityplot', 'dotplot', 'dotplot', 'dotplot', 'dotplot', 'dotplot', 'dotplot', 'histogram', 'histogram', 'histogram', 'qqmath', 'qqmath', 'stripplot', 'stripplot', 'qq', 'xyplot', 'xyplot', 'levelplot', 'levelplot', 'levelplot', 'levelplot', 'contourplot', 'contourplot', 'contourplot', 'contourplot', 'cloud', 'cloud', 'cloud', 'wireframe', 'wireframe', 'splom', 'splom', 'splom', 'parallelplot', 'parallelplot', 'parallelplot', 'parallel', 'parallel', 'parallel', 'tmd', 'tmd', 'llines', 'ltext', 'lpoints'), c('shingle', 'shingle', 'shingle', 'shingle', 'shingle', 'shingleLevel', 'shingleLevel', 'trellis', 'trellis', 'trellis', 'trellis', 'trellis', 'trellis', 'trellis', 'trellis', 'trellis', 'summary.trellis', 'formula', 'array', 'default', 'matrix', 'numeric', 'table', 'formula', 'numeric', 'formula', 'numeric', 'formula', 'array', 'default', 'matrix', 'numeric', 'table', 'formula', 'factor', 'numeric', 'formula', 'numeric', 'formula', 'numeric', 'formula', 'formula', 'ts', 'formula', 'table', 'array', 'matrix', 'formula', 'table', 'array', 'matrix', 'formula', 'matrix', 'table', 'formula', 'matrix', 'formula', 'matrix', 'data.frame', 'formula', 'matrix', 'data.frame', 'formula', 'matrix', 'data.frame', 'formula', 'trellis', 'default', 'default', 'default')), '.', NULL); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) [1] "[.shingle" "as.data.frame.shingle" [3] "plot.shingle" "print.shingle" [5] "summary.shingle" "as.character.shingleLevel" [7] "print.shingleLevel" "print.trellis" [9] "plot.trellis" "update.trellis" [11] "dim.trellis" "dimnames.trellis" [13] "dimnames<-.trellis" "[.trellis" [15] "t.trellis" "summary.trellis" [17] "print.summary.trellis" "barchart.formula" [19] "barchart.array" "barchart.default" [21] "barchart.matrix" "barchart.numeric" [23] "barchart.table" "bwplot.formula" [25] "bwplot.numeric" "densityplot.formula" [27] "densityplot.numeric" "dotplot.formula" [29] "dotplot.array" "dotplot.default" [31] "dotplot.matrix" "dotplot.numeric" [33] "dotplot.table" "histogram.formula" [35] "histogram.factor" "histogram.numeric" [37] "qqmath.formula" "qqmath.numeric" [39] "stripplot.formula" "stripplot.numeric" [41] "qq.formula" "xyplot.formula" [43] "xyplot.ts" "levelplot.formula" [45] "levelplot.table" "levelplot.array" [47] "levelplot.matrix" "contourplot.formula" [49] "contourplot.table" "contourplot.array" [51] "contourplot.matrix" "cloud.formula" [53] "cloud.matrix" "cloud.table" [55] "wireframe.formula" "wireframe.matrix" [57] "splom.formula" "splom.matrix" [59] "splom.data.frame" "parallelplot.formula" [61] "parallelplot.matrix" "parallelplot.data.frame" [63] "parallel.formula" "parallel.matrix" [65] "parallel.data.frame" "tmd.formula" [67] "tmd.trellis" "llines.default" [69] "ltext.default" "lpoints.default" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste6# #argv <- list(list(c('dotplot', 'table', NA)), ' ', '\r'); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) [1] "dotplot\rtable\rNA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste7# #argv <- list(list(character(0)), ' ', ' '); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste8# #argv <- list(list('detaching', '‘package:splines’'), ' ', NULL); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) [1] "detaching ‘package:splines’" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste.testpaste9# #argv <- list(list('GRID', 'text', '6'), '.', NULL); .Internal(paste(argv[[1]], argv[[2]], argv[[3]])) [1] "GRID.text.6" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste01# #argv <- list(list('2', ': '), NULL); .Internal(paste0(argv[[1]], argv[[2]])) [1] "2: " ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste010# #argv <- list(list(structure(c('-0.16', '-0.03', ' 0.11', '-0.19', ' 0.12', ' 0.00', '-0.03', ' 0.18', ' 0.01', '-0.03', '-0.11', '-0.11', ' 0.00', ' 0.09', '-0.15', ' 0.05', '-0.04', ' 0.00', ' 0.04', ' 0.00', ' 0.01', ' 0.04', ' 0.11', ' 0.11', '-0.10', '-0.01', ' 0.04', ' 0.34', '-0.30', ' 0.00', '-0.02', '-0.31', '-0.04', '-0.01', '-0.05', '-0.05', '-0.07', '-0.03', ' 0.02', ' 0.21', '-0.17', ' 0.00', '-0.03', '-0.17', '-0.03', '-0.04', ' 0.28', '-0.45', '-0.24', ' 0.00', ' 0.02', ' 0.25', '-0.28', ' 0.00', '-0.01', '-0.24', '-0.04', '-0.04', '-0.06', '-0.06', '-0.44', '-0.01', ' 0.02', ' 0.18', '-0.26', ' 0.00', ' 0.00', '-0.19', '-0.03', '-0.03', '-0.04', '-0.04', ' 0.01', '-0.03', ' 0.04', ' 0.18', '-0.11', ' 0.00', '-0.02', '-0.15', '-0.02', '-0.02', '-0.06', '-0.06', ' 0.12', ' 0.08', ' 0.07', '-0.01', '-0.03', ' 0.00', '-0.01', ' 0.00', ' 0.00', ' 0.04', '-0.01', '-0.01', ' 0.00', ' 0.01', ' 0.08', '-0.01', ' 0.01', ' 0.00', '-0.02', ' 0.01', ' 0.00', ' 0.03', '-0.07', '-0.07', ' 0.21', ' 0.00', '-0.08', ' 0.04', '-0.42', ' 0.00', ' 0.01', ' 0.01', ' 0.00', ' 0.02', ' 0.05', ' 0.05', ' 0.06', '-0.04', '-0.09', ' 0.01', ' 0.01', ' 0.00', ' 0.01', '-0.02', ' 0.00', ' 0.03', ' 0.04', ' 0.04', '-0.04', '-0.01', ' 0.16', '-0.06', '-0.03', ' 0.00', ' 0.02', '-0.07', ' 0.00', ' 0.06', ' 0.08', ' 0.08', ' 0.47', '-0.15', ' 0.06', ' 0.01', ' 0.18', ' 0.00', '-0.03', ' 0.01', ' 0.00', '-0.02', '-0.06', '-0.06', '-0.04', ' 0.01', ' 0.09', '-0.08', '-0.10', ' 0.00', ' 0.05', '-0.18', ' 0.01', '-0.03', ' 0.12', ' 0.12', ' 0.03', ' 0.02', ' 0.12', '-0.08', '-0.11', ' 0.00', ' 0.03', '-0.14', ' 0.01', '-0.02', ' 0.10', ' 0.10', ' 0.73', '-0.24', '-0.26', '-0.44', '-0.89', ' NaN', ' 0.08', ' 0.45', ' 0.05', ' 0.14', ' 0.64', '-0.64', ' 1.71', ' 2.09', ' 1.86', ' 1.76', ' 0.13', ' NaN', ' 1.63', ' 1.92', ' 1.88', ' 1.60', ' 2.68', ' 2.68', ' 0.04', ' 0.00', ' 0.00', ' 0.01', ' 0.05', ' NaN', ' 0.00', ' 0.01', ' 0.00', ' 0.00', ' 0.03', ' 0.03', ' 0.39', ' 0.43', ' 0.36', ' 0.36', ' 0.06', ' 1.00', ' 0.26', ' 0.40', ' 0.36', ' 0.25', ' 0.57', ' 0.57'), .Dim = c(12L, 19L), .Dimnames = list(c('8', '19', '28', '39', '42', '57', '66', '80', '83', '87', '89', '93'), c('dfb.1_', 'dfb.Wght', 'dfb.Cyl4', 'dfb.Cyl5', 'dfb.Cyl6', 'dfb.Cyl8', 'dfb.Cyln', 'dfb.TypL', 'dfb.TypM', 'dfb.TypSm', 'dfb.TypSp', 'dfb.TypV', 'dfb.EngS', 'dfb.DrTF', 'dfb.DrTR', 'dffit', 'cov.r', 'cook.d', 'hat'))), c('', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '_*', '_*', '_*', '_*', '_*', '', '_*', '_*', '_*', '_*', '_*', '_*', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '_*', '', '', '', '', '_*', '_*')), NULL); .Internal(paste0(argv[[1]], argv[[2]])) [1] "-0.16" "-0.03" " 0.11" "-0.19" " 0.12" " 0.00" "-0.03" [8] " 0.18" " 0.01" "-0.03" "-0.11" "-0.11" " 0.00" " 0.09" [15] "-0.15" " 0.05" "-0.04" " 0.00" " 0.04" " 0.00" " 0.01" [22] " 0.04" " 0.11" " 0.11" "-0.10" "-0.01" " 0.04" " 0.34" [29] "-0.30" " 0.00" "-0.02" "-0.31" "-0.04" "-0.01" "-0.05" [36] "-0.05" "-0.07" "-0.03" " 0.02" " 0.21" "-0.17" " 0.00" [43] "-0.03" "-0.17" "-0.03" "-0.04" " 0.28" "-0.45" "-0.24" [50] " 0.00" " 0.02" " 0.25" "-0.28" " 0.00" "-0.01" "-0.24" [57] "-0.04" "-0.04" "-0.06" "-0.06" "-0.44" "-0.01" " 0.02" [64] " 0.18" "-0.26" " 0.00" " 0.00" "-0.19" "-0.03" "-0.03" [71] "-0.04" "-0.04" " 0.01" "-0.03" " 0.04" " 0.18" "-0.11" [78] " 0.00" "-0.02" "-0.15" "-0.02" "-0.02" "-0.06" "-0.06" [85] " 0.12" " 0.08" " 0.07" "-0.01" "-0.03" " 0.00" "-0.01" [92] " 0.00" " 0.00" " 0.04" "-0.01" "-0.01" " 0.00" " 0.01" [99] " 0.08" "-0.01" " 0.01" " 0.00" "-0.02" " 0.01" " 0.00" [106] " 0.03" "-0.07" "-0.07" " 0.21" " 0.00" "-0.08" " 0.04" [113] "-0.42" " 0.00" " 0.01" " 0.01" " 0.00" " 0.02" " 0.05" [120] " 0.05" " 0.06" "-0.04" "-0.09" " 0.01" " 0.01" " 0.00" [127] " 0.01" "-0.02" " 0.00" " 0.03" " 0.04" " 0.04" "-0.04" [134] "-0.01" " 0.16" "-0.06" "-0.03" " 0.00" " 0.02" "-0.07" [141] " 0.00" " 0.06" " 0.08" " 0.08" " 0.47" "-0.15" " 0.06" [148] " 0.01" " 0.18" " 0.00" "-0.03" " 0.01" " 0.00" "-0.02" [155] "-0.06" "-0.06" "-0.04" " 0.01" " 0.09" "-0.08" "-0.10" [162] " 0.00" " 0.05" "-0.18" " 0.01" "-0.03" " 0.12" " 0.12" [169] " 0.03" " 0.02" " 0.12" "-0.08" "-0.11" " 0.00" " 0.03" [176] "-0.14" " 0.01" "-0.02" " 0.10" " 0.10" " 0.73" "-0.24" [183] "-0.26" "-0.44" "-0.89" " NaN" " 0.08" " 0.45" " 0.05" [190] " 0.14" " 0.64" "-0.64" " 1.71_*" " 2.09_*" " 1.86_*" " 1.76_*" [197] " 0.13_*" " NaN" " 1.63_*" " 1.92_*" " 1.88_*" " 1.60_*" " 2.68_*" [204] " 2.68_*" " 0.04" " 0.00" " 0.00" " 0.01" " 0.05" " NaN" [211] " 0.00" " 0.01" " 0.00" " 0.00" " 0.03" " 0.03" " 0.39" [218] " 0.43" " 0.36" " 0.36" " 0.06" " 1.00_*" " 0.26" " 0.40" [225] " 0.36" " 0.25" " 0.57_*" " 0.57_*" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste011# #argv <- list(list(character(0), character(0), character(0)), NULL); .Internal(paste0(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste012# #argv <- list(list(c('Package:', 'Type:', 'Version:', 'Date:', 'License:', 'Depends:'), ' \\tab ', structure(c('myTst2', 'Package', '1.0', '2014-03-17', 'What license is it under?', 'methods'), .Names = c('Package', 'Type', 'Version', 'Date', 'License', 'Depends')), '\\cr'), NULL); .Internal(paste0(argv[[1]], argv[[2]])) [1] "Package: \\tab myTst2\\cr" [2] "Type: \\tab Package\\cr" [3] "Version: \\tab 1.0\\cr" [4] "Date: \\tab 2014-03-17\\cr" [5] "License: \\tab What license is it under?\\cr" [6] "Depends: \\tab methods\\cr" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste013# #argv <- list(list(character(0), '$y'), NULL); .Internal(paste0(argv[[1]], argv[[2]])) [1] "$y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste014# #argv <- list(list(c('text> ', 'text> ', 'text> ', 'text+ '), c('## The following two examples use latin1 characters: these may not', '## appear correctly (or be omitted entirely).', 'plot(1:10, 1:10, main = \'text(...) examples\\n~~~~~~~~~~~~~~\',', ' sub = \'R is GNU ©, but not ® ...\')')), '\n'); .Internal(paste0(argv[[1]], argv[[2]])) [1] "text> ## The following two examples use latin1 characters: these may not\ntext> ## appear correctly (or be omitted entirely).\ntext> plot(1:10, 1:10, main = 'text(...) examples\\n~~~~~~~~~~~~~~',\ntext+ sub = 'R is GNU ©, but not ® ...')" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste015# #argv <- list(list('cnstrO> ', 'constrOptim(c(2,-1,-1), fQP, gQP, ui = t(Amat), ci = bvec)'), '\n'); .Internal(paste0(argv[[1]], argv[[2]])) [1] "cnstrO> constrOptim(c(2,-1,-1), fQP, gQP, ui = t(Amat), ci = bvec)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste02# #argv <- list(list(structure(c('-0.20', ' 0.07', ' 0.16', ' 0.55', ' 0.13', '-0.07', '-0.08', '-0.48', ' 0.22', ' 0.04', '-0.34', '-0.38', '-0.02', '-0.23', ' 0.09', '-0.02', ' 0.12', '-0.03', ' 0.23', '-1.02', '-0.46', '-0.25', ' 0.75', '-1.16', ' 0.65', ' 1.66', ' 0.51', ' 2.09', ' 0.04', ' 0.01', ' 0.10', ' 0.27', ' 0.04', ' 0.33', ' 0.06', ' 0.53'), .Dim = c(4L, 9L), .Dimnames = list(c('Chile', 'United States', 'Zambia', 'Libya'), c('dfb.1_', 'dfb.pp15', 'dfb.pp75', 'dfb.dpi', 'dfb.ddpi', 'dffit', 'cov.r', 'cook.d', 'hat'))), c('', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '', '_*', '', '', '', '_*', '_*', '_*', '_*', '_*', '', '', '', '', '', '_*', '', '_*')), NULL); .Internal(paste0(argv[[1]], argv[[2]])) [1] "-0.20" " 0.07" " 0.16" " 0.55" " 0.13" "-0.07" "-0.08" [8] "-0.48" " 0.22" " 0.04" "-0.34" "-0.38" "-0.02" "-0.23" [15] " 0.09" "-0.02" " 0.12" "-0.03" " 0.23" "-1.02_*" "-0.46" [22] "-0.25" " 0.75" "-1.16_*" " 0.65_*" " 1.66_*" " 0.51_*" " 2.09_*" [29] " 0.04" " 0.01" " 0.10" " 0.27" " 0.04" " 0.33_*" " 0.06" [36] " 0.53_*" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste03# #argv <- list(list(c('\'1\'', '\'2\'', NA)), ','); .Internal(paste0(argv[[1]], argv[[2]])) [1] "'1','2',NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste04# #argv <- list(list(' ‘help.search()’ or ‘', '??'), NULL); .Internal(paste0(argv[[1]], argv[[2]])) [1] " ‘help.search()’ or ‘??" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste05# #argv <- list(list(structure(c('coef.aov', 'extractAIC.aov', 'model.tables.aov', 'print.aov', 'proj.aov', 'se.contrast.aov', 'summary.aov', 'TukeyHSD.aov'), class = 'MethodsFunction', info = structure(list(visible = c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE), from = structure(c(9L, 9L, 9L, 9L, 9L, 9L, 7L, 7L), .Label = c('CheckExEnv', 'package:base', 'package:datasets', 'package:graphics', 'package:grDevices', 'package:methods', 'package:stats', 'package:utils', 'registered S3method'), class = 'factor')), .Names = c('visible', 'from'), row.names = c('coef.aov', 'extractAIC.aov', 'model.tables.aov', 'print.aov', 'proj.aov', 'se.contrast.aov', 'summary.aov', 'TukeyHSD.aov'), class = 'data.frame')), c('*', '*', '*', '*', '*', '*', '', '')), NULL); .Internal(paste0(argv[[1]], argv[[2]])) [1] "coef.aov*" "extractAIC.aov*" "model.tables.aov*" [4] "print.aov*" "proj.aov*" "se.contrast.aov*" [7] "summary.aov" "TukeyHSD.aov" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste06# #argv <- list(list(character(0), character(0)), '\n'); .Internal(paste0(argv[[1]], argv[[2]])) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_paste0.testpaste07# #argv <- list(list(), NULL); .Internal(paste0(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pathexpand.testArgsValidation# #path.expand(42) Error in path.expand(42) : invalid 'path' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_pathexpand.testArgsValidation# #path.expand(NULL) Error in path.expand(NULL) : invalid 'path' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_pathexpand.testpathexpand1# #argv <- list('/tmp/RtmptPgrXI/Pkgs/pkgA'); .Internal(path.expand(argv[[1]])) [1] "/tmp/RtmptPgrXI/Pkgs/pkgA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pathexpand.testpathexpand2# #argv <- list(c('/home/lzhao/hg/r-instrumented/tests/compiler.Rcheck', '/home/lzhao/R/x86_64-unknown-linux-gnu-library/3.0')); .Internal(path.expand(argv[[1]])) [1] "/home/lzhao/hg/r-instrumented/tests/compiler.Rcheck" [2] "/home/lzhao/R/x86_64-unknown-linux-gnu-library/3.0" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pathexpand.testpathexpand3# #argv <- list(character(0)); .Internal(path.expand(argv[[1]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pathexpand.testpathexpand5# #argv <- structure(list(path = '/tmp/RtmpagC9oa/Pkgs/exNSS4'), .Names = 'path');do.call('path.expand', argv) [1] "/tmp/RtmpagC9oa/Pkgs/exNSS4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pathexpand.testpathexpand6# #path.expand('.'); wd <- getwd(); tryCatch({ setwd('/tmp'); path.expand('.') }, finally = { setwd(wd) }) [1] "." [1] "." ##com.oracle.truffle.r.test.builtins.TestBuiltin_pcre_config.testPCREConfig# #{ is.logical(pcre_config()) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_plus_Date.testplus_Date1# #argv <- structure(list(e1 = structure(1, units = 'days', class = 'difftime'), e2 = structure(14579, class = 'Date')), .Names = c('e1', 'e2'));do.call('+.Date', argv) [1] "2009-12-02" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testArgumentsCasts# #pmatch(1, NULL) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testArgumentsCasts# #pmatch(1:5, c(1,3), duplicates.ok=42) [1] 1 NA 2 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testArgumentsCasts# #pmatch(1:5, c(1,3), nomatch='str') [1] 1 NA 2 NA NA Warning message: In pmatch(1:5, c(1, 3), nomatch = "str") : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testArgumentsCasts# #pmatch(1:5, c(1,3), nomatch=NULL) [1] 1 NA 2 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testArgumentsCasts# #pmatch(NULL, 1) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testArgumentsCasts# #pmatch(table=1) Error in pmatch(table = 1) : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testArgumentsCasts# #pmatch(x=1) Error in pmatch(x = 1) : argument "table" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testArgumentsCasts# #pmatch(x=NULL, table=NULL) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testpmatch1# #argv <- list('kendall', c('pearson', 'kendall', 'spearman'), 0L, TRUE); .Internal(pmatch(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testpmatch2# #argv <- list('month', c('secs', 'mins', 'hours', 'days', 'weeks', 'months', 'years', 'DSTdays'), NA_integer_, FALSE); .Internal(pmatch(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testpmatch3# #argv <- list(c(NA_character_, NA_character_, NA_character_, NA_character_), 'NA', NA_integer_, TRUE); .Internal(pmatch(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testpmatch4# #argv <- list('maximum', 'euclidian', NA_integer_, FALSE); .Internal(pmatch(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testpmatch5# #argv <- list('fanny.object.', 'fanny.object', 0L, FALSE); .Internal(pmatch(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testpmatch6# #argv <- list(c('alpha', 'col', 'border', 'lty', 'lwd'), c('col', 'border', 'alpha', 'size', 'height', 'angle', 'density'), NA_integer_, TRUE); .Internal(pmatch(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 3 1 2 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testpmatch7# #argv <- list('unique.', 'unique.array', 0L, FALSE); .Internal(pmatch(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmatch.testpmatch8# #argv <- list(character(0), c('labels', 'col', 'alpha', 'adj', 'cex', 'lineheight', 'font'), NA_integer_, TRUE); .Internal(pmatch(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(7+42i) } Error in pmax(7 + (0+42i)) : invalid input type ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(as.raw(42)) } Error in pmax(as.raw(42)) : invalid input type ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c("1", "7"), c("42", "1")) } [1] "42" "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c("1", "7"), c("42", as.character(NA))) } [1] "42" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c("1", "7"), c("42", as.character(NA)), na.rm=TRUE) } [1] "42" "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c("1", "7"), character()) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c("1", "7", "8"), c("1"), c("42", "1")) } [1] "42" "7" "8" Warning message: In pmax(c("1", "7", "8"), c("1"), c("42", "1")) : an argument will be fractionally recycled ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c("1", as.character(NA)), c("42", "1"), na.rm=TRUE) } [1] "42" "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c("1", as.character(NA)), c(as.character(NA), as.character(NA)), c("42", "1"), na.rm=TRUE) } [1] "42" "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(1, 7), c(42, 1)) } [1] 42 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(1, 7), c(42, as.double(NA))) } [1] 42 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(1, 7), c(42, as.double(NA)), na.rm=TRUE) } [1] 42 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(1, 7), double()) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(1, 7, 8), c(1), c(42, 1)) } [1] 42 7 42 Warning message: In pmax(c(1, 7, 8), c(1), c(42, 1)) : an argument will be fractionally recycled ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(1L, 7L), c(42L, 1L)) } [1] 42 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(1L, 7L), c(42L, as.integer(NA))) } [1] 42 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(1L, 7L), c(42L, as.integer(NA)), na.rm=TRUE) } [1] 42 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(1L, 7L), integer()) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(1L, 7L, 8L), c(1L), c(42L, 1L)) } [1] 42 7 42 Warning message: In pmax(c(1L, 7L, 8L), c(1L), c(42L, 1L)) : an argument will be fractionally recycled ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(FALSE, TRUE), c(FALSE, NA)) } [1] 0 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(FALSE, TRUE), c(TRUE, FALSE)) } [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testPMax# #{ pmax(c(FALSE, TRUE), logical()) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax1# #argv <- list(FALSE, 5L, 12); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) [1] 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax10# #argv <- list(FALSE, c(1.05, 1.92, 0.36, 4.98, 4.56, 0.69, -5.97, 1.26, 5.58, -0.06, -4.92, -1.38, -0.3, 3.75, 1.11, 0.93, 3.33, 4.95, 0.99, 2.67, -0.75, -2.61, -0.66, 2.13, -6.78, 2.31, -0.15, 0.96, -1.92, 1.17, 0.57, -4.86, 1.11, 0.06, 2.91, -7.86, 0.45, 4.65, -4.23, -7.05, -1.29, 1.71, -1.98, -0.24, 0.06, 0.72, -0.99, -0.09, -3.39, 0.96, 4.65, 6.39, -0.3, -0.96, -2.01, 4.32, 0.12, -3.3, -2.85, -0.57, -2.04, -1.29, -2.52, 2.07, -1.95, 2.13, 0.57, 1.35, 1.35, -3.57, 3.9, 0.42, -1.08, -1.5, -1.41, -3.93, -3.06, 3.51, 4.53, -0.99, -0.03, -1.77, -0.84, -0.54, -3.21, 1.98, -2.13, 5.64, -0.42, -0.57, 2.52, 1.32, 3.99, -0.6, -1.35, 4.38, 3, -3.06, 2.04, 2.52), 0); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) [1] 1.05 1.92 0.36 4.98 4.56 0.69 0.00 1.26 5.58 0.00 0.00 0.00 0.00 3.75 1.11 [16] 0.93 3.33 4.95 0.99 2.67 0.00 0.00 0.00 2.13 0.00 2.31 0.00 0.96 0.00 1.17 [31] 0.57 0.00 1.11 0.06 2.91 0.00 0.45 4.65 0.00 0.00 0.00 1.71 0.00 0.00 0.06 [46] 0.72 0.00 0.00 0.00 0.96 4.65 6.39 0.00 0.00 0.00 4.32 0.12 0.00 0.00 0.00 [61] 0.00 0.00 0.00 2.07 0.00 2.13 0.57 1.35 1.35 0.00 3.90 0.42 0.00 0.00 0.00 [76] 0.00 0.00 3.51 4.53 0.00 0.00 0.00 0.00 0.00 0.00 1.98 0.00 5.64 0.00 0.00 [91] 2.52 1.32 3.99 0.00 0.00 4.38 3.00 0.00 2.04 2.52 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax11# #argv <- list(FALSE, c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L), 7L, c(7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 6L)); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 7 7 7 7 7 7 7 7 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax12# #argv <- list(FALSE, 1:7, structure(c(2, 3, 4, 2, 2, 2), .Dim = c(3L, 2L), .Dimnames = list(NULL, c('a', '')))); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) [1] 2 3 4 4 5 6 7 Warning message: an argument will be fractionally recycled ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax13# #argv <- list(FALSE, c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE)); .Internal(pmax(argv[[1]], argv[[2]])) [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [25] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [37] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [49] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [61] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [73] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [85] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [97] FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax14# #argv <- list(FALSE, structure(c(0, 0, -0.0906283137921162, -0.0801994352402973, -0.0235093686536505, -0.131187875867331, -0.131187875867331, -0.131187875867331, -0.131187875867331, 0, 0, 0, -0.106539777104723, -0.106539777104723, -0.106539777104723, 0, 0, 0.126786975893341, 0.126786975893341, 0.126786975893341, 0, -0.131187875867331, -0.131187875867331, -0.131187875867331, 0, -0.106539777104723, -0.106539777104723, -0.106539777104723, 0, 0, 0, -0.106539777104723, 0.172297822926899, 0.172297822926899, 0, 0, 0, 0, 0, -0.106539777104723, -0.106539777104723, -0.106539777104723, -0.106539777104723, 0, 0, 0, 0.172297822926899, 0.172297822926899), .Dim = c(12L, 4L)), 0); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) [1] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [8] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [15] 0.0000000 0.0000000 0.0000000 0.1267870 0.1267870 0.1267870 0.0000000 [22] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [29] 0.0000000 0.0000000 0.0000000 0.0000000 0.1722978 0.1722978 0.0000000 [36] 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 [43] 0.0000000 0.0000000 0.0000000 0.0000000 0.1722978 0.1722978 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax2# #argv <- list(FALSE, -100, structure(c(-Inf, 82.9775012103133, 8.55983483385341e+101, -Inf, 79.3831968838961, 8.55983483385341e+101), .Names = c('', '', '', '', '', ''))); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) [1] -1.000000e+02 8.297750e+01 8.559835e+101 -1.000000e+02 7.938320e+01 [6] 8.559835e+101 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax3# #argv <- list(FALSE, c(0L, 1L, 1L, 1L, 2L), 5L, c(6L, 5L, 5L, 5L, 4L)); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 6 5 5 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax4# #argv <- list(FALSE, 0, numeric(0)); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax5# #argv <- list(FALSE, structure(c(63.5607991023966, 46.8465846258113, 40.7088275958184, 31.3395189414991, 42.5666751143734, 47.0610532806931, 23.9315410227325, 43.0690616089581, 66.7869292908986, 49.2243580808943, 31.6784834018036, 24.3875466143556, 48.4619434336134, 53.5787701502931, 25.0466211495357, 45.0758464889871, 66.9256619232735, 49.3266089980428, 31.7843035976521, 24.4690118450696, 50.7406402769298, 56.0980619029545, 17.201254072711, 30.956714016252), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24')), 2.22044604925031e-16); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) [1] 63.56080 46.84658 40.70883 31.33952 42.56668 47.06105 23.93154 43.06906 [9] 66.78693 49.22436 31.67848 24.38755 48.46194 53.57877 25.04662 45.07585 [17] 66.92566 49.32661 31.78430 24.46901 50.74064 56.09806 17.20125 30.95671 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax6# #argv <- list(FALSE, FALSE, FALSE); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax7# #argv <- list(FALSE, 1L, c(15L, 15L, 15L, 15L, 15L, 15L, 15L, 15L, 15L)); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) [1] 15 15 15 15 15 15 15 15 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax8# #argv <- list(FALSE, structure(c(0.0193057433072215, 0.00434780301273374, 0.0549750394687487, 0.510714717273168, 0.0482077179041234, 0.349752997299534, 0.15114556457294, 0.614610341225044, 0.270367074042314, 0.376738504472563, 0.00100006670765362, 0.616978737736246, 0.000115089535300671, 0.114479803728228, 0.0345012755277619, 0.520238904129887, 0.0177036726480846, 0.00345369763623826, 0.0372744005491215, 0.245210198359521, 0.0651842100459408, 0.4506670448926, 0.178923774229777, 0.332256206500317, 0.402299202627705, 0.380395198873703, 0.000984316947253816, 0.403063829062269, 0.000174431720286923, 0.138958543973059, 0.0379750520636422, 0.379247258699123), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32')), 0); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) [1] 0.0193057433 0.0043478030 0.0549750395 0.5107147173 0.0482077179 [6] 0.3497529973 0.1511455646 0.6146103412 0.2703670740 0.3767385045 [11] 0.0010000667 0.6169787377 0.0001150895 0.1144798037 0.0345012755 [16] 0.5202389041 0.0177036726 0.0034536976 0.0372744005 0.2452101984 [21] 0.0651842100 0.4506670449 0.1789237742 0.3322562065 0.4022992026 [26] 0.3803951989 0.0009843169 0.4030638291 0.0001744317 0.1389585440 [31] 0.0379750521 0.3792472587 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmax.testpmax9# #argv <- list(FALSE, structure(c(35.2592591597479, 59.4999999843455, 12.4507044164935, 2.53543312099158, 10.3703703404756, 42.0000005728299, 8.14084538858294, 34.04724471918, 7.77778142338517, 26.9999999889474, 6.70422536805755, 3.62204828940961, 2.59259259558406, 14.4999999939529, 6.70422536805755, 5.79527724426002, 32.7407408614199, 59.5000000376209, 13.54929592464, 4.46456690511876, 9.62962966454155, 42.0000006104361, 8.85915523787816, 59.9527554977598, 7.22222565443263, 27.0000000131229, 7.29577463400041, 6.37795443616981, 2.40740742585304, 14.500000006936, 7.29577463400041, 10.2047270647755), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32')), 2.22044604925031e-16); .Internal(pmax(argv[[1]], argv[[2]], argv[[3]])) [1] 35.259259 59.500000 12.450704 2.535433 10.370370 42.000001 8.140845 [8] 34.047245 7.777781 27.000000 6.704225 3.622048 2.592593 14.500000 [15] 6.704225 5.795277 32.740741 59.500000 13.549296 4.464567 9.629630 [22] 42.000001 8.859155 59.952755 7.222226 27.000000 7.295775 6.377954 [29] 2.407407 14.500000 7.295775 10.204727 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testArgsCasting# #.Internal(pmin(3, quote(a))) Error: invalid input type ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testArgsCasting# #pmin(c(1,2), c(3,0), na.rm='asd') Error in pmin(c(1, 2), c(3, 0), na.rm = "asd") : invalid 'na.rm' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testArgsCasting# #pmin(c(1,2), c(3,0), na.rm=NA) Error in pmin(c(1, 2), c(3, 0), na.rm = NA) : invalid 'na.rm' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testArgsCasting# #pmin(c(1,2), c(3,NA), na.rm=c(42, 0)) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(7+42i) } Error in pmin(7 + (0+42i)) : invalid input type ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(as.raw(42)) } Error in pmin(as.raw(42)) : invalid input type ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c("1", "7"), c("42", "1")) } [1] "1" "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c("1", "7"), c("42", as.character(NA))) } [1] "1" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c("1", "7"), c("42", as.character(NA)), na.rm=TRUE) } [1] "1" "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c("1", "7"), character()) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c("1", "7", "8"), c("1"), c("42", "1")) } [1] "1" "1" "1" Warning message: In pmin(c("1", "7", "8"), c("1"), c("42", "1")) : an argument will be fractionally recycled ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c("1", as.character(NA)), c("42", "1"), na.rm=TRUE) } [1] "1" "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c("1", as.character(NA)), c(as.character(NA), as.character(NA)), c("42", "1"), na.rm=TRUE) } [1] "1" "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(1, 7), c(42, 1)) } [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(1, 7), c(42, as.double(NA))) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(1, 7), c(42, as.double(NA)), na.rm=TRUE) } [1] 1 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(1, 7), double()) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(1, 7, 8), c(1), c(42, 1)) } [1] 1 1 1 Warning message: In pmin(c(1, 7, 8), c(1), c(42, 1)) : an argument will be fractionally recycled ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(1L, 7L), c(42L, 1L)) } [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(1L, 7L), c(42L, as.integer(NA))) } [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(1L, 7L), c(42L, as.integer(NA)), na.rm=TRUE) } [1] 1 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(1L, 7L), integer()) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(1L, 7L, 8L), c(1L), c(42L, 1L)) } [1] 1 1 1 Warning message: In pmin(c(1L, 7L, 8L), c(1L), c(42L, 1L)) : an argument will be fractionally recycled ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(FALSE, TRUE), c(FALSE, NA)) } [1] 0 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(FALSE, TRUE), c(TRUE, FALSE)) } [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testPMin# #{ pmin(c(FALSE, TRUE), logical()) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin1# #argv <- list(FALSE, c(0, 0.25, 0.5, 0.75, 1), 1); .Internal(pmin(argv[[1]], argv[[2]], argv[[3]])) [1] 0.00 0.25 0.50 0.75 1.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin10# #argv <- list(FALSE, 1, 0.341867139159); .Internal(pmin(argv[[1]], argv[[2]], argv[[3]])) [1] 0.3418671 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin11# #argv <- list(FALSE, c(2.35405350797934e-06, 0.000210159024072429, 0.000257684187404011, 0.000981478332360736, 0.00105260958830543, 0.00124148072892802, 0.00132598801923585, 0.00156850331255678, 0.00225455732762676, 0.003795380309271, 0.00611494315340942, 0.0161395372907077, 0.0330242962313738, 0.0353834177611007, 0.0523699658057458, 0.068319089314331, 0.0705922565893261, 0.0880512860101142, 0.0940103983967277, 0.112979808322889, 0.211501681388388, 0.492273640304204, 0.605329775053071, 0.626223946736039, 0.739515289321684, 0.828110328240387, 0.86333312789587, 1.19065433061771, 1.89079625396729, 2.05849377808347, 2.20921371984431, 2.85600042559897, 3.04889487308354, 4.66068200259841, 4.83080935233713, 4.92175460488491, 5.31945286062773, 5.75155046407955, 5.78319462345744), 0.943789021783783); .Internal(pmin(argv[[1]], argv[[2]], argv[[3]])) [1] 2.354054e-06 2.101590e-04 2.576842e-04 9.814783e-04 1.052610e-03 [6] 1.241481e-03 1.325988e-03 1.568503e-03 2.254557e-03 3.795380e-03 [11] 6.114943e-03 1.613954e-02 3.302430e-02 3.538342e-02 5.236997e-02 [16] 6.831909e-02 7.059226e-02 8.805129e-02 9.401040e-02 1.129798e-01 [21] 2.115017e-01 4.922736e-01 6.053298e-01 6.262239e-01 7.395153e-01 [26] 8.281103e-01 8.633331e-01 9.437890e-01 9.437890e-01 9.437890e-01 [31] 9.437890e-01 9.437890e-01 9.437890e-01 9.437890e-01 9.437890e-01 [36] 9.437890e-01 9.437890e-01 9.437890e-01 9.437890e-01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin2# #argv <- list(FALSE, c(1.01547865839261, 1.01252937204691, 1.00644625408792, 0.998699246049516, 0.989861830865133, 0.980229984263028, 0.969980509594864, 0.959229159804225, 0.948056660278026, 0.948056660278026, 0.936413637553504, 0.924430242566905, 0.924430242566905, 0.912012661079992, 0.912012661079992, 0.912012661079992, 0.912012661079992, 0.912012661079992, 0.912012661079992, 0.89856564301575, 0.89856564301575, 0.89856564301575, 0.89856564301575, 0.884221004526004, 0.884221004526004, 0.884221004526004, 0.884221004526004, 0.868846889674391, 0.852918138766346, 0.852918138766346, 0.852918138766346, 0.836013989965276, 0.836013989965276, 0.818281118997659, 0.818281118997659, 0.799674858806929, 0.78048190648179, 0.760752205123712, 0.740524405390135, 0.698688252548957, 0.677121358432204, 0.677121358432204, 0.677121358432204, 0.653968759838845, 0.630226345284056, 0.60591293760604, 0.5810405538867, 0.5810405538867, 0.554772713636871, 0.554772713636871, 0.526885054753327, 0.526885054753327, 0.497124929362659, 0.497124929362659, 0.465290373327728, 0.431410832191818, 0.395597572090297, 0.358012869967492, 0.358012869967492, 0.358012869967492, 0.390645999939295, 0.390645999939295, 1.00856963764107, 1.00691545377429, 1.00354783420184, 0.994430782349702, 0.989161076962549, 0.983568844113983, 0.971651869906627, 0.965403818059832, 0.958998025317496, 0.952453588123512, 0.945785731840592, 0.939006829762577, 0.932127100227826, 0.925155098145928, 0.918098070593368, 0.910962219832367, 0.903752901643838, 0.896474777439562, 0.889131932689408, 0.874266085562073, 0.866749125736792, 0.85917963981466, 0.85917963981466, 0.85917963981466, 0.851432533571458, 0.851432533571458, 0.835646571743332, 0.819657377450186, 0.811591248493136, 0.811591248493136, 0.803403072648503, 0.803403072648503, 0.803403072648503, 0.79500789222886, 0.79500789222886, 0.78647848620035, 0.777810139927498, 0.777810139927498, 0.768997769554365, 0.760132009504045, 0.751214427604144, 0.751214427604144, 0.751214427604144, 0.742042333451995, 0.742042333451995, 0.732706928458195, 0.723314130803801, 0.713865427684027, 0.713865427684027, 0.704242881823747, 0.704242881823747, 0.694438026993695, 0.684573363315093, 0.674650164742493, 0.664669564073024, 0.664669564073024, 0.664669564073024, 0.654342845821626, 0.643951412016272, 0.633496370097346, 0.633496370097346, 0.622814395282618, 0.622814395282618, 0.611712238653597, 0.600530813249145, 0.589271296091113, 0.577934661160654, 0.577934661160654, 0.554603983179207, 0.542813560886543, 0.530698712197854, 0.530698712197854, 0.518231810914377, 0.518231810914377, 0.518231810914377, 0.505091485230836, 0.491816896403255, 0.478408881208852, 0.464867758182769, 0.464867758182769, 0.450831087639633, 0.43663736059032, 0.422285766886131, 0.422285766886131, 0.407334269006221, 0.392187384239101, 0.376842383287708, 0.376842383287708, 0.36074886771613, 0.344393472477708, 0.327769800745284, 0.310869313273075, 0.293681131444043, 0.27619182464681, 0.258385252532011, 0.240242648154923, 0.221743435532848, 0.202868148187672, 0.183607543425597, 0.183607543425597, 0.16434288099768, 0.16434288099768, 0.16434288099768, 0.16434288099768, 1.01958384078021, 1.0158820929578, 1.00818641731953, 0.998355892450852, 0.98711678103063, 0.974844224342501, 0.961762390694789, 0.94801800556359, 0.933713296997721, 0.918922795982771, 0.918922795982771, 0.903505632185222, 0.887664218536847, 0.8714385967694, 0.854601072478364, 0.837400228461143, 0.81986117753083, 0.80200434269104, 0.783846415628184, 0.765401054645917, 0.746679400612251, 0.727690462294359, 0.70844140545579, 0.688937769124757, 0.669183625153216, 0.649181692191925, 0.628933411668998, 0.608438990755048, 0.608438990755048, 0.587078835123946, 0.565417411428399, 0.543452081149807, 0.521178337588507, 0.498589701519445, 0.475677565090786, 0.475677565090786, 0.451501204504207, 0.426861888982249, 0.401742325799741, 0.376120821121693, 0.349971441565183, 0.323265236972233, 0.323265236972233, 0.294966951140867, 0.265661696527275, 0.265661696527275, 0.24198035833067, 0.229359831745471, NA, NA), 1); .Internal(pmin(argv[[1]], argv[[2]], argv[[3]])) [1] 1.0000000 1.0000000 1.0000000 0.9986992 0.9898618 0.9802300 0.9699805 [8] 0.9592292 0.9480567 0.9480567 0.9364136 0.9244302 0.9244302 0.9120127 [15] 0.9120127 0.9120127 0.9120127 0.9120127 0.9120127 0.8985656 0.8985656 [22] 0.8985656 0.8985656 0.8842210 0.8842210 0.8842210 0.8842210 0.8688469 [29] 0.8529181 0.8529181 0.8529181 0.8360140 0.8360140 0.8182811 0.8182811 [36] 0.7996749 0.7804819 0.7607522 0.7405244 0.6986883 0.6771214 0.6771214 [43] 0.6771214 0.6539688 0.6302263 0.6059129 0.5810406 0.5810406 0.5547727 [50] 0.5547727 0.5268851 0.5268851 0.4971249 0.4971249 0.4652904 0.4314108 [57] 0.3955976 0.3580129 0.3580129 0.3580129 0.3906460 0.3906460 1.0000000 [64] 1.0000000 1.0000000 0.9944308 0.9891611 0.9835688 0.9716519 0.9654038 [71] 0.9589980 0.9524536 0.9457857 0.9390068 0.9321271 0.9251551 0.9180981 [78] 0.9109622 0.9037529 0.8964748 0.8891319 0.8742661 0.8667491 0.8591796 [85] 0.8591796 0.8591796 0.8514325 0.8514325 0.8356466 0.8196574 0.8115912 [92] 0.8115912 0.8034031 0.8034031 0.8034031 0.7950079 0.7950079 0.7864785 [99] 0.7778101 0.7778101 0.7689978 0.7601320 0.7512144 0.7512144 0.7512144 [106] 0.7420423 0.7420423 0.7327069 0.7233141 0.7138654 0.7138654 0.7042429 [113] 0.7042429 0.6944380 0.6845734 0.6746502 0.6646696 0.6646696 0.6646696 [120] 0.6543428 0.6439514 0.6334964 0.6334964 0.6228144 0.6228144 0.6117122 [127] 0.6005308 0.5892713 0.5779347 0.5779347 0.5546040 0.5428136 0.5306987 [134] 0.5306987 0.5182318 0.5182318 0.5182318 0.5050915 0.4918169 0.4784089 [141] 0.4648678 0.4648678 0.4508311 0.4366374 0.4222858 0.4222858 0.4073343 [148] 0.3921874 0.3768424 0.3768424 0.3607489 0.3443935 0.3277698 0.3108693 [155] 0.2936811 0.2761918 0.2583853 0.2402426 0.2217434 0.2028681 0.1836075 [162] 0.1836075 0.1643429 0.1643429 0.1643429 0.1643429 1.0000000 1.0000000 [169] 1.0000000 0.9983559 0.9871168 0.9748442 0.9617624 0.9480180 0.9337133 [176] 0.9189228 0.9189228 0.9035056 0.8876642 0.8714386 0.8546011 0.8374002 [183] 0.8198612 0.8020043 0.7838464 0.7654011 0.7466794 0.7276905 0.7084414 [190] 0.6889378 0.6691836 0.6491817 0.6289334 0.6084390 0.6084390 0.5870788 [197] 0.5654174 0.5434521 0.5211783 0.4985897 0.4756776 0.4756776 0.4515012 [204] 0.4268619 0.4017423 0.3761208 0.3499714 0.3232652 0.3232652 0.2949670 [211] 0.2656617 0.2656617 0.2419804 0.2293598 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin3# #argv <- list(FALSE, c(19.7787405591752, 12504507.4953993, 12504507.4953993, 5.96190157728191e+41), 1); .Internal(pmin(argv[[1]], argv[[2]], argv[[3]])) [1] 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin4# #argv <- list(FALSE, structure(c(2, 3, 4, 2, 2, 2), .Dim = c(3L, 2L), .Dimnames = list(NULL, c('a', ''))), 1:7); .Internal(pmin(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 3 2 2 2 2 Warning message: an argument will be fractionally recycled ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin5# #argv <- list(FALSE, structure(c(-2.30560410637911, -1.56788329848973, -0.885216282233891, -0.246592299284877, 0.350190802022645, 0.913941628350052, 1.44466017969734, 1.94895291106052), .Names = c('1', '2', '3', '4', '5', '6', '7', '8')), 700); .Internal(pmin(argv[[1]], argv[[2]], argv[[3]])) [1] -2.3056041 -1.5678833 -0.8852163 -0.2465923 0.3501908 0.9139416 1.4446602 [8] 1.9489529 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin6# #argv <- list(FALSE, 1, structure(numeric(0), .Dim = c(4L, 0L))); .Internal(pmin(argv[[1]], argv[[2]], argv[[3]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin7# #argv <- list(FALSE, FALSE, FALSE); .Internal(pmin(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin8# #argv <- list(FALSE, FALSE); .Internal(pmin(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_pmin.testpmin9# #argv <- list(FALSE, 48L, 19L); .Internal(pmin(argv[[1]], argv[[2]], argv[[3]])) [1] 19 ##com.oracle.truffle.r.test.builtins.TestBuiltin_polyroot.testpolyroot1# #argv <- list(1:2); .Internal(polyroot(argv[[1]])) [1] -0.5+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_polyroot.testpolyroot2# #argv <- list(FALSE); .Internal(polyroot(argv[[1]])) complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_polyroot.testpolyroot3# #argv <- list(structure(c(1, 0.035205614861993, 0.237828814667385), .Names = c('', '', ''))); .Internal(polyroot(argv[[1]])) [1] -0.074015+2.049202i -0.074015-2.049202i ##com.oracle.truffle.r.test.builtins.TestBuiltin_polyroot.testpolyroot4# #argv <- list(c(1, -1.16348488318732, 0.667550726251972, -0.342308178637008)); .Internal(polyroot(argv[[1]])) [1] 1.174248+0.000000i 0.387949+1.528836i 0.387949-1.528836i ##com.oracle.truffle.r.test.builtins.TestBuiltin_polyroot.testpolyroot5# #argv <- list(c(1, 0.0853462951557329, -0.433003162033324, 0.141816558560935, -0.268523717394886, -0.0970671649038473)); .Internal(polyroot(argv[[1]])) [1] 0.319017+1.488058i -1.080644-0.000000i 1.176089+0.000000i [4] 0.319017-1.488058i -3.499850-0.000000i ##com.oracle.truffle.r.test.builtins.TestBuiltin_polyroot.testpolyroot6# #argv <- list(c(1, 8, 28, 56, 70, 56, 28, 8, 1)); .Internal(polyroot(argv[[1]])) [1] -1-0i -1+0i -1+0i -1-0i -1-0i -1-0i -1-0i -1-0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_postoenv.testPosToEnv# #list(pos.to.env(1), attr(pos.to.env(2), 'name')) [[1]] [[2]] [1] "package:stats" ##com.oracle.truffle.r.test.builtins.TestBuiltin_postoenv.testPosToEnv# #{ foo <- function(x) pos.to.env(x); bar <- function(barvar) foo(barvar); ls(bar(-1)); } [1] "barvar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_postoenv.testPosToEnv# #{ foo <- function(x) pos.to.env(x); list(foo(1), attr(foo(2), 'name')); } [[1]] [[2]] [1] "package:stats" ##com.oracle.truffle.r.test.builtins.TestBuiltin_postoenv.testPosToEnvValidation# #pos.to.env('hello') Error in pos.to.env("hello") : invalid 'pos' argument In addition: Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_postoenv.testPosToEnvValidation# #pos.to.env(-1) Error in pos.to.env(-1) : no enclosing environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_postoenv.testPosToEnvValidation# #pos.to.env(-3) Error in pos.to.env(-3) : invalid 'pos' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_postoenv.testPosToEnvValidation# #pos.to.env(0) Error in pos.to.env(0) : invalid 'pos' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_postoenv.testPosToEnvValidation# #pos.to.env(1000) Error in pos.to.env(1000) : invalid 'pos' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_pretty.testpretty1# #argv <- list(0L, 3L, 5, 1, 0.75, c(1.5, 2.75), 0); .Internal(pretty(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) $l [1] 0 $u [1] 3 $n [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pretty.testpretty2# #argv <- list(-0.03, 1.11, 5, 1, 0.75, c(1.5, 2.75), 0); .Internal(pretty(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) $l [1] -0.2 $u [1] 1.2 $n [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pretty.testpretty3# #argv <- list(-6.64448090063514e-06, 6.64454021993011e-06, 1, 0, 0.75, c(1.5, 2.75), 0); .Internal(pretty(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) $l [1] -1e-05 $u [1] 1e-05 $n [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_pretty.testpretty4# #argv <- list(1.234e+100, 1.234e+100, 5, 1, 0.75, c(1.5, 2.75), 0); .Internal(pretty(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) $l [1] 1.2e+100 $u [1] 1.3e+100 $n [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_primUntrace.testArgsCasts# #.primUntrace(42) Error in .primUntrace(42) : argument must be a function ##com.oracle.truffle.r.test.builtins.TestBuiltin_primUntrace.testprimUntrace1# #argv <- list(.Primitive('sum'));.primUntrace(argv[[1]]); ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ x<-c(11, 7, 2222, 7, 33); print(x,quote=TRUE) } [1] 11 7 2222 7 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ n <- 17 ; fac <- factor(rep(1:3, length = n), levels = 1:5) ; y<-tapply(1:n, fac, sum); y } 1 2 3 4 5 51 57 45 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ nql <- noquote(letters); nql[1:4] <- "oh"; print(nql)} [1] oh oh oh oh e f g h i j k l m n o p q r s t u v w x y [26] z ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ nql <- noquote(letters); nql} [1] a b c d e f g h i j k l m n o p q r s t u v w x y z ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ nql <- noquote(letters); print(nql)} [1] a b c d e f g h i j k l m n o p q r s t u v w x y z ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ print(1:3,quote=TRUE) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ print(23) } [1] 23 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ print(c("foo"),quote=FALSE)} [1] foo ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ print(c(1,2.34567),quote=TRUE) } [1] 1.00000 2.34567 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ print(c(1.1,2.34567),quote=TRUE) } [1] 1.10000 2.34567 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ print(c(11.1,2.34567),quote=TRUE) } [1] 11.10000 2.34567 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ print(list(1,2,3),quote=TRUE) } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ print(list(list(list(1,2),list(3)),list(list(4),list(5,6))),quote=TRUE) } [[1]] [[1]][[1]] [[1]][[1]][[1]] [1] 1 [[1]][[1]][[2]] [1] 2 [[1]][[2]] [[1]][[2]][[1]] [1] 3 [[2]] [[2]][[1]] [[2]][[1]][[1]] [1] 4 [[2]][[2]] [[2]][[2]][[1]] [1] 5 [[2]][[2]][[2]] [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ print.mycls <- function(x, ...) { printhelper(x, ...) }; printhelper <- function(x, sec = "") { if (sec == "") print("sec arg filled with default") }; a <- structure(42, class="mycls"); a; } [1] "sec arg filled with default" ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ val <- 42L; attr(val, 'contrast') <- list(k=1); qr <- list(qr=val); qr } $qr [1] 42 attr(,"contrast") attr(,"contrast")$k [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ x <- 42; attr(x,'myattr') <- list(k=3); attributes(x) } $myattr $myattr$k [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ x<-c("11", "7", "2222", "7", "33"); names(x)<-1:5; print(x,quote=TRUE) } 1 2 3 4 5 "11" "7" "2222" "7" "33" ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ x<-c("11", "7", "2222", "7", "33"); print(x,quote=TRUE) } [1] "11" "7" "2222" "7" "33" ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ x<-c(1, 2:20, 21); n<-"a"; n[21]="b"; names(x)<-n; print(x,quote=TRUE) } a 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 b 17 18 19 20 21 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ x<-c(1,2); names(x)=c("a", "b"); print(x,quote=TRUE) } a b 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ x<-c(10000000, 10000:10007, 21000000); n<-"a"; n[10]="b"; names(x)<-n; print(x,quote=TRUE) } a 10000000 10000 10001 10002 10003 10004 10005 10006 b 10007 21000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ x<-c(11, 7, 2222, 7, 33); names(x)<-1:5; print(x,quote=TRUE) } 1 2 3 4 5 11 7 2222 7 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ x<-matrix(c("a","b","c","d"),nrow=2);print(x,quote=FALSE)} [,1] [,2] [1,] a c [2,] b d ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testPrint# #{ y<-c("a","b","c","d");dim(y)<-c(1,2,2);print(y,quote=FALSE)} , , 1 [,1] [,2] [1,] a b , , 2 [,1] [,2] [1,] c d ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testprint1# #argv <- structure(list(x = 'The leverage of the points is'), .Names = 'x');do.call('print', argv) [1] "The leverage of the points is" ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testprint2# #argv <- structure(list(x = structure(list(modelID = 0L, terms = Species ~ Sepal.Length + Sepal.Width + Petal.Length + Petal.Width, class.lev = c('setosa', 'versicolor', 'virginica'), model = 'rf', formula = Species ~ Sepal.Length + Sepal.Width + Petal.Length + Petal.Width, noClasses = 3L, priorClassProb = c(0.333333333333333, 0.333333333333333, 0.333333333333333), avgTrainPrediction = 0, noNumeric = 4L, noDiscrete = 1L, discAttrNames = 'Species', discValNames = list(c('setosa', 'versicolor', 'virginica')), numAttrNames = c('Sepal.Length', 'Sepal.Width', 'Petal.Length', 'Petal.Width'), discmap = 1L, nummap = 2:5, skipmap = integer(0)), .Names = c('modelID', 'terms', 'class.lev', 'model', 'formula', 'noClasses', 'priorClassProb', 'avgTrainPrediction', 'noNumeric', 'noDiscrete', 'discAttrNames', 'discValNames', 'numAttrNames', 'discmap', 'nummap', 'skipmap'), class = 'CoreModel')), .Names = 'x');do.call('print', argv) $modelID [1] 0 $terms Species ~ Sepal.Length + Sepal.Width + Petal.Length + Petal.Width $class.lev [1] "setosa" "versicolor" "virginica" $model [1] "rf" $formula Species ~ Sepal.Length + Sepal.Width + Petal.Length + Petal.Width $noClasses [1] 3 $priorClassProb [1] 0.3333333 0.3333333 0.3333333 $avgTrainPrediction [1] 0 $noNumeric [1] 4 $noDiscrete [1] 1 $discAttrNames [1] "Species" $discValNames $discValNames[[1]] [1] "setosa" "versicolor" "virginica" $numAttrNames [1] "Sepal.Length" "Sepal.Width" "Petal.Length" "Petal.Width" $discmap [1] 1 $nummap [1] 2 3 4 5 $skipmap integer(0) attr(,"class") [1] "CoreModel" ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testprint3# #argv <- structure(list(x = structure(list(CV = c(4.44258707232128, 1.3448257559694, 0.885694975057761, 0.838088461472644), mit = structure(list(p = structure(c(0.452549279246557, 0.13386271764225, 0.267245510599797, 0.146342492511396), .Names = c('cmp1', 'cmp2', 'cmp3', 'cmp4')), mu = structure(c(0.381966097098555, 3.82765024730876, 1.80304880351015, 2.5878804906034, 2.61803339869107, 0.203368399460934, 1.05601823938856, 0.0596409214659023), .Dim = c(4L, 2L), .Dimnames = list(c('cmp1', 'cmp2', 'cmp3', 'cmp4'), c('k1', 'k2'))), Sigma = structure(c(0.22917975838358, 0.847714717429939, 0.288537968483766, 0.738832302812549, -0.400000241640847, -0.0861897092187198, -0.100073467783835, -0.170562219060232, -0.400000241640847, -0.0861897092187198, -0.100073467783835, -0.170562219060232, 1.57082072508295, 0.0727738502834565, 0.219785702621389, 0.217416957416503), .Dim = c(4L, 4L), .Dimnames = list(c('cmp1', 'cmp2', 'cmp3', 'cmp4'), c('k1k1', 'k1k2', 'k2k1', 'k2k2'))), df = 1), .Names = c('p', 'mu', 'Sigma', 'df')), summary = structure(list(H = c(1, 2, 3, 4), METHOD.mu = structure(c(1L, 1L, 1L, 1L), .Label = 'BFGS', class = 'factor'), TIME.mu = c(1.301, 0.634, 1.148, 0.716000000000001), METHOD.p = structure(c(1L, 2L, 2L, 2L), .Label = c('NONE', 'NLMINB'), class = 'factor'), TIME.p = c(0, 0.00600000000000023, 0.0129999999999981, 0.0309999999999988), CV = c(4.44258707232128, 1.3448257559694, 0.885694975057761, 0.838088461472644)), .Names = c('H', 'METHOD.mu', 'TIME.mu', 'METHOD.p', 'TIME.p', 'CV'), row.names = c(NA, 4L), class = 'data.frame')), .Names = c('CV', 'mit', 'summary'))), .Names = 'x');do.call('print', argv) $CV [1] 4.4425871 1.3448258 0.8856950 0.8380885 $mit $mit$p cmp1 cmp2 cmp3 cmp4 0.4525493 0.1338627 0.2672455 0.1463425 $mit$mu k1 k2 cmp1 0.3819661 2.61803340 cmp2 3.8276502 0.20336840 cmp3 1.8030488 1.05601824 cmp4 2.5878805 0.05964092 $mit$Sigma k1k1 k1k2 k2k1 k2k2 cmp1 0.2291798 -0.40000024 -0.40000024 1.57082073 cmp2 0.8477147 -0.08618971 -0.08618971 0.07277385 cmp3 0.2885380 -0.10007347 -0.10007347 0.21978570 cmp4 0.7388323 -0.17056222 -0.17056222 0.21741696 $mit$df [1] 1 $summary H METHOD.mu TIME.mu METHOD.p TIME.p CV 1 1 BFGS 1.301 NONE 0.000 4.4425871 2 2 BFGS 0.634 NLMINB 0.006 1.3448258 3 3 BFGS 1.148 NLMINB 0.013 0.8856950 4 4 BFGS 0.716 NLMINB 0.031 0.8380885 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testprint4# #argv <- structure(list(x = c(1.12029789965078, -0.718988837588323, -0.799820795962862, 1.36325504609423, -0.877647212109208, -1.46608694151033, -0.277315770575131, 0.49759016736751, -1.49309981133256, 0.147586557048694, 1.32490895489118, -0.993328430480091, -0.809428793397133, 1.39969712961021, 0.43065679489178, 0.19581824909626, -0.0622842939729247, 0.57841339234696, 2.31951400192491, 2.93765523729633)), .Names = 'x');do.call('print', argv) [1] 1.12029790 -0.71898884 -0.79982080 1.36325505 -0.87764721 -1.46608694 [7] -0.27731577 0.49759017 -1.49309981 0.14758656 1.32490895 -0.99332843 [13] -0.80942879 1.39969713 0.43065679 0.19581825 -0.06228429 0.57841339 [19] 2.31951400 2.93765524 ##com.oracle.truffle.r.test.builtins.TestBuiltin_print.testprint5# #argv <- structure(list(x = structure(list(statistic = structure(0.87901108669074, .Names = 't'), parameter = structure(19, .Names = 'df'), p.value = 0.390376937081292, conf.int = structure(c(-0.332667989442433, 0.814407243771461), conf.level = 0.95), estimate = structure(0.240869627164514, .Names = 'mean of x'), null.value = structure(0, .Names = 'mean'), alternative = 'two.sided', method = 'One Sample t-test', data.name = 'x'), .Names = c('statistic', 'parameter', 'p.value', 'conf.int', 'estimate', 'null.value', 'alternative', 'method', 'data.name'), class = 'htest')), .Names = 'x');do.call('print', argv) One Sample t-test data: x t = 0.87901, df = 19, p-value = 0.3904 alternative hypothesis: true mean is not equal to 0 95 percent confidence interval: -0.3326680 0.8144072 sample estimates: mean of x 0.2408696 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printAsIs.testprintAsIs1# #argv <- structure(list(x = structure(c(2L, 5L), .Dim = 1:2, class = 'AsIs')), .Names = 'x');do.call('print.AsIs', argv) [,1] [,2] [1,] 2 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printDeferredWarnings.testprintDeferredWarnings1# # .Internal(printDeferredWarnings()) ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault# #print('Work dir: ', c(1,2,3)) [1] "Work dir: " ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault1# #argv <- list(structure(c('-3.001e+155', '-1.067e+107', ' -1.976e+62', '-9.961e+152', ' -2.059e+23', ' 1.000e+00'), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.')), NULL, FALSE, NULL, NULL, TRUE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault10# #argv <- list(structure(c(245L, 250L, 255L, 260L, 265L, 270L, 275L, 280L, 285L, 290L, 295L, 300L, 305L, 310L, 315L, 320L, 325L, 330L, 335L, 340L, 345L, 350L, 355L, 360L), .Dim = 2:4, .Dimnames = list(NULL, c('a', 'b', 'c'), NULL)), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault11# #argv <- list(Inf, NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault12# #argv <- list(structure(c(' 79.53', ' 6.00', ' 86.20', ' 6.00', ' 69.77', ' 5.00', ' 98.03', ' 6.00', '108.03', ' 6.00', ' 89.20', ' 6.00', '114.20', ' 6.00', '116.70', ' 6.00', '110.37', ' 6.00', '124.37', ' 6.00', '126.37', ' 6.00', '118.03', ' 6.00'), .Dim = c(6L, 4L), .Dimnames = structure(list(V = c('Golden.rain', 'rep ', 'Marvellous ', 'rep ', 'Victory ', 'rep '), N = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt')), .Names = c('V', 'N'))), NULL, FALSE, NULL, NULL, FALSE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault13# #argv <- list('2014-03-17 13:47:59 EDT', NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault14# #argv <- list(structure(1:120, .Dim = 2:5, .Dimnames = list(NULL, c('a', 'b', 'c'), NULL, c('V5', 'V6', 'V7', 'V8', 'V9'))), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault15# #argv <- list(structure(c('1', '2', '1'), .Dim = 3L, .Dimnames = structure(list(c('1', '2', NA)), .Names = '')), NULL, FALSE, NULL, NULL, TRUE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault17# #argv <- list(NULL, NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault18# #argv <- list(quote(breaks ~ (wool + tension) - tension), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault19# #argv <- list(c('2007-11-06', '2007-11-06'), NULL, TRUE, NULL, NULL, FALSE, 99999L, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault2# #argv <- list(structure(c(' 1', 'NA', ' 1', '1.1', ' NA', '2.0', '1.1+0i', ' NA', '3.0+0i', 'NA', 'NA', 'NA', 'FALSE', ' NA', ' TRUE', 'abc', NA, 'def'), .Dim = c(3L, 6L), .Dimnames = list(c('1', '2', '3'), c('A', 'B', 'C', 'D', 'E', 'F'))), NULL, FALSE, NULL, NULL, TRUE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault20# #argv <- list(structure(c(NA, NA, 1L, 9L), .Names = c('size', 'current', 'direction', 'eval_depth')), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault21# #argv <- list(character(0), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault22# #argv <- list(structure('0.01587', .Names = '(Intercept)'), NULL, FALSE, NULL, 2, FALSE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault23# #argv <- list(quote(Y ~ X), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault24# #argv <- list(c(0.944550219923258, 0.336629745550454, 0.629688071087003, 0.591416056267917), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault25# #argv <- list(c('surname', 'nationality', 'deceased', 'title', 'other.author'), NULL, FALSE, NULL, NULL, FALSE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault26# #argv <- list(structure(c('-0.91', ' 0.81', '', '-0.97'), .Dim = c(2L, 2L), .Dimnames = list(c('x1', 'x3'), c('(Intercept)', 'x1'))), NULL, FALSE, NULL, NULL, FALSE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault27# #argv <- list(c(TRUE, TRUE, TRUE), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault28# #argv <- list(c(1L, 2L, 3L, 4L, 5L, 1L, 2L, 3L, 4L, 5L, 1L, 2L, 3L, 4L, 5L), NULL, FALSE, NULL, NULL, TRUE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault29# #argv <- list(structure(c('', ' 1', ' 1', ' 1', '', ' 9.93', ' 26.79', '820.91', ' 47.97', ' 57.90', ' 74.76', '868.88', '24.974', '25.420', '28.742', '60.629'), .Dim = c(4L, 4L), .Dimnames = list(c('', '- x4', '- x2', '- x1'), c('Df', 'Sum of Sq', 'RSS', 'AIC'))), NULL, FALSE, '', NULL, TRUE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault3# #argv <- list(structure(c('1', '2', '\\b', '4', '5', '\\040', '\\x20', 'c:\\spencer\\tests', '\\t', '\\n', '\\r'), .Dim = c(11L, 1L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11'), 'TEST')), NULL, FALSE, NULL, NULL, TRUE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault30# #argv <- list(structure(c(78.7365206866197, 17, 98.5088731171753, 18, 113.842206450509, 18, 123.008873117175, 18), .Dim = c(2L, 4L), .Dimnames = list(c('', 'rep'), c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt'))), 4L, TRUE, NULL, NULL, FALSE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault31# #argv <- list(structure(1:3, class = 'myClass'), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault32# #argv <- list(structure(c(495L, 515L, 535L, 555L, 575L, 595L, 615L, 635L, 655L, 675L, 695L, 715L), .Dim = 3:4, .Dimnames = list(c('a', 'b', 'c'), NULL)), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault4# #argv <- list(quote(~a + b:c + d + e + e:d), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault5# #argv <- list(structure(c(-1.05715, -0.48359, 0.0799, 0.44239, 1.2699), .Names = c('Min', '1Q', 'Median', '3Q', 'Max')), 4L, TRUE, NULL, NULL, FALSE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault6# #argv <- list(quote(y ~ A:U + A:V - 1), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault7# #argv <- list(structure(c(NA, NA, NA, 'a', NA, NA, 'b', 'd', NA, '10', '12', '14'), .Dim = 3:4), NULL, TRUE, '----', NULL, TRUE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault8# #argv <- list(c('Alb', 'Als', 'Arz', 'Ark', 'Clf', 'Clr', 'Cn', 'Dl', 'Fl', 'Gr', 'Hw', 'Id', 'Il', 'In', 'Iw', 'Kns', 'Knt', 'Ls', 'Man', 'Mr', 'Mssc', 'Mc', 'Mnn', 'Msss', 'Mssr', 'Mnt', 'Nb', 'Nv', 'NH', 'NJ', 'NM', 'NY', 'NC', 'ND', 'Oh', 'Ok', 'Or', 'Pn', 'RI', 'SC', 'SD', 'Tn', 'Tx', 'Ut', 'Vrm', 'Vrg', 'Wsh', 'WV', 'Wsc', 'Wy'), NULL, TRUE, NULL, NULL, FALSE, NULL, TRUE, TRUE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printdefault.testprintdefault9# #argv <- list(structure(c('abc', 'def\'gh'), .Dim = 1:2, .Dimnames = list('1', c('a', 'b'))), NULL, FALSE, NULL, NULL, TRUE, NULL, TRUE, FALSE); .Internal(print.default(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]], argv[[8]])) Error: 8 arguments passed to .Internal(print.default) which requires 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_printfunction.testprintfunction1#Ignored.OutputFormatting# #argv <- list(.Primitive('+'), TRUE); print.function(argv[[1]], argv[[2]]) function (e1, e2) .Primitive("+") ##com.oracle.truffle.r.test.builtins.TestBuiltin_printfunction.testprintfunction2#Ignored.OutputFormatting# #argv <- list(.Primitive('if'), TRUE); print.function(argv[[1]], argv[[2]]) .Primitive("if") ##com.oracle.truffle.r.test.builtins.TestBuiltin_printfunction.testprintfunction3#Ignored.ReferenceError# #argv <- list(.Primitive('c'), TRUE); print.function(argv[[1]], argv[[2]]) function (...) .Primitive("c") ##com.oracle.truffle.r.test.builtins.TestBuiltin_printfunction.testprintfunction4# #argv <- list(.Primitive('.Internal'), TRUE); print.function(argv[[1]], argv[[2]]) function (call) .Primitive(".Internal") ##com.oracle.truffle.r.test.builtins.TestBuiltin_printfunction.testprintfunction5#Ignored.OutputFormatting# #argv <- list(.Primitive('log'), TRUE); print.function(argv[[1]], argv[[2]]) function (x, base = exp(1)) .Primitive("log") ##com.oracle.truffle.r.test.builtins.TestBuiltin_prmatrix.testprmatrix1#Ignored.Unimplemented# #argv <- list(structure(c(1, 6, 9, 6, 4, 1, 1, 2, 1, 0.305397625390859, 0.00170825768891124, 8.51556634078892e-12, 0.64987756971621, 0.0197968749793939, 5.28672163823767e-10, 0.00471555351643001, 2.33367394341443e-13, 1.21630438148624e-64, 1, 1, 1), .Dim = c(3L, 7L), .Dimnames = list(NULL, c('time', 'n.risk', 'n.event', 'survival', 'std.err', 'lower 95% CI', 'upper 95% CI'))), c('', '', ''), c('time', 'n.risk', 'n.event', 'survival', 'std.err', 'lower 95% CI', 'upper 95% CI'), TRUE, FALSE, NULL); .Internal(prmatrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) time n.risk n.event survival std.err lower 95% CI upper 95% CI 1 6 1 3.053976e-01 6.498776e-01 4.715554e-03 1 6 4 2 1.708258e-03 1.979687e-02 2.333674e-13 1 9 1 1 8.515566e-12 5.286722e-10 1.216304e-64 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prmatrix.testprmatrix2#Ignored.Unimplemented# #argv <- list(structure(FALSE, .Dim = c(1L, 1L)), NULL, NULL, TRUE, FALSE, NULL); .Internal(prmatrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [,1] [1,] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_prmatrix.testprmatrix3#Ignored.Unimplemented# #argv <- list(structure(c(1, 2, 3, 4, 5, 8, 11, 12, 15, 17, 22, 23, 21, 19, 17, 16, 14, 12, 8, 6, 4, 3, 2, 1, 2, 2, 1, 2, 2, 4, 2, 2, 1, 1, 1, 1, 0.904761904761905, 0.80952380952381, 0.761904761904762, 0.666666666666667, 0.571428571428571, 0.380952380952381, 0.285714285714286, 0.19047619047619, 0.142857142857143, 0.0952380952380952, 0.0476190476190476, 0, 0.0640564484890047, 0.0856890867468988, 0.0929428640903365, 0.102868899974728, 0.107989849431208, 0.105971169574131, 0.0985807941917649, 0.0856890867468988, 0.0763603548321212, 0.0640564484890047, 0.0464714320451682, NaN, 0.670045882235034, 0.568905059924173, 0.519391415328429, 0.425350435565247, 0.337976953859493, 0.183066548820394, 0.116561326436765, 0.0594817013611753, 0.0356573551906667, 0.016259260212247, 0.00332446304253118, NA, 0.975294149038113, 0.923888828559295, 0.893257109782487, 0.82504400879734, 0.749240709943216, 0.577788677745831, 0.481819648009025, 0.37743489058515, 0.321161574680869, 0.261249981968687, 0.197044905698946, NA), .Dim = c(12L, 7L), .Dimnames = list(NULL, c('time', 'n.risk', 'n.event', 'survival', 'std.err', 'lower 95% CI', 'upper 95% CI'))), c('', '', '', '', '', '', '', '', '', '', '', ''), c('time', 'n.risk', 'n.event', 'survival', 'std.err', 'lower 95% CI', 'upper 95% CI'), TRUE, FALSE, NULL); .Internal(prmatrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) time n.risk n.event survival std.err lower 95% CI upper 95% CI 1 21 2 0.90476190 0.06405645 0.670045882 0.9752941 2 19 2 0.80952381 0.08568909 0.568905060 0.9238888 3 17 1 0.76190476 0.09294286 0.519391415 0.8932571 4 16 2 0.66666667 0.10286890 0.425350436 0.8250440 5 14 2 0.57142857 0.10798985 0.337976954 0.7492407 8 12 4 0.38095238 0.10597117 0.183066549 0.5777887 11 8 2 0.28571429 0.09858079 0.116561326 0.4818196 12 6 2 0.19047619 0.08568909 0.059481701 0.3774349 15 4 1 0.14285714 0.07636035 0.035657355 0.3211616 17 3 1 0.09523810 0.06405645 0.016259260 0.2612500 22 2 1 0.04761905 0.04647143 0.003324463 0.1970449 23 1 1 0.00000000 NaN NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prmatrix.testprmatrix4#Ignored.Unimplemented# #argv <- list(structure(c(952L, 3622L, 202L, 406L), .Dim = c(2L, 2L), .Dimnames = list(c('subcohort', 'cohort'), c('1', '2'))), c('subcohort', 'cohort'), c('1', '2'), FALSE, FALSE, NULL); .Internal(prmatrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) 1 2 subcohort 952 202 cohort 3622 406 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prmatrix.testprmatrix5#Ignored.Unimplemented# #argv <- list(structure(c(-1.89646294299258, 1.16675019914746, -8.10054918052941, -5.02922966334328, -0.332284173685658, -0.370285767776029, -0.422218802914528, 0.27824687717147, NA, 0.150098588668891, 3.21153879975245, 0.000303372486059531, 0.00654384959664698, 0.717283460804982, 0.690536969224971, 0.655590578569862, 1.32081223535046, NA, 1.38078223740269, 0.565646487676971, 0.698724423746393, 0.770086232143856, 0.0568682431416458, 0.116409970657657, 0.0584328435912827, 0.0510212342180821, 0, -1.37346997348395, 2.06268442316178, -11.5933390979754, -6.53073571948212, -5.84305326362929, -3.1808767383421, -7.22571035337252, 5.45355049590036, NA, 0.17, 0.039, 0, 6.5e-11, 5.1e-09, 0.0015, 5e-13, 4.9e-08, NA), .Dim = c(9L, 5L), .Dimnames = list(c('toccfarm', 'toccoperatives', 'toccprofessional', 'toccsales', 'tocccraftsmen:education', 'toccfarm:education', 'toccoperatives:education', 'toccprofessional:education', 'toccsales:education'), c('coef', 'exp(coef)', 'se(coef)', 'z', 'p'))), c('toccfarm', 'toccoperatives', 'toccprofessional', 'toccsales', 'tocccraftsmen:education', 'toccfarm:education', 'toccoperatives:education', 'toccprofessional:education', 'toccsales:education'), c('coef', 'exp(coef)', 'se(coef)', 'z', 'p'), TRUE, FALSE, NULL); .Internal(prmatrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) coef exp(coef) se(coef) z toccfarm -1.8964629 0.1500985887 1.38078224 -1.373470 toccoperatives 1.1667502 3.2115387998 0.56564649 2.062684 toccprofessional -8.1005492 0.0003033725 0.69872442 -11.593339 toccsales -5.0292297 0.0065438496 0.77008623 -6.530736 tocccraftsmen:education -0.3322842 0.7172834608 0.05686824 -5.843053 toccfarm:education -0.3702858 0.6905369692 0.11640997 -3.180877 toccoperatives:education -0.4222188 0.6555905786 0.05843284 -7.225710 toccprofessional:education 0.2782469 1.3208122354 0.05102123 5.453550 toccsales:education NA NA 0.00000000 NA p toccfarm 1.7e-01 toccoperatives 3.9e-02 toccprofessional 0.0e+00 toccsales 6.5e-11 tocccraftsmen:education 5.1e-09 toccfarm:education 1.5e-03 toccoperatives:education 5.0e-13 toccprofessional:education 4.9e-08 toccsales:education NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prmatrix.testprmatrix6#Ignored.Unimplemented# #argv <- list(structure(c('splines-package', 'as.polySpline', 'asVector', 'backSpline', 'bs', 'interpSpline', 'ns', 'periodicSpline', 'polySpline', 'predict.bs', 'predict.bSpline', 'predict.nbSpline', 'predict.npolySpline', 'predict.ns', 'predict.pbSpline', 'predict.ppolySpline', 'spline.des', 'splineDesign', 'splineKnots', 'splineOrder', 'splines', 'xyVector', 'splines-package', 'polySpline', 'asVector', 'backSpline', 'bs', 'interpSpline', 'ns', 'periodicSpline', 'polySpline', 'predict.bs', 'predict.bSpline', 'predict.bSpline', 'predict.bSpline', 'predict.bs', 'predict.bSpline', 'predict.bSpline', 'splineDesign', 'splineDesign', 'splineKnots', 'splineOrder', 'splines-package', 'xyVector'), .Dim = c(22L, 2L)), NULL, c('Column 1', 'Column 2', 'Column 3'), FALSE, TRUE, NULL); .Internal(prmatrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) Column 1 Column 2 [1,] splines-package splines-package [2,] as.polySpline polySpline [3,] asVector asVector [4,] backSpline backSpline [5,] bs bs [6,] interpSpline interpSpline [7,] ns ns [8,] periodicSpline periodicSpline [9,] polySpline polySpline [10,] predict.bs predict.bs [11,] predict.bSpline predict.bSpline [12,] predict.nbSpline predict.bSpline [13,] predict.npolySpline predict.bSpline [14,] predict.ns predict.bs [15,] predict.pbSpline predict.bSpline [16,] predict.ppolySpline predict.bSpline [17,] spline.des splineDesign [18,] splineDesign splineDesign [19,] splineKnots splineKnots [20,] splineOrder splineOrder [21,] splines splines-package [22,] xyVector xyVector ##com.oracle.truffle.r.test.builtins.TestBuiltin_prmatrix.testprmatrix7#Ignored.Unimplemented# #argv <- list(structure(c(' 0.228763', '-0.000666', '', '0.08909', '0.00426', '', '0.08899', '0.00426', '', '6.59', '0.02', '6.02', '1.00', '1.00', '3.06', '0.01', '0.88', '0.12'), .Dim = c(3L, 6L), .Dimnames = list(c('male', 'tt(agechf), linear', 'tt(agechf), nonlin'), c('coef', 'se(coef)', 'se2', 'Chisq', 'DF', 'p'))), c('male', 'tt(agechf), linear', 'tt(agechf), nonlin'), c('coef', 'se(coef)', 'se2', 'Chisq', 'DF', 'p'), FALSE, FALSE, NULL); .Internal(prmatrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) coef se(coef) se2 Chisq DF p male 0.228763 0.08909 0.08899 6.59 1.00 0.01 tt(agechf), linear -0.000666 0.00426 0.00426 0.02 1.00 0.88 tt(agechf), nonlin 6.02 3.06 0.12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prmatrix.testprmatrix8#Ignored.Unimplemented# #argv <- list(structure(c(' 0.00561', '-1.65487', '', '0.012', '0.483', '', '0.00872', '0.38527', '', ' 0.22', '11.74', '20.33', ' 1.0', ' 1.0', '13.9', '0.64000', '0.00061', '0.12000'), .Dim = c(3L, 6L), .Dimnames = list(c('age', 'sex', 'frailty(id, dist = \'t\', c'), c('coef', 'se(coef)', 'se2', 'Chisq', 'DF', 'p'))), c('age', 'sex', 'frailty(id, dist = \'t\', c'), c('coef', 'se(coef)', 'se2', 'Chisq', 'DF', 'p'), FALSE, FALSE, NULL); .Internal(prmatrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) coef se(coef) se2 Chisq DF p age 0.00561 0.012 0.00872 0.22 1.0 0.64000 sex -1.65487 0.483 0.38527 11.74 1.0 0.00061 frailty(id, dist = 't', c 20.33 13.9 0.12000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1,2,3,4) [1] 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1,2,3,4,na.rm=FALSE) [1] 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1,2,3,4,na.rm=TRUE) [1] 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1,FALSE) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1,FALSE,na.rm=FALSE) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1,FALSE,na.rm=TRUE) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1,na.rm=FALSE) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1,na.rm=TRUE) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1L,NA,5+3i) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1L,NA,5+3i,na.rm=FALSE) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(1L,NA,5+3i,na.rm=TRUE) [1] 5+3i ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(2,TRUE) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(2,TRUE,na.rm=FALSE) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(2,TRUE,na.rm=TRUE) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(4+0i,6,NA) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(4+0i,6,NA,na.rm=FALSE) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(4+0i,6,NA,na.rm=TRUE) [1] 24+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(4L) [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(4L,na.rm=FALSE) [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(4L,na.rm=TRUE) [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(FALSE) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(FALSE,na.rm=FALSE) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(FALSE,na.rm=TRUE) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(NA,c(1,2,3)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(NA,c(1,2,3),na.rm=FALSE) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(NA,c(1,2,3),na.rm=TRUE) [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(NA_integer_) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(NA_integer_,na.rm=FALSE) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(NA_integer_,na.rm=TRUE) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(TRUE) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(TRUE,na.rm=FALSE) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(TRUE,na.rm=TRUE) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(1,2,NA),NA) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(1,2,NA),NA,na.rm=FALSE) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(1,2,NA),NA,na.rm=TRUE) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(2,4)) [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(2,4),na.rm=FALSE) [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(2,4),na.rm=TRUE) [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(2,4,3)) [1] 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(2,4,3),na.rm=FALSE) [1] 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(2,4,3),na.rm=TRUE) [1] 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(2,4,NA)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(2,4,NA),na.rm=FALSE) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(2,4,NA),na.rm=TRUE) [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(NA,2L,4L)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(NA,2L,4L),na.rm=FALSE) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(c(NA,2L,4L),na.rm=TRUE) [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(complex(),numeric()) [1] 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(complex(),numeric(),na.rm=FALSE) [1] 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(complex(),numeric(),na.rm=TRUE) [1] 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(numeric()) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(numeric(),na.rm=FALSE) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(numeric(),na.rm=TRUE) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(numeric(),numeric()) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(numeric(),numeric(),na.rm=FALSE) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #prod(numeric(),numeric(),na.rm=TRUE) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testProd# #{ foo <- function(...) prod(...); foo(); } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod1# #argv <- list(9L);prod(argv[[1]]); [1] 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod10# #prod( ); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod11# #argv <- list(numeric(0));prod(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod2# #argv <- list(c(1000L, 1000L));prod(argv[[1]]); [1] 1e+06 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod3# #argv <- list(c(4, 2.5, 1.3, -1.20673076923077));prod(argv[[1]]); [1] -15.6875 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod4# #argv <- list(structure(c(4L, 4L, 2L), .Names = c('Hair', 'Eye', 'Sex')));prod(argv[[1]]); [1] 32 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod5# #argv <- list(integer(0));prod(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod6# #argv <- list(structure(c(2, 0, 1, 2), .Dim = c(2L, 2L), .Dimnames = list(c('A', 'B'), c('A', 'B'))));prod(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod7# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE), .Dim = c(2L, 2L), .Dimnames = list(c('A', 'B'), c('A', 'B'))));prod(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod8# #argv <- list(c(0.138260298853371, 0.000636169906925458));prod(argv[[1]]); [1] 8.795704e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_prod.testprod9# #argv <- list(NA_integer_);prod(argv[[1]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_proptable.testproptable1# #argv <- structure(list(x = structure(c(15L, 37L, 30L, 18L, 12L, 30L, 64L, 44L), .Dim = c(4L, 2L), .Dimnames = structure(list(Evaluation = c('very good', 'good', 'bad', 'very bad'), Location = c('city centre', 'suburbs')), .Names = c('Evaluation', 'Location'))), margin = 2), .Names = c('x', 'margin'));do.call('prop.table', argv) Location Evaluation city centre suburbs very good 0.15 0.0800000 good 0.37 0.2000000 bad 0.30 0.4266667 very bad 0.18 0.2933333 ##com.oracle.truffle.r.test.builtins.TestBuiltin_provideDimnames.testprovideDimnames1# #argv <- structure(list(x = structure(logical(0), .Dim = 0:1)), .Names = 'x');do.call('provideDimnames', argv) A ##com.oracle.truffle.r.test.builtins.TestBuiltin_provideDimnames.testprovideDimnames2# #argv <- structure(list(x = structure(integer(0), .Dim = 0L, .Dimnames = structure(list(NULL), .Names = ''), class = 'table')), .Names = 'x');do.call('provideDimnames', argv) < table of extent 0 > ##com.oracle.truffle.r.test.builtins.TestBuiltin_psigamma.testpsigamma1# #argv <- list(c(-100, -3, -2, -1, 0, 1, 2, -99.9, -7.7, -3, -2.9, -2.8, -2.7, -2.6, -2.5, -2.4, -2.3, -2.2, -2.1, -2, -1.9, -1.8, -1.7, -1.6, -1.5, -1.4, -1.3, -1.2, -1.1, -1, -0.9, -0.8, -0.7, -0.6, -0.5, -0.4, -0.3, -0.2, -0.0999999999999996, 0, 0.1, 0.2, 0.3, 0.4, 0.5, 0.6, 0.7, 0.8, 0.9, 1, 1.1, 1.2, 1.3, 1.4, 1.5, 1.6, 1.7, 1.8, 1.9, 2, 2.1, 2.2, 2.3, 2.4, 2.5, 2.6, 2.7, 2.8, 2.9, 3, 5.1, 77), 1); .Internal(psigamma(argv[[1]], argv[[2]])) [1] Inf Inf Inf Inf Inf [6] 1.64493407 0.64493407 103.34587903 14.95761284 Inf [11] 103.06378143 28.26607020 14.76937585 10.59168836 9.53924664 [16] 10.57002486 14.72591216 28.20053015 102.97574361 Inf [21] 102.94487536 28.13851918 14.63220163 10.44375937 9.37924664 [26] 10.39641375 14.53687624 27.99391858 102.74898624 Inf [31] 102.66786705 27.82987721 14.28618087 10.05313437 8.93480220 [36] 9.88620967 13.94516027 27.29947414 101.92253996 Inf [41] 101.43329915 26.26737721 12.24536455 7.27535659 4.93480220 [46] 3.63620967 2.83404916 2.29947414 1.92253996 1.64493407 [51] 1.43329915 1.26737721 1.13425343 1.02535659 0.93480220 [56] 0.85843189 0.79323283 0.73697414 0.68797206 0.64493407 [61] 0.60685287 0.57293276 0.54253746 0.51515251 0.49035776 [66] 0.46780689 0.44721207 0.42833216 0.41096375 0.39493407 [71] 0.21654883 0.01307171 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psigamma.testpsigamma2# #argv <- list(c(1e+30, 1e+45, 1e+60, 1e+75, 1e+90), 2); .Internal(psigamma(argv[[1]], argv[[2]])) [1] -1e-60 -1e-90 -1e-120 -1e-150 -1e-180 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psigamma.testpsigamma3# #argv <- list(c(1e+20, 1e+30, 1e+40, 1e+50, 1e+60), 5); .Internal(psigamma(argv[[1]], argv[[2]])) [1] 2.4e-99 2.4e-149 2.4e-199 2.4e-249 2.4e-299 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psigamma.testpsigamma4#Ignored.Unimplemented# #argv <- list(c(-100, -3, -2, -1, 0, 1, 2, -99.9, -7.7, -3, -2.9, -2.8, -2.7, -2.6, -2.5, -2.4, -2.3, -2.2, -2.1, -2, -1.9, -1.8, -1.7, -1.6, -1.5, -1.4, -1.3, -1.2, -1.1, -1, -0.9, -0.8, -0.7, -0.6, -0.5, -0.4, -0.3, -0.2, -0.0999999999999996, 0, 0.1, 0.2, 0.3, 0.4, 0.5, 0.6, 0.7, 0.8, 0.9, 1, 1.1, 1.2, 1.3, 1.4, 1.5, 1.6, 1.7, 1.8, 1.9, 2, 2.1, 2.2, 2.3, 2.4, 2.5, 2.6, 2.7, 2.8, 2.9, 3, 5.1, 77), 0); .Internal(psigamma(argv[[1]], argv[[2]])) [1] NaN NaN NaN NaN NaN [6] -0.57721566 0.42278434 -5.05966165 -0.17774844 NaN [11] -8.44150045 -3.12634148 -1.11534713 0.11489751 1.10315664 [16] 2.09033317 3.31732316 5.32287022 10.63035444 NaN [21] -8.78632804 -3.48348434 -1.48571750 -0.26971788 0.70315664 [26] 1.67366650 2.88254055 4.86832477 10.15416396 NaN [31] -9.31264383 -4.03903990 -2.07395279 -0.89471788 0.03648997 [36] 0.95938079 2.11330978 4.03499143 9.24507305 NaN [41] -10.42375494 -5.28903990 -3.50252422 -2.56138454 -1.96351003 [46] -1.54061921 -1.22002355 -0.96500857 -0.75492695 -0.57721566 [51] -0.42375494 -0.28903990 -0.16919089 -0.06138454 0.03648997 [56] 0.12604745 0.20854787 0.28499143 0.35618416 0.42278434 [61] 0.48533597 0.54429344 0.60003988 0.65290117 0.70315664 [66] 0.75104745 0.79678317 0.84054699 0.88249995 0.92278434 [71] 1.52800953 4.33729786 Warning message: NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testArgsCasts# #{ .Internal(psort(as.raw(c(0x44,0x40)), FALSE)) } Error: raw vectors cannot be sorted ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testArgsCasts# #{ .Internal(sort(NULL, FALSE)) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testArgsCasts# #{ lv<-list(a=5,b=c(1,2)); .Internal(sort(lv,FALSE)) } Error: only atomic vectors can be sorted ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort1# #argv <- list(7:8, 1:2); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] 7 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort10# #argv <- list(c(-1.05715266611575, -0.873306430909872, -0.548705796690786, -0.288240908441576, -0.0649703574297026, 0.224762433374997, 0.3255545927283, 0.4813346401898, 0.530823516045489, 1.2699009772491), c(1L, 3L, 4L, 5L, 6L, 7L, 8L, 10L)); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] -1.05715267 -0.54870580 -0.28824091 -0.06497036 0.22476243 0.32555459 [7] 0.48133464 1.26990098 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort11# #argv <- list(c(-1.05715266611575, -0.873306430909873, -0.548705796690787, -0.288240908441577, -0.0649703574297025, 0.224762433374994, 0.3255545927283, 0.481334640189799, 0.530823516045488, 1.2699009772491), c(1L, 3L, 4L, 5L, 6L, 7L, 8L, 10L)); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] -1.05715267 -0.54870580 -0.28824091 -0.06497036 0.22476243 0.32555459 [7] 0.48133464 1.26990098 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort12# #argv <- list(c(-Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -4.17369555651928e+302, -2.72671165723473e+289, -2.21240023126594e+276, -2.24780296109123e+263, -2.88514442494869e+250, -4.72336572671053e+237, -9.96611412047338e+224, -2.74100158340596e+212, -9.94902790498679e+199, -4.83110332887119e+187, -3.18582547396557e+175, -2.90089508183654e+163, -3.71562599613334e+151, -6.83535188151783e+139, -1.84898368353639e+128, -7.55412056676629e+116, -4.80716085942859e+105, -4.9383857330861e+94, -8.54170618068872e+83, -2.61556777274611e+73, -1.5069799345972e+63, -1.76183826972506e+53, -4.60125024792566e+43, -3.04622557026196e+34, -6.08456909882282e+25, -473300382255715392, -21650982809.6744, -12820.0784261145, -1.12778377684043), c(1L, 13L, 14L, 26L, 38L, 39L, 51L)); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] -Inf -Inf -Inf -2.247803e+263 -7.554121e+116 [6] -4.807161e+105 -1.127784e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort13# #argv <- list(c(0.5, 0.6, 1.2, 1.3, 1.6, 5.8, 6.2, 3.7, 5.1, 5, 4, 4, 5.3, 1.4, 6.6, 3.8, 2.6, 3.2, 2.9, 6.8, 10.6, 7.6, 9.3, 8, 10, 10, 8, 10.5, 10.5, 9.7, 9.7, 9.4, 8.9, 8.8, 8, 10.1, 8.5, 9.1, 7.5, 7.4, 7.5, 7.6, 8.4, 8.5, 10.8, 11.1, 12, 12, 18, 17.7, 16, 15, 14, 12.9, 12.7, 12.6, 17.9, 12.1, 17.7, 16.1, 13, 17.3, 17, 16.7, 13, 15.7, 19, 16, 17, 12, 12.2, 12.8, 14.6, 14.9, 17.6, 21, 20.5, 19.6, 20.2, 20.8, 21.1, 21.9, 20.5, 19.2, 22.5, 22, 23.2, 23, 22, 22, 23.4, 23.4, 23.5, 29, 26, 25, 28.5, 25.4, 29, 24.2, 23.9, 24.6, 25.7, 25.3, 28.6, 26.5, 29, 37.8, 30.9, 42, 31, 38.5, 41.4, 43.6, 46.7, 37.4, 45, 35.9, 36.1, 32, 44.4, 40.3, 30, 31, 32, 32.7, 36, 43.5, 33.1, 32.9, 36.3, 38.9, 30, 46.1, 45, 47.1, 47.7, 187, 147, 130, 49.2, 62, 141, 122, 105, 62, 64, 123, 112, 105, 63.6, 60, 49, 66, 87, 56.9, 60.7, 61.4, 156, 62, 64, 82, 88, 48.3, 109, 107, 85, 91, 148, 145, 53.1, 50, 92.2, 224, 293, 300, 211, 200, 197, 203, 359, 370), c(1L, 46L, 47L, 91L, 92L, 136L, 137L, 182L)); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] 0.5 11.1 12.0 23.4 23.4 47.1 47.7 370.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort14# #argv <- list(c(-1.36919169254062, -0.667819876370237, -0.253162069270378, -0.0834190388782434, -0.00786394222146348, 0.0246733498130512, 0.0730305465518564, 0.0881443844426084, 0.170711734013213, 0.552921941721332), c(1L, 3L, 4L, 5L, 6L, 7L, 8L, 10L)); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] -1.369191693 -0.253162069 -0.083419039 -0.007863942 0.024673350 [6] 0.073030547 0.088144384 0.552921942 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort2# #argv <- list(c(0.0499999999999972, 0.300000000000004, 1.1, 0.0500000000000007, 0, 0.25, 1, 2.15, 1.95, 2.09999999999999, 1.95, 2.04999999999999, 2.59999999999999, 2.59999999999999, 2.6, 4.25, 3.45, 2.65000000000001, 3.49999999999999, 3.75000000000001, 2.75, 3.05, 2.8, 4.45, 3.35, 7.7, 14.2), 14L); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] 2.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort3# #argv <- list(c(4.23272528138341e-16, 5.68989300120393e-16, 0.0499999999999982, 3.05311331771918e-16, 0.049999999999999, 0.0499999999999994, 3.05311331771918e-16, 0.0499999999999994, 0.100000000000001, 0.0999999999999994, 0.0999999999999994, 0.0500000000000006, 0.15, 0.15, 0.100000000000001, 0.0499999999999997, 0.150000000000001, 0.0999999999999995, 0.0999999999999993, 0.100000000000001, 0.0999999999999994, 0.100000000000001, 0.250000000000001, 0.250000000000001, 0.299999999999999, 0.199999999999999, 0.200000000000001, 0.3, 0.25, 0.199999999999999, 0.199999999999999, 0.150000000000001, 0.200000000000001, 0.199999999999998, 0.249999999999999, 0.199999999999999, 0.3, 0.350000000000001, 0.35, 0.300000000000001, 0.3, 0.350000000000002, 0.35, 0.35, 0.300000000000001, 0.350000000000001, 0.399999999999999, 0.4, 0.349999999999999, 0.350000000000001, 0.400000000000001, 0.300000000000001, 0.400000000000001, 0.449999999999999, 0.45, 0.450000000000001, 0.45, 0.450000000000001, 1.05, 0.7, 0.6, 1, 0.500000000000001, 0.5, 0.699999999999999, 1.05, 0.850000000000001, 0.650000000000001, 0.750000000000001, 0.75, 1, 0.699999999999999, 0.749999999999999, 1.05, 0.549999999999999, 0.500000000000001, 0.7, 0.8, 0.500000000000001, 0.650000000000001, 0.700000000000001, 0.599999999999999, 0.9, 0.75, 0.949999999999999, 0.899999999999999, 0.550000000000001, 1, 1.05, 1.05, 0.600000000000001, 0.6, 1.05, 0.749999999999999, 0.949999999999999, 1.1, 2.15, 1.45, 1.3, 2.1, 4.85, 3.7, 2.05, 1.2, 1.4, 1.3, 1.2, 1.85), 54:55); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] 0.45 0.45 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort4# #argv <- list(c(0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.0499999999999998, 0.05, 0.05, 0.05, 0.0499999999999999, 0.05, 0.0499999999999999, 0.05, 0.0499999999999999, 0.0499999999999999, 0.05, 0.0499999999999999, 0.0499999999999999, 0.05, 0.05, 0.0499999999999998, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.0499999999999999, 0.05, 0.05, 0.05, 0.0499999999999999, 0.0499999999999999, 0.0499999999999999, 0.05, 0.05, 0.0499999999999999, 0.05, 0.0499999999999999, 0.05, 0.05, 0.05, 0.0499999999999998, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.05, 0.0555556, 0.05555554, 0.05555556, 0.05555556, 0.05555554, 0.0555556, 0.0555555, 0.0555556, 0.0555555, 0.0555556, 0.0555555, 0.0555556, 0.0555556, 0.0555555, 0.0555555999999999, 0.0555555000000001, 0.0555555999999999, 0.0555555000000001, 0.0555555999999999, 0.0555555, 0.0555556, 0.0555559999999999, 0.055555, 0.0555559999999999, 0.0526315, 0.05263162, 0.05263158, 0.05263158, 0.05263162, 0.0526315, 0.0526316, 0.0526316, 0.0526316, 0.0526316, 0.0526315, 0.0526316, 0.0526316, 0.0526316, 0.0526316, 0.0526315000000001, 0.0526316, 0.0526315999999999, 0.0526316, 0.0526315000000001, 0.0526316, 0.0526316, 0.052632, 0.0526310000000001, 0.0526319999999998, 0.08333333, 0.08333333, 0.08333334, 0.08333333, 0.08333333, 0.08333337, 0.0833333, 0.0833333, 0.0833333, 0.0833333, 0.0833333, 0.0833333, 0.0833333000000001, 0.0833333000000001, 0.0833333999999999, 0.0833333000000001, 0.0833333000000001, 0.0833333999999999, 0.0833333000000001, 0.0833333000000001, 0.0833333999999999, 0.0833333000000001, 0.0833333000000001, 0.0833330000000001, 0.0833330000000001), 76:77); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] 0.05 0.05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort5# #argv <- list(c(-3.35281542033775, -3.57533122743112, -3.23282496934355, -3.3903449466851, -3.39757437954971, -3.36251831175626, -3.22932468384763, -3.22295685034786, -3.21402130636699, -3.11638102275539, -3.09226646401048, -3.21757818016328, -3.0862187014408, -3.08484132891786), 7:8); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] -3.229325 -3.222957 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort6# #argv <- list(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE), c(66L, 195L)); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort7# #argv <- list(c(1, 2, 2, 3, 3, 4, 4, 5), 1:8); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] 1 2 2 3 3 4 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort8# #argv <- list(27:28, 1:2); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] 27 28 ##com.oracle.truffle.r.test.builtins.TestBuiltin_psort.testpsort9# #argv <- list(c(-Inf, -Inf, Inf, Inf), 1:4); .Internal(psort(argv[[1]], argv[[2]]))[argv[[2]]] [1] -Inf -Inf Inf Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_pushBackLength.testpushBackLength1# #argv <- list(FALSE); .Internal(pushBackLength(argv[[1]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_putconst.testputconst1# #argv <- list(list(NULL), 0, NULL); .Internal(putconst(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_putconst.testputconst2# #argv <- list(list(list(), NULL), 1, list()); .Internal(putconst(argv[[1]], argv[[2]], argv[[3]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr#Ignored.ImplementationError# # { x <- qr(cbind(1:10,2:11), LAPACK=TRUE) ; round( qr.coef(x, 1:10), digits=5 ) } [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ m <- matrix(c(1,0,0,0,1,0,0,0,1),nrow=3) ; x <- qr(m, LAPACK=FALSE) ; qr.coef(x, 1:3) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ qr(10, LAPACK=TRUE) } $qr [,1] [1,] 10 $rank [1] 1 $qraux [1] 0 $pivot [1] 1 attr(,"useLAPACK") [1] TRUE attr(,"class") [1] "qr" ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ qr(matrix(1:6,nrow=2), LAPACK=FALSE)$pivot } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ qr(matrix(1:6,nrow=2), LAPACK=FALSE)$rank } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ round( qr(matrix(1:6,nrow=2), LAPACK=FALSE)$qraux, digits=5 ) } [1] 1.44721 0.89443 1.78885 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr#Ignored.ImplementationError# #{ round( qr(matrix(1:6,nrow=2), LAPACK=TRUE)$qr, digits=5) } [,1] [,2] [,3] [1,] -7.81025 -2.17663 -4.99344 [2,] 0.46837 0.51215 0.25607 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ round( qr(matrix(c(3,2,-3,-4),nrow=2), LAPACK=FALSE)$qr, digits=5 ) } [,1] [,2] [1,] -3.60555 4.71495 [2,] 0.55470 -1.66410 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ round( qr.solve(c(1,3,4,2), c(1,2,3,4)), digits=5) } [1] 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ round( qr.solve(qr(c(1,3,4,2)), c(1,2,3,4)), digits=5 ) } [1] 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ x <- qr(c(3,1,2), LAPACK=FALSE) ; round( qr.coef(x, c(1,3,2)), digits=5 ) } [1] 0.71429 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr#Ignored.ImplementationError# #{ x <- qr(c(3,1,2), LAPACK=TRUE) ; round( qr.coef(x, c(1,3,2)), digits=5 ) } [1] 0.71429 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ x <- qr(cbind(1:10,2:11), LAPACK=TRUE) ; qr.coef(x, 1:2) } Error in qr.coef(x, 1:2) : 'qr' and 'y' must have the same number of rows ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ x <- qr(cbind(1:3,2:4), LAPACK=FALSE) ; round( qr.coef(x, 1:3), digits=5 ) } [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr# #{ x <- qr(t(cbind(1:10,2:11)), LAPACK=FALSE) ; qr.coef(x, 1:2) } [1] 1 0 NA NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testQr#Ignored.ImplementationError# #{ x <- qr(t(cbind(1:10,2:11)), LAPACK=TRUE) ; qr.coef(x, 1:2) } [1] 1 NA NA NA NA NA NA NA NA 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testqr1# #argv <- list(structure(list(qr = structure(c(-2.99896066496855+0i, 0.0864255261791181+0i, -0.13772470327145+0i, -0.49098351645158+0i, 0.249389337649224+0i, 1.17331892183982+0i, -1.54960102684918+0i, -0.573648421141553+0i, 0.376760682628698+0i, 0.412090084647403+0i, 0.603959683330493+0i, -0.0216928335770876+0i, -1.2469936242596+0i, 0.224366164923213+0i, 0.341798188737913+0i, 1.04294423444024+0i, 0.270564951504877+0i, -0.315381666175534+0i, 0.787566751532822+0i, 0.229154517629245+0i, -2.25109940279642+0i, 0.530750192641659+0i, -0.0977755443891602+0i, 0.6614171819615+0i, -0.0856949989622426+0i), .Dim = c(5L, 5L), .Dimnames = list(c('1', '2', '3', '4', '5'), c('c', 'a', 'd', 'b', 'e'))), rank = 5L, qraux = c(1.50410169966891+0i, 1.21888836143069+0i, 1.71355205288103+0i, 1.90021623833265+0i, 0+0i), pivot = c(3L, 1L, 4L, 2L, 5L)), .Names = c('qr', 'rank', 'qraux', 'pivot'), class = 'qr'), structure(1:5, .Dim = c(5L, 1L))); .Internal(qr_coef_cmplx(argv[[1]], argv[[2]])) [,1] [1,] -7.390881+0i [2,] 3.795761+0i [3,] 6.397972+0i [4,] -7.034826+0i [5,] 9.866288+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_qr.testqr2#Ignored.Unimplemented# #argv <- list(structure(list(qr = structure(c(-2.79657712283236, 0.0791500442336917, 0.123755637403102, 0.089607462331441, 0.175462651449591, 0.0695565565709435, 0.129006956605315, 0.206583197284758, 0.0227114114395308, 0.235970456809858, 0.0914077988155571, 0.226297607634113, 0.0934594628258066, 0.0899795540097744, 0.12841549388179, 0.240520185730483, 0.233009950431413, 0.105133974880502, 0.2095512974465, 0.258964862210899, -2.07025325833148, -1.85301582498188, 0.139094572499947, 0.342556683478902, -0.102024562608463, 0.360699451256097, 0.315324737973941, 0.0873752715112826, 0.2823485467872, -0.239863332146733, -0.00369181667619238, -0.172536775168022, 0.229736826805589, 0.0852501914884386, 0.230310089401495, -0.0314168397035678, 0.0849707357385819, 0.365804687920591, -0.0536336269418447, 0.0845797169641211, -2.03746531175251, -0.489461063366758, -1.40644653583967, -0.00873041883181913, 0.0708276075409328, 0.153420226417602, -0.370069917481653, -0.112816417432651, 0.240125650075004, 0.138426195987046, 0.128552669396225, 0.217325815608225, -0.0223361051263949, -0.0526633296159945, -0.296094517820351, -0.327346352864029, -0.249917267465335, -0.0672115093838751, 0.0654426021596298, -0.240131194574062, -2.06587739268838, -0.339470951293598, -0.49608488205654, 1.14277258876071, 0.201196269542128, 0.0348254315928563, 0.145314253550005, 0.131380830586619, -0.387015716398766, 0.283849139598354, -0.0827284627849877, 0.132994279479374, -0.113393410148955, 0.0518736136418599, -0.422882666833989, -0.141635274746576, -0.181291088091223, 0.196913259592121, -0.0460107390352923, 0.15597817986415), .Dim = c(20L, 4L)), rank = 4L, qraux = c(1.32642615746455, 1.10105053486773, 1.21513331337829, 1.21397558590595), pivot = c(4L, 1L, 3L, 2L)), .Names = c('qr', 'rank', 'qraux', 'pivot'), useLAPACK = TRUE, class = 'qr'), structure(c(0.434659484773874, 0.712514678714797, 0.399994368897751, 0.325352151878178, 0.757087148027495, 0.202692255144939, 0.711121222469956, 0.121691921027377, 0.245488513959572, 0.14330437942408, 0.239629415096715, 0.0589343772735447, 0.642288258532062, 0.876269212691113, 0.778914677444845, 0.79730882588774, 0.455274453619495, 0.410084082046524, 0.810870242770761, 0.604933290276676, 0.654723928077146, 0.353197271935642, 0.270260145887733, 0.99268406117335, 0.633493264438584, 0.213208135217428, 0.129372348077595, 0.478118034312502, 0.924074469832703, 0.59876096714288, 0.976170694921166, 0.731792511884123, 0.356726912083104, 0.431473690550774, 0.148211560677737, 0.0130775754805654, 0.715566066093743, 0.103184235747904, 0.446284348610789, 0.640101045137271, 1.00298403897323, 0.272296643047594, 0.67556063386146, 0.151371688628569, 0.340151631063782, 0.431371175684035, 0.0309030100004748, 0.457057784032077, 0.880189609760418, 0.426803491590545, 0.543544612638652, 0.655281779309735, 0.526419038954191, 0.231530745956115, 0.877417415869422, 0.686553374305367, 0.847202921006829, 0.115471200458705, 0.751486539305188, 0.432544381567277, 0.682788078673184, 0.601541217649356, 0.238868677755818, 0.258165926672518, 0.729309623362496, 0.452570831403136, 0.175126768415794, 0.746698269620538, 0.104987640399486, 0.864544949028641, 0.614644971676171, 0.557159538846463, 0.328777319053188, 0.453131445450708, 0.500440972624347, 0.180866361130029, 0.529630602803081, 0.0752757457084954, 0.277755932649598, 0.212699519237503, 0.0904899418726564, 0.0829104807786643, 0.140637623313814, 0.186663761837408, 0.0510252129565924, 0.195122500695288, 0.189470667047426, 0.14745507678017, 0.160610442608595, 0.0259712139610201, 0.0604781195987016, 0.0592939835228026, 0.157146221613511, 0.0842694476991892, 0.187063216743991, 0.126278517944738, 0.175293296081945, 0.202698964001611, 0.104955473728478, 0.1719400214497, 0.293730155099183, 0.19126010988839, 0.886450943304226, 0.503339485730976, 0.877057543024421, 0.189193622441962, 0.758103052387014, 0.724498892668635, 0.943724818294868, 0.547646587016061, 0.711743867723271, 0.388905099825934, 0.100873126182705, 0.927302088588476, 0.283232500310987, 0.59057315881364, 0.110360604943708, 0.840507032116875, 0.317963684443384, 0.782851336989552, 0.267508207354695, 0.218645284883678, 0.516796836396679, 0.268950592027977, 0.181168327340856, 0.518576137488708, 0.562782935798168, 0.129156854469329, 0.256367604015395, 0.717935275984928, 0.961409936426207, 0.100140846567228, 0.763222689507529, 0.947966354666278, 0.818634688388556, 0.308292330708355, 0.649579460499808, 0.953355451114476, 0.953732650028542, 0.339979203417897), .Dim = c(20L, 7L)), TRUE); .Internal(qr_qy_real(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [,4] [,5] [1,] -1.972274623 -1.991283109 -2.2538538845 -1.879764918 -4.966857e-01 [2,] -0.765427899 -0.410025418 -0.3417741180 -0.023031667 -3.841820e-01 [3,] 0.165186669 -0.925126378 -0.5513155449 -0.552306628 -1.984340e-02 [4,] 0.223513621 0.159458143 1.1393612324 -0.034113563 4.571090e-02 [5,] 0.595321117 0.086541432 0.0309016823 0.309016823 -1.804112e-16 [6,] -0.372556531 -0.306325228 0.0061199629 0.061199629 -4.141652e-17 [7,] -0.014021837 -0.153978980 -0.0123364956 -0.123364956 -1.335737e-16 [8,] -0.442171673 -0.081966675 0.0237602260 0.237602260 -5.394990e-16 [9,] -0.330095164 0.677665560 -0.0202295843 -0.202295843 -1.040834e-17 [10,] 0.075762046 -0.119587119 0.0325714117 0.325714117 -3.330669e-16 [11,] 0.009419872 0.668871004 0.0322097613 0.322097613 -9.107298e-17 [12,] -0.136922035 0.001704311 -0.0029847712 -0.029847712 1.301043e-17 [13,] 0.053000982 0.046740118 -0.0007196474 -0.007196474 -5.793976e-16 [14,] 0.566080784 0.166387120 0.0212531496 0.212531496 -5.160802e-17 [15,] -0.133912463 0.089847950 0.0164164124 0.164164124 2.359224e-16 [16,] 0.100689243 -0.288503038 -0.0297330021 -0.297330021 -2.393918e-16 [17,] -0.376448411 0.324555303 -0.0013669838 -0.013669838 -3.538836e-16 [18,] -0.220514749 -0.405811850 -0.0305097427 -0.305097427 2.949030e-17 [19,] 0.365763248 -0.111229173 -0.0267391846 -0.267391846 -2.727853e-16 [20,] -0.098538225 0.033488678 -0.0374640700 -0.374640700 -1.838807e-16 [,6] [,7] [1,] -2.142447333 -1.98898232 [2,] -0.886710629 -0.98566331 [3,] -0.434139780 -0.22370507 [4,] -0.198056075 0.25751908 [5,] 0.438680393 -0.02416338 [6,] -0.443529094 -0.03844292 [7,] 0.469009743 0.14452029 [8,] 0.220306083 -0.31981673 [9,] 0.495972600 -0.36972255 [10,] 0.007787877 0.54049377 [11,] 0.392673869 0.67336229 [12,] -0.229359070 -0.23103034 [13,] -0.288864376 0.26264680 [14,] 0.670085352 0.70224194 [15,] 0.111203484 0.15888375 [16,] 0.352313551 -0.17432007 [17,] -0.274554252 0.01847873 [18,] 0.283849626 0.46853008 [19,] -0.195065684 0.49023013 [20,] 0.262976528 -0.17049944 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testArgsCasts#Output.IgnoreErrorMessage# #{ .Internal(qsort(as.raw(c(0x44,0x40)), FALSE)) } Error: argument is not a numeric vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testArgsCasts# #{ .Internal(sort(NULL, FALSE)) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testArgsCasts# #{ lv<-list(a=5,b=c(1,2)); .Internal(sort(lv,FALSE)) } Error: only atomic vectors can be sorted ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort1# #argv <- list(3L, FALSE); .Internal(qsort(argv[[1]], argv[[2]])) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort10# #argv <- list(c(1, 13, 26, 38, 51, 14, 39), FALSE); .Internal(qsort(argv[[1]], argv[[2]])) [1] 1 13 14 26 38 39 51 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort11# #argv <- list(c(-Inf, -Inf, -Inf, -Inf, -Inf, 0, 1, 2, 3, 4, Inf, Inf, Inf, Inf), FALSE); .Internal(qsort(argv[[1]], argv[[2]])) [1] -Inf -Inf -Inf -Inf -Inf 0 1 2 3 4 Inf Inf Inf Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort12#Ignored.ReferenceError# #argv <- list(FALSE, FALSE); .Internal(qsort(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort13# #argv <- list(c(63, 187, 64, 188), FALSE); .Internal(qsort(argv[[1]], argv[[2]])) [1] 63 64 187 188 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort2# #argv <- list(c(306, 455, 1010, 210, 883, 1022, 218, 166, 170, 567, 144, 613, 707, 88, 301, 624, 371, 394, 574, 118, 390, 12, 26, 533, 53, 814, 93, 460, 583, 303, 519, 643, 189, 246, 689, 65, 132, 223, 175, 163, 428, 230, 840, 11, 176, 791, 95, 196, 806, 284, 147, 655, 239, 30, 179, 310, 477, 364, 107, 177, 156, 429, 15, 181, 283, 13, 212, 524, 288, 363, 442, 54, 558, 207, 92, 60, 202, 353, 267, 387, 457, 337, 404, 222, 458, 31, 229, 444, 329, 291, 292, 142, 413, 320, 285, 197, 180, 300, 259, 110, 286, 270, 81, 131, 225, 269, 279, 135, 59, 105, 237, 221, 185, 183, 116, 188, 191, 174), FALSE); .Internal(qsort(argv[[1]], argv[[2]])) [1] 11 12 13 15 26 30 31 53 54 59 60 65 81 88 92 [16] 93 95 105 107 110 116 118 131 132 135 142 144 147 156 163 [31] 166 170 174 175 176 177 179 180 181 183 185 188 189 191 196 [46] 197 202 207 210 212 218 221 222 223 225 229 230 237 239 246 [61] 259 267 269 270 279 283 284 285 286 288 291 292 300 301 303 [76] 306 310 320 329 337 353 363 364 371 387 390 394 404 413 428 [91] 429 442 444 455 457 458 460 477 519 524 533 558 567 574 583 [106] 613 624 643 655 689 707 791 806 814 840 883 1010 1022 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort3# #argv <- list(numeric(0), FALSE); .Internal(qsort(argv[[1]], argv[[2]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort4#Ignored.ReferenceError# #argv <- list(c(1.64819754690779, 0.502718643389684, 0.845467412356198, 0.467247395729231, -0.402055063696625, 0.923526703253396, -0.0080556407117813, 1.03378423761425, -0.799126981726699, 1.00423302095334, -0.311973356192691, -0.88614958536232, -1.9222548962705, 1.61970074406333, 0.519269904664384, -0.055849931834021, 0.696417610118512), TRUE); .Internal(qsort(argv[[1]], argv[[2]])) $x [1] -1.922254896 -0.886149585 -0.799126982 -0.402055064 -0.311973356 [6] -0.055849932 -0.008055641 0.467247396 0.502718643 0.519269905 [11] 0.696417610 0.845467412 0.923526703 1.004233021 1.033784238 [16] 1.619700744 1.648197547 $ix [1] 13 12 9 5 11 16 7 4 2 15 17 3 6 10 8 14 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort5#Ignored.ReferenceError# #argv <- list(c(1L, 7L, 11L, 12L, 13L, 19L, 25L, 3L, 8L), TRUE); .Internal(qsort(argv[[1]], argv[[2]])) $x [1] 1 3 7 8 11 12 13 19 25 $ix [1] 1 8 2 9 3 4 5 6 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort6# #argv <- list(c(1, 2, 4, 6, 8, 3, 5, 7), FALSE); .Internal(qsort(argv[[1]], argv[[2]])) [1] 1 2 3 4 5 6 7 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort7# #argv <- list(c(1, 173, 346, 518, 691, 174, 519), FALSE); .Internal(qsort(argv[[1]], argv[[2]])) [1] 1 173 174 346 518 519 691 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort8# #argv <- list(c(1, 42, 83, 124, 166, 43, 84, 125), FALSE); .Internal(qsort(argv[[1]], argv[[2]])) [1] 1 42 43 83 84 124 125 166 ##com.oracle.truffle.r.test.builtins.TestBuiltin_qsort.testqsort9# #argv <- list(c(-Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 1, 2, 3, 4, 5, Inf, Inf, Inf, Inf, Inf), FALSE); .Internal(qsort(argv[[1]], argv[[2]])) [1] -Inf -Inf -Inf -Inf -Inf -Inf 0 1 2 3 4 5 Inf Inf Inf [16] Inf Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_quit.testQuitEmptyEnv# #{ quit("yes") } ##com.oracle.truffle.r.test.builtins.TestBuiltin_quit.testQuitErrorSave# #{ quit("xx") } Error in quit("xx") : unrecognized value of 'save' ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote#Ignored.ImplementationError# #quote() Error in quote() : 0 arguments passed to 'quote' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #quote(...) ... ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #quote(?'+') `?`("+") ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #quote(??show) `?`(`?`(show)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #quote(?`[[`) `?`(`[[`) ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #quote(?sum) `?`(sum) ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #quote(expr=) ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #quote(expr=...) ... ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #typeof(quote(a[,2])[[3]]) [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ class(quote(x + y)) } [1] "call" ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ is.call(quote(x + y)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote#Output.IgnoreErrorContext# #{ l <- quote(a[3] <- 4) ; eval(l) ; f() } Error in a[3] <- 4 : object 'a' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote#Output.IgnoreErrorContext# #{ l <- quote(a[3] <- 4) ; f <- function() { eval(l) } ; f() } Error in a[3] <- 4 : object 'a' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ l <- quote(x[1,1] <- 10) ; f <- function() { eval(l) } ; x <- matrix(1:4,nrow=2) ; f() ; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ l <- quote(x[1] <- 1) ; f <- function() { eval(l) ; x <<- 10 ; get("x") } ; x <- 20 ; f() } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ l <- quote(x[1] <- 1) ; f <- function() { eval(l) } ; x <- 10 ; f() ; x } [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ mode(quote(x + y)) } [1] "call" ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ quote(1:3) } 1:3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ quote(list(1, 2)) } list(1, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ quote(x <- x + 1) } x <- x + 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote#Ignored.ImplementationError# #{ res <- quote(a[,2])[[3]]; typeof(res) } Error in typeof(res) : argument "res" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ typeof(quote(1)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ typeof(quote(x + y)) } [1] "language" ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuote# #{ typeof(quote(x)) } [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuoteWithFields# #quote(foo$'bar')[[3]] [1] "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuoteWithFields# #quote(foo$bar)[[3]] bar ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuoteWithFields# #quote(foo@'bar')[[3]] [1] "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuoteWithFields# #quote(foo@bar <- 3)[[2]][[3]] bar ##com.oracle.truffle.r.test.builtins.TestBuiltin_quote.testQuoteWithFields# #quote(foo@bar)[[3]] bar ##com.oracle.truffle.r.test.builtins.TestBuiltin_radixsort.testradixsort1#Ignored.ImplementationError# #argv <- list(structure(1L, .Label = c('Ctl', 'Trt'), class = 'factor'), TRUE, FALSE); .Internal(radixsort(argv[[1]], argv[[2]], argv[[3]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_radixsort.testradixsort2#Ignored.ImplementationError# #argv <- list(structure(c(2L, 1L, 3L), .Label = c('1', '2', NA), class = 'factor'), TRUE, FALSE); .Internal(radixsort(argv[[1]], argv[[2]], argv[[3]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_radixsort.testradixsort3#Ignored.ImplementationError# #argv <- list(structure(c(3L, 7L, 1L, 5L, 10L, 8L, 2L, 6L, 4L, 9L), .Label = c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), class = 'factor'), TRUE, FALSE); .Internal(radixsort(argv[[1]], argv[[2]], argv[[3]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_radixsort.testradixsort5#Ignored.ImplementationError# #argv <- list(structure(c(64L, 67L, 92L, 71L, 74L, 69L, 78L, 94L, 95L, 80L, 119L, 114L, 97L, 72L, 75L, 96L, 99L, 54L, 101L, 93L, 58L, 138L, NA, 139L, 126L, 84L, 79L, 62L, 52L, 68L, 81L, 87L, 109L, 35L, 51L, 61L, 59L, 131L, 137L, 73L, 77L, 70L, 90L, 107L, 29L, 89L, 57L, 66L, 76L, 37L, 155L, 16L, 102L, 56L, 123L, 36L, 60L, 40L, 43L, 85L, 65L, 11L, 47L, 103L, 86L, 13L, 63L, 132L, 91L, 98L, 105L, 134L, 14L, 124L, 117L, 55L, 41L, 24L, 50L, 110L, 129L, 88L, 141L, 145L, 133L, 25L, 46L, 120L, 83L, 121L, 104L, 53L, 44L, 113L, 100L, 19L, 108L, 31L, 82L, 127L, 111L, 116L, 38L, 150L, 48L, 22L, 112L, 140L, 27L, 149L, 115L, 130L, 8L, 28L, 106L, 23L, 125L, 33L, 39L, 32L, 15L, 49L, 144L, 7L, 17L, 122L, 118L, 5L, 128L, 12L, 45L, 21L, 42L, 147L, 26L, 1L, 4L, 153L, 151L, 3L, 136L), .Label = c('(360,365]', '(365,370]', '(370,375]', '(375,380]', '(380,385]', '(385,390]', '(390,395]', '(395,400]', '(400,405]', '(405,410]', '(410,415]', '(415,420]', '(420,425]', '(425,430]', '(430,435]', '(435,440]', '(440,445]', '(445,450]', '(450,455]', '(455,460]', '(460,465]', '(465,470]', '(470,475]', '(475,480]', '(480,485]', '(485,490]', '(490,495]', '(495,500]', '(500,505]', '(505,510]', '(510,515]', '(515,520]', '(520,525]', '(525,530]', '(530,535]', '(535,540]', '(540,545]', '(545,550]', '(550,555]', '(555,560]', '(560,565]', '(565,570]', '(570,575]', '(575,580]', '(580,585]', '(585,590]', '(590,595]', '(595,600]', '(600,605]', '(605,610]', '(610,615]', '(615,620]', '(620,625]', '(625,630]', '(630,635]', '(635,640]', '(640,645]', '(645,650]', '(650,655]', '(655,660]', '(660,665]', '(665,670]', '(670,675]', '(675,680]', '(680,685]', '(685,690]', '(690,695]', '(695,700]', '(700,705]', '(705,710]', '(710,715]', '(715,720]', '(720,725]', '(725,730]', '(730,735]', '(735,740]', '(740,745]', '(745,750]', '(750,755]', '(755,760]', '(760,765]', '(765,770]', '(770,775]', '(775,780]', '(780,785]', '(785,790]', '(790,795]', '(795,800]', '(800,805]', '(805,810]', '(810,815]', '(815,820]', '(820,825]', '(825,830]', '(830,835]', '(835,840]', '(840,845]', '(845,850]', '(850,855]', '(855,860]', '(860,865]', '(865,870]', '(870,875]', '(875,880]', '(880,885]', '(885,890]', '(890,895]', '(895,900]', '(900,905]', '(905,910]', '(910,915]', '(915,920]', '(920,925]', '(925,930]', '(930,935]', '(935,940]', '(940,945]', '(945,950]', '(950,955]', '(955,960]', '(960,965]', '(965,970]', '(970,975]', '(975,980]', '(980,985]', '(985,990]', '(990,995]', '(995,1000]', '(1000,1005]', '(1005,1010]', '(1010,1015]', '(1015,1020]', '(1020,1025]', '(1025,1030]', '(1030,1035]', '(1035,1040]', '(1040,1045]', '(1045,1050]', '(1050,1055]', '(1055,1060]', '(1060,1065]', '(1065,1070]', '(1070,1075]', '(1075,1080]', '(1080,1085]', '(1085,1090]', '(1090,1095]', '(1095,1100]', '(1100,1105]', '(1105,1110]', '(1110,1115]', '(1115,1120]', '(1120,1125]', '(1125,1130]', '(1130,1135]'), class = 'factor'), TRUE, FALSE); .Internal(radixsort(argv[[1]], argv[[2]], argv[[3]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_radixsort.testradixsort6#Ignored.ImplementationError# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'), TRUE, FALSE); .Internal(radixsort(argv[[1]], argv[[2]], argv[[3]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithDoubles# #range(c(1.615, 3.19, -Inf, 3.44, Inf, 1.513)) [1] -Inf Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithDoubles# #range(c(1.615, 3.19, -Inf, 3.44, Inf, 1.513), finite=T) [1] 1.513 3.440 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithDoubles# #range(c(1.615, 3.19, -Inf, 3.44, Inf, 1.513), na.rm=T) [1] -Inf Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithDoubles# #range(c(1.615, 3.19, 2.62, 3.44, NA, NA, 1.513)) [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithDoubles# #range(c(1.615, 3.19, 2.62, 3.44, NA, NA, 1.513), finite=T) [1] 1.513 3.440 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithDoubles# #range(c(1.615, 3.19, 2.62, 3.44, NA, NA, 1.513), na.rm=T) [1] 1.513 3.440 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithDoubles# #range(c(1.615, 3.19, 2.62, 3.44, NaN, 1.513)) [1] NaN NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithDoubles# #range(c(1.615, 3.19, 2.62, 3.44, NaN, 1.513), finite=T) [1] 1.513 3.440 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithDoubles# #range(c(1.615, 3.19, 2.62, 3.44, NaN, 1.513), na.rm=T) [1] 1.513 3.440 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithIntegers# #range(c(2L, 3L, NA, NA, 1L)) [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithIntegers# #range(c(2L, 3L, NA, NA, 1L), finite=T) [1] 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithIntegers# #range(c(2L, 3L, NA, NA, 1L), na.rm=T) [1] 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithLogical# #range(c(T, F, NA, NA, T)) [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithLogical#Ignored.ReferenceError# #range(c(T, F, NA, NA, T), finite=T) [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testNaRmAndFiniteWithLogical# #range(c(T, F, NA, NA, T), na.rm=T) [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testRangeCharacter# #range(c('1', '2', '3')) [1] "1" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testRangeCharacter# #range(c('1', '2', '3'), finite=T) [1] "1" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testRangeCharacter# #range(c('1', '2', '3'), na.rm=T) [1] "1" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testRangeCharacter# #range(c('a', 'b', 'c')) [1] "a" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testRangeCharacter# #range(c('a', 'b', 'c'), finite=T) [1] "a" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testRangeCharacter# #range(c('a', 'b', 'c'), na.rm=T) [1] "a" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testRangeCornerCases# #range(list(1,2,3,'a'), 44, 'zz') [1] "1" "zz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testRangeCornerCases# #range(list(1,2,3,6)) [1] 1 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testRangeCornerCases# #range(list(1,2,3,6), 44, 1) [1] 1 44 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testSideEffect# #{ x <- c(1, 2, 3); foo <- function() { x[1] <<- 10; 2 }; range(x, foo(), 1, 2, 3, x, foo()) } [1] 1 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange1# #argv <- list(c(0.0303542455381287, 0.030376780241572, 0.030376780241572, 0.0317964665585001, 0.0332612222823148, 0.0332612222823148, 0.0332612222823148, 0.0332612222823148, 0.0332612222823148, 0.0332612222823148, 0.0332612222823148, 0.0334189652064179, 0.0352217414818821, 0.0354245538128718, 0.0354245538128718, 0.0376780241572021, 0.0376780241572021, 0.0376780241572021, 0.0376780241572021, 0.0406300703082748, 0.0406300703082748, 0.0406300703082748, 0.0440778799351001, 0.048021453037678, 0.0524607896160087, 0.0524607896160087, 0.0524607896160087, 0.0628267531999279, 0.0693167477915991, 0.0981611681990265, 0.134937804218497, 0.179646655850009, 0.437804218496485));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] 0.03035425 0.03037678 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange10# #argv <- list(structure(c(-3.5527136788005e-14, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, -6.21724893790088e-15, -1.77635683940025e-15, -8.88178419700125e-16, -1.33226762955019e-15, -1.22124532708767e-15, -8.88178419700125e-16, -1.33226762955019e-15, -1.22124532708767e-15, -1.33226762955019e-15, -1.11022302462516e-15, -8.88178419700125e-16, -1.33226762955019e-15, -8.88178419700125e-16, -8.88178419700125e-16, -4.44089209850063e-16, -4.44089209850063e-16, -1.22124532708767e-15, -1.22124532708767e-15, -8.88178419700125e-16, -1.33226762955019e-15, -8.88178419700125e-16, -4.44089209850063e-16, -6.66133814775094e-16, -7.7715611723761e-16, -4.44089209850063e-16, -8.88178419700125e-16, -8.88178419700125e-16, -8.88178419700125e-16, -8.88178419700125e-16, -1.33226762955019e-15, -1.33226762955019e-15, -1.33226762955019e-15, -8.88178419700125e-16, -1.11022302462516e-15, -4.44089209850063e-16, -8.88178419700125e-16, -8.88178419700125e-16, -8.88178419700125e-16, -8.88178419700125e-16, -8.88178419700125e-16, -1.33226762955019e-15, -1.33226762955019e-15, -8.88178419700125e-16, -4.44089209850063e-16, -1.22124532708767e-15, -8.88178419700125e-16, -8.88178419700125e-16, -8.88178419700125e-16, -1.33226762955019e-15, -1.22124532708767e-15, 5.91171556152403e-12, -1.59161572810262e-12, 4.54747350886464e-13, 1.02318153949454e-12, 1.13686837721616e-12, 4.54747350886464e-13, 9.09494701772928e-13, 9.09494701772928e-13, 1.02318153949454e-12, 9.09494701772928e-13, 0, 9.09494701772928e-13, 4.54747350886464e-13, 0, 0, 3.41060513164848e-13, 9.66338120633736e-13, 1.19371179607697e-12, 2.27373675443232e-13, 9.66338120633736e-13, 2.27373675443232e-13, 0, 4.54747350886464e-13, 9.66338120633736e-13, 0, 6.82121026329696e-13, 4.54747350886464e-13, 2.27373675443232e-13, 4.54747350886464e-13, 1.08002495835535e-12, 1.02318153949454e-12, 8.5265128291212e-13, 7.38964445190504e-13, 9.09494701772928e-13, 4.54747350886464e-13, 5.6843418860808e-13, 7.105427357601e-13, 3.41060513164848e-13, 0, 0, 9.66338120633736e-13, 1.02318153949454e-12, 0, 4.54747350886464e-13, 1.13686837721616e-12, 1.05160324892495e-12, 9.09494701772928e-13, 3.41060513164848e-13, 8.38440428196918e-13, 1.4210854715202e-12, 1.15463194561016e-14, -8.88178419700125e-16, -1.33226762955019e-15, -2.02615701994091e-15, 1.77635683940025e-15, 1.77635683940025e-15, 1.77635683940025e-15, 1.77635683940025e-15, 1.77635683940025e-15, 1.77635683940025e-15, 8.88178419700125e-16, 2.22044604925031e-15, 1.77635683940025e-15, 0, 1.33226762955019e-15, 8.88178419700125e-16, 2.22044604925031e-15, 2.22044604925031e-15, 1.77635683940025e-15, 1.77635683940025e-15, 8.88178419700125e-16, 4.44089209850063e-16, 0, 1.77635683940025e-15, 8.88178419700125e-16, 1.77635683940025e-15, 1.77635683940025e-15, 1.77635683940025e-15, 1.11022302462516e-15, 1.77635683940025e-15, 1.77635683940025e-15, 1.55431223447522e-15, 1.66533453693773e-15, 2.66453525910038e-15, 8.88178419700125e-16, 8.88178419700125e-16, 8.88178419700125e-16, 8.88178419700125e-16, 8.88178419700125e-16, 8.88178419700125e-16, 1.77635683940025e-15, 2.22044604925031e-15, 8.88178419700125e-16, 2.22044604925031e-15, 3.77475828372553e-15, 1.77635683940025e-15, 0, 1.33226762955019e-15, 0, 2.66453525910038e-15), .Dim = c(50L, 4L), .Dimnames = list(c('Australia', 'Austria', 'Belgium', 'Bolivia', 'Brazil', 'Canada', 'Chile', 'China', 'Colombia', 'Costa Rica', 'Denmark', 'Ecuador', 'Finland', 'France', 'Germany', 'Greece', 'Guatamala', 'Honduras', 'Iceland', 'India', 'Ireland', 'Italy', 'Japan', 'Korea', 'Luxembourg', 'Malta', 'Norway', 'Netherlands', 'New Zealand', 'Nicaragua', 'Panama', 'Paraguay', 'Peru', 'Philippines', 'Portugal', 'South Africa', 'South Rhodesia', 'Spain', 'Sweden', 'Switzerland', 'Turkey', 'Tunisia', 'United Kingdom', 'United States', 'Venezuela', 'Zambia', 'Jamaica', 'Uruguay', 'Libya', 'Malaysia'), c('pop15', 'pop75', 'dpi', 'ddpi'))));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] -3.552714e-14 0.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange11# #argv <- list(structure(c(4L, 5L, 1L, 5L, 3L, 4L, 5L, 3L, 2L, 4L), .Label = c('a', 'c', 'i', 's', 't'), class = c('ordered', 'factor')), structure(c(4L, 2L, 3L, 5L, 4L, 3L, 5L, 1L, 5L, 4L), .Label = c('a', 'c', 'i', 's', 't'), class = c('ordered', 'factor')));range(argv[[1]][[1]],argv[[1]][[2]],argv[[1]][[3]], na.rm = FALSE); [1] a t Levels: a < c < i < s < t ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange12# #argv <- list(structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96, 97, 98, 99, 100, 101), .Tsp = c(1, 101, 1), class = 'ts'));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange13# #argv <- list(c(NA, 1, 2, 3, -Inf, NaN, Inf));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange14# #argv <- list(c(14.43333, 65.7667), finite = TRUE);range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] 14.43333 65.76670 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange15# #argv <- list(structure(c(1, 13, 31), .Dim = 3L, .Dimnames = list(c('1st', '2nd', '3rd'))), finite = TRUE);range(argv[[1]][[1]],argv[[1]][[2]],argv[[1]][[3]], na.rm = FALSE); [1] 1 31 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange17# #argv <- list(structure(c(1012633320L, 1012633620L), class = c('POSIXct', 'POSIXt'), tzone = ''));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2002-02-02 07:02:00 GMT" "2002-02-02 07:07:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange2# #argv <- list(structure(c(52L, 52L), .Names = c('y', 'x')));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] 52 52 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange20# #argv <- list(c(2.00256647265648e-308, 2.22284878464869e-308, 2.22507363599982e-308, 2.2250738585072e-308, 2.22507408101459e-308, 2.22729893236571e-308, 2.44758124435792e-308));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] 2.002566e-308 2.222849e-308 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange21# #argv <- list(structure(c(12053, 12054, 12055, 12056, 12057, 12058, 12059, 12060, 12061, 12062), class = 'Date'));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2003-01-01" "2003-01-02" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange22# #argv <- list(structure(c(1L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 2L, 1L, 1L, 2L, 1L, 2L, 1L, 1L, 1L, 1L, 2L, 2L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 1L, 2L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 2L, 1L, 2L, 1L, NA, 1L, 1L, 2L, 1L, 1L, NA, 2L, 2L, 2L, 1L, 1L, 2L, 2L, 2L, 1L, 2L, 1L, NA, 2L, 2L, 1L, NA, 2L, 2L, NA, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 2L, 1L, 2L, 1L), .Dim = c(20L, 6L), .Dimnames = list(c('ant', 'bee', 'cat', 'cpl', 'chi', 'cow', 'duc', 'eag', 'ele', 'fly', 'fro', 'her', 'lio', 'liz', 'lob', 'man', 'rab', 'sal', 'spi', 'wha'), c('war', 'fly', 'ver', 'end', 'gro', 'hai'))));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange23# #argv <- list(structure(c(13823, NA), class = 'Date'));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2007-11-06" "2007-11-06" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange24#Output.IgnoreWarningContext# #range( ); [1] Inf -Inf Warning messages: 1: In min(x, na.rm = na.rm) : no non-missing arguments to min; returning Inf 2: In max(x, na.rm = na.rm) : no non-missing arguments to max; returning -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange25# #argv <- list(structure(c(1949, 1949.08333333333, 1949.16666666667, 1949.25, 1949.33333333333, 1949.41666666667, 1949.5, 1949.58333333333, 1949.66666666667, 1949.75, 1949.83333333333, 1949.91666666667, 1950, 1950.08333333333, 1950.16666666667, 1950.25, 1950.33333333333, 1950.41666666667, 1950.5, 1950.58333333333, 1950.66666666667, 1950.75, 1950.83333333333, 1950.91666666667, 1951, 1951.08333333333, 1951.16666666667, 1951.25, 1951.33333333333, 1951.41666666667, 1951.5, 1951.58333333333, 1951.66666666667, 1951.75, 1951.83333333333, 1951.91666666667, 1952, 1952.08333333333, 1952.16666666667, 1952.25, 1952.33333333333, 1952.41666666667, 1952.5, 1952.58333333333, 1952.66666666667, 1952.75, 1952.83333333333, 1952.91666666667, 1953, 1953.08333333333, 1953.16666666667, 1953.25, 1953.33333333333, 1953.41666666667, 1953.5, 1953.58333333333, 1953.66666666667, 1953.75, 1953.83333333333, 1953.91666666667, 1954, 1954.08333333333, 1954.16666666667, 1954.25, 1954.33333333333, 1954.41666666667, 1954.5, 1954.58333333333, 1954.66666666667, 1954.75, 1954.83333333333, 1954.91666666667, 1955, 1955.08333333333, 1955.16666666667, 1955.25, 1955.33333333333, 1955.41666666667, 1955.5, 1955.58333333333, 1955.66666666667, 1955.75, 1955.83333333333, 1955.91666666667, 1956, 1956.08333333333, 1956.16666666667, 1956.25, 1956.33333333333, 1956.41666666667, 1956.5, 1956.58333333333, 1956.66666666667, 1956.75, 1956.83333333333, 1956.91666666667, 1957, 1957.08333333333, 1957.16666666667, 1957.25, 1957.33333333333, 1957.41666666667, 1957.5, 1957.58333333333, 1957.66666666667, 1957.75, 1957.83333333333, 1957.91666666667, 1958, 1958.08333333333, 1958.16666666667, 1958.25, 1958.33333333333, 1958.41666666667, 1958.5, 1958.58333333333, 1958.66666666667, 1958.75, 1958.83333333333, 1958.91666666667, 1959, 1959.08333333333, 1959.16666666667, 1959.25, 1959.33333333333, 1959.41666666667, 1959.5, 1959.58333333333, 1959.66666666667, 1959.75, 1959.83333333333, 1959.91666666667, 1960, 1960.08333333333, 1960.16666666667, 1960.25, 1960.33333333333, 1960.41666666667, 1960.5, 1960.58333333333, 1960.66666666667, 1960.75, 1960.83333333333, 1960.91666666667, 1961, 1961.08333333333, 1961.16666666667, 1961.25, 1961.33333333333, 1961.41666666667, 1961.5, 1961.58333333333, 1961.66666666667, 1961.75, 1961.83333333333, 1961.91666666667, 1962, 1962.08333333333, 1962.16666666667, 1962.25, 1962.33333333333, 1962.41666666667, 1962.5, 1962.58333333333, 1962.66666666667, 1962.75, 1962.83333333333, 1962.91666666667), .Tsp = c(1949, 1962.91666666667, 12), class = 'ts'));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] 1949.000 1949.083 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange26# #argv <- list(c(1.47191076131574, 0.586694550701453, 0.258706725324317, 0.948371836939988, 0.396080061109718, 0.350912037541581), finite = TRUE);range(argv[[1]][[1]],argv[[1]][[2]],argv[[1]][[3]], na.rm = FALSE); [1] 0.2587067 1.4719108 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange27# #argv <- list(structure(c(-11.3814849918875, -11.9361690778798, 0.562602893455921, 11.5126028934559, 76.2209544348296, -8.66448499188751, -6.94502893455923, -5.28148499188751, -35.7665182531098, 6.35497106544077, -9.20908119253651, -0.898484991887508, -5.59380090589508, -6.12730922120065, -13.3061334505138, 58.6278831800973, -15.1098009058951, -8.29625696322337, -4.07211681990265, 3.7096551514332, 2.60151500811249, 6.24733923742563, -1.33911681990266, -2.14157287723094, -10.5984849918875, -8.12802893455923, 1.30028697944835, -15.7450289345592, 7.20569077879935, -12.6484849918875, 25.1810423201731, -4.42680090589508, -1.90886979448351), .Names = c('Craig Dunain', 'Ben Rha', 'Ben Lomond', 'Goatfell', 'Bens of Jura', 'Cairnpapple', 'Scolty', 'Traprain', 'Lairig Ghru', 'Dollar', 'Lomonds', 'Cairn Table', 'Eildon Two', 'Cairngorm', 'Seven Hills', 'Knock Hill', 'Black Hill', 'Creag Beag', 'Kildcon Hill', 'Meall Ant-Suidhe', 'Half Ben Nevis', 'Cow Hill', 'N Berwick Law', 'Creag Dubh', 'Burnswark', 'Largo Law', 'Criffel', 'Acmony', 'Ben Nevis', 'Knockfarrel', 'Two Breweries', 'Cockleroi', 'Moffat Chase')));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] -11.93617 -11.38148 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange28# #argv <- list(c(9.5367431640625e-07, 1.9073486328125e-06, 3.814697265625e-06, 7.62939453125e-06, 1.52587890625e-05, 3.0517578125e-05, 6.103515625e-05, 0.0001220703125, 0.000244140625, 0.00048828125, 0.0009765625, 0.001953125, 0.00390625, 0.0078125, 0.015625, 0.03125, 0.0625, 0.125, 0.25, 0.5, 1, 2, 4, 8, 16, 32, 64, 128, 256, 512, 1024));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] 9.536743e-07 1.907349e-06 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange29# #argv <- list(structure(c(1208822400, 1209168000, 1208822400, 1209168000), class = c('POSIXct', 'POSIXt'), tzone = 'GMT'));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] "2008-04-22 GMT" "2008-04-26 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange3# #argv <- list(c(-2.92498527625946, 2.46253591019012));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] -2.924985 2.462536 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange30# #argv <- list(c(1.86606598307361, 339033474310168, 6.15968019059533e+28, 1.11911250438065e+43, 2.03324321833028e+57, 3.69406826275609e+71, 6.71151400229846e+85, 1.21937162496937e+100, 2.2153975381282e+114, 4.02501267984465e+128, 7.31278553581751e+142, 1.32861276588395e+157, 2.41387071044804e+171, 4.38560576593759e+185, 7.96792382084694e+199, 1.44764060891943e+214, 2.63012470966353e+228, 4.77850368783602e+242, 8.6817546752692e+256, 1.57733192575377e+271));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] 1.866066e+00 3.390335e+14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange31# #argv <- list(structure(c(1, 0.666666666666667, 0.333333333333333, 0, -0.333333333333333, -0.666666666666667, -1, -1.33333333333333, -1.66666666666667, 1.5, 1, 0.5, 0, -0.5, -1, -1.5, -2, -2.5, 3, 2, 1, 0, -1, -2, -3, -4, -5, -Inf, -Inf, -Inf, NaN, Inf, Inf, Inf, Inf, Inf, -3, -2, -1, 0, 1, 2, 3, 4, 5, -1.5, -1, -0.5, 0, 0.5, 1, 1.5, 2, 2.5, -1, -0.666666666666667, -0.333333333333333, 0, 0.333333333333333, 0.666666666666667, 1, 1.33333333333333, 1.66666666666667, -0.75, -0.5, -0.25, 0, 0.25, 0.5, 0.75, 1, 1.25, -0.6, -0.4, -0.2, 0, 0.2, 0.4, 0.6, 0.8, 1), .Dim = c(9L, 9L)));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = TRUE); [1] 0.6666667 1.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange4# #argv <- list(c(1.4615016373309e+48, 5.70899077082384e+45, 2.23007451985306e+43, 8.71122859317602e+40, 3.40282366920938e+38, 1.32922799578492e+36, 5.19229685853483e+33, 2.02824096036517e+31, 7.92281625142643e+28, 3.09485009821345e+26, 1.20892581961463e+24, 4.72236648286965e+21, 18446744073709551616, 72057594037927936, 281474976710656, 1099511627776, 4294967296, 16777216, 65536, 256, 1, 0.00390625, 1.52587890625e-05, 5.96046447753906e-08, 2.3283064365387e-10, 9.09494701772928e-13, 3.5527136788005e-15, 1.38777878078145e-17, 5.42101086242752e-20, 2.11758236813575e-22, 8.27180612553028e-25));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] 5.708991e+45 1.461502e+48 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange5# #argv <- list(1:3, finite = TRUE);range(argv[[1]][[1]],argv[[1]][[2]],argv[[1]][[3]], na.rm = FALSE); [1] 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange6# #argv <- list(c(1L, 3L, 7L, 14L, 21L, 20L, 19L, 9L, 4L, 2L), 0);range(argv[[1]][[1]],argv[[1]][[2]],argv[[1]][[3]], na.rm = FALSE); [1] 1 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange7# #argv <- list(c(8.2, 9.7, 12.25, 16.5, 21.5, 14.5, 20, 23.45, 25.8, 27.3, 22.4, 24.5, 25.95, 27.3, 30.9), numeric(0), NULL);range(argv[[1]][[1]],argv[[1]][[2]],argv[[1]][[3]],argv[[1]][[4]], na.rm = FALSE); [1] 8.2 16.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange8# #argv <- list(structure(c(3L, 2L, 1L), .Label = c('A', 'B', 'C'), class = c('ordered', 'factor')));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] B C Levels: A < B < C ##com.oracle.truffle.r.test.builtins.TestBuiltin_range.testrange9# #argv <- list(structure(list(sec = c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), min = c(40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L, 50L, 0L, 10L, 20L, 30L, 40L), hour = c(8L, 8L, 9L, 9L, 9L, 9L, 9L, 9L, 10L, 10L, 10L, 10L, 10L, 10L, 11L, 11L, 11L, 11L, 11L, 11L, 12L, 12L, 12L, 12L, 12L, 12L, 13L, 13L, 13L, 13L, 13L, 13L, 14L, 14L, 14L, 14L, 14L, 14L, 15L, 15L, 15L, 15L, 15L, 15L, 16L, 16L, 16L, 16L, 16L, 16L, 17L, 17L, 17L, 17L, 17L, 17L, 18L, 18L, 18L, 18L, 18L, 18L, 19L, 19L, 19L, 19L, 19L, 19L, 20L, 20L, 20L, 20L, 20L, 20L, 21L, 21L, 21L, 21L, 21L, 21L, 22L, 22L, 22L, 22L, 22L, 23L, 23L, 23L, 23L, 23L, 23L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L), mday = c(12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 12L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 13L), mon = c(11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L), year = c(90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L, 90L), wday = c(3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L), yday = c(345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 345L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L, 346L), isdst = c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L)), .Names = c('sec', 'min', 'hour', 'mday', 'mon', 'year', 'wday', 'yday', 'isdst'), class = c('POSIXlt', 'POSIXt')));range(argv[[1]][[1]],argv[[1]][[2]], na.rm = FALSE); [1] "1990-12-12 08:40:00 GMT" "1990-12-12 08:50:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testArgsCasts# #.Internal(rank(as.raw(42), 42L, 'max')) Error: raw vectors cannot be sorted ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testArgsCasts# #.Internal(rank(c(1,2), -3L, 'max')) Error: invalid 'length(xx)' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testArgsCasts# #.Internal(rank(c(1,2), 2L, 'something')) Error: invalid ties.method for rank() [should never happen] ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testRank# #{ rank(c(10,100,100,1000)) } [1] 1.0 2.5 2.5 4.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testRank# #{ rank(c(1000, 100, 100, NA, 1, 20), ties.method="first") } [1] 5 3 4 6 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testRank# #{ rank(c(1000,100,100,100, 10)) } [1] 5 3 3 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testRank# #{ rank(c(a=1,b=1,c=3,d=NA,e=3), na.last=FALSE, ties.method="max") } a b c d e 3 3 5 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testRank# #{ rank(c(a=1,b=1,c=3,d=NA,e=3), na.last=NA, ties.method="min") } a b c e 1 1 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testRank# #{ rank(c(a=2,b=1,c=3,40)) } a b c 2 1 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testRank# #{ rank(c(a=2,b=1,c=3,d=NA,e=40), na.last="keep") } a b c d e 2 1 3 NA 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testRank# #{ rank(c(a=2,b=1,c=3,d=NA,e=40), na.last=FALSE) } a b c d e 3 2 4 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testRank# #{ rank(c(a=2,b=1,c=3,d=NA,e=40), na.last=NA) } a b c e 2 1 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testRank# #{ rank(c(a=2,b=1,c=3,d=NA,e=40), na.last=TRUE) } a b c d e 2 1 3 5 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank1# #argv <- list(c(1, 2, 3), 3L, 'average'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank10# #argv <- list(c(0.0244473121385049, 0.0208069652959635, 0.00198363254553387, -0.0529221973952693, 0.0164890605562422, -0.00149317802331189, -0.00414458668937225, -0.0391260369607497, -0.0127200995448093, 0.0111183888673723, 0.03614459302116, -0.00273443474452932, 0.0103131254237995, -0.00143136127438401, -0.0366335514444555, -0.0110399906877088, -0.0104891914308669, -0.00157789861665007, 0.0292636842429564, 0.0203025627349537, -0.0043767777488601, -0.00674011381520054, 0.0185411324740319, 0.0148087639526725, -0.0183227857094651, -0.018821306675337, 0.00969887758262181, 0.0204450782737623, -0.00298871658962484, 0.0234398759771181, 0.0105907055191967, -0.0162815763859567, 0.00907471699575067, -0.0300441479633801, 0.0381223507996197, 0.0526840550960561, -0.00976909588473167, -0.0277768375074461, 0.0151561006764977, -0.00359282193318711, 0.0638896025542924, -0.0010438914218908, 0.0183489539666666, 0.00074493402929487, -0.0197731007347187, 0.00502239164768132, -0.048016837368221, 0.0389877686476984, 0.00407695805281634, 0.057797414062711, 0.0126498543239424, -0.0188865172686347, 0.0162469917717659, -0.0248495524200794, -0.0333500780212535, 0.00775326717655591, -0.0117927765447241, 2.9405377320478e-05, 0.00197768259858777, -0.0156828699257579, -0.0151281440045609, -0.00359612097150966, 0.0313403370108415, -0.0405310449252812, 0.0158005934542395, 0.00885739072926609, 0.0282813640022565, -0.00809212452705879, 0.00984351260718323, 0.00710555853883393, -0.0144325170007544, 0.0321325880127445, 0.0308698841001781, 0.0186275986571656, 0.0422141110037264, 0.0148572667758066, -0.033960845128472, -0.0152504283054679, -0.0325780457387957, -0.0125937520151832, -0.0165034507562293, 0.00112039744236678, -0.0242330078671155, 0.00420399766652167, -0.0174137422806726, 0.047014676147193, 0.0190663795644171, 0.0242131244754732, 0.0102203815371289, 0.0447504856843389, -0.0169123288643312, -0.0122810127527625, 0.0381026258511537, -0.0173103031132602, -0.00551689511296685, -0.0104497655309428, -0.00851268571043338, -0.00742517743166594, 0.0131467615666842, -0.00471747595278646, -1.01191492422851, 2.68607765034082, -0.429158817093737, -0.359113060086774, -0.200381482427124, 1.42533261410281, -0.147128808252653, -0.0752683429340958, -1.36332095751131, -0.648540544492638, 0.12032088086903, -1.17778897251933, 1.06299238526514, -3.03678816357357, 0.613115721579531, -3.07289964707517, -0.601952253673221, -1.05655980889001, -1.304189561362, -0.113793555694785, -3.82871885136002, 2.35316662403712, -3.32994487242401, -0.927060802944771, -2.23184021008569, -1.5016380023869, 4.17433309125669, 0.0347912393865033, -2.57260106086865, -3.28121106883716, 0.900374202545311, -0.037119665429276, -0.636136749087689, -1.8587242949074, -2.97492062028297, -2.15038459323136, 2.00005760742783, -1.24253338959365, -2.76885369476898, 3.73858124484716, 0.850200754744896, -0.477294201826066, 2.11696609741804, 1.77284530274987, -1.23848609646229, 4.41220492908093, -0.51005406028203, -2.84898930042562, -0.288799203908439, 0.41507667846469, 4.61595679811872, 0.211604735787423, 0.913997610846827, -0.154305870713062, -0.668001684733089, -0.0694520566225524, 1.57527921126032, 4.15049001730457, 2.05478487752754, 2.41581679677341, -2.46264684311609, 1.96779114010676, 0.439849607321303, -2.93450005818449, 1.04204548529628, -0.317509209432032, 2.92917462393959, -1.53216399920933, -0.860423507857093, -1.85221899475487, -0.354207922873081, 0.804023558972676, -1.46349634623921, 1.66074633596335, -2.41616557260893, -2.09596882561548, 2.88231541368856, -2.0316949306093, 0.82394942463503, -0.762152102217839, 0.818803679301868, 3.37774657240809, 3.17317686688394, -0.661815601365533, -4.57047107058493, 4.99532317966833, 1.33413233353099, 1.0826546719274, -0.0267990462918174, 1.02021684590585, -0.328751663539334, 0.841389286509026, -0.800493487955288, -2.74041575509492, 1.97567653490976, 3.03949005099909, -0.617481138451227, -2.50657951121538, 1.28448261135565, -0.0894182737879582), 200L, 'average'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) [1] 143 140 112 57 133 105 99 60 84 125 150 103 123 106 62 88 89 104 [19] 145 138 98 95 135 128 74 73 120 139 102 141 124 79 119 66 152 157 [37] 91 67 130 101 159 107 134 109 71 115 58 153 113 158 126 72 132 69 [55] 64 117 87 108 111 80 82 100 147 59 131 118 144 93 121 116 83 148 [73] 146 136 154 129 63 81 65 85 78 110 70 114 75 156 137 142 122 155 [91] 77 86 151 76 96 90 92 94 127 97 31 189 44 45 50 178 52 55 [109] 25 38 160 29 174 6 164 5 41 30 26 53 2 187 3 32 16 23 [127] 197 149 12 4 170 61 39 20 7 17 184 27 10 195 169 43 186 181 [145] 28 198 42 9 49 162 199 161 171 51 36 56 179 196 185 188 14 182 [163] 163 8 173 48 191 22 33 21 46 165 24 180 15 18 190 19 167 35 [181] 166 194 193 37 1 200 177 175 68 172 47 168 34 11 183 192 40 13 [199] 176 54 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank11# #argv <- list(structure(c(4, 7, 6, 0, 0, 2, 4, 9, 3, 6, 0, 1, 5.5, 0.5, 4.5, 5.5, 0.5, 2.5, 0.5, 0.5, 2.5, 4.5, 9.5, 3.5, 1.5, 0.5, 5.5, 0.5, 1.5, 0.5, 0.5, 0.5, 1.5, 1.5, 0.5, 2.5, 2, 0, 7, 1, 1, 2, 0, 0, 0, 0, 3, 1, 0, 2, 0, 2, 0, 3, 2, 2, 0, 1, 3, 1, 4, 6, 0, 7, 0, 1, 2, 5, 11, 11, 9, 2), .Dim = 72L, .Dimnames = list(c('A', 'A', 'A', 'A', 'A', 'A', 'A', 'A', 'A', 'A', 'A', 'A', 'B', 'B', 'B', 'B', 'B', 'B', 'B', 'B', 'B', 'B', 'B', 'B', 'C', 'C', 'C', 'C', 'C', 'C', 'C', 'C', 'C', 'C', 'C', 'C', 'D', 'D', 'D', 'D', 'D', 'D', 'D', 'D', 'D', 'D', 'D', 'D', 'E', 'E', 'E', 'E', 'E', 'E', 'E', 'E', 'E', 'E', 'E', 'E', 'F', 'F', 'F', 'F', 'F', 'F', 'F', 'F', 'F', 'F', 'F', 'F'))), 72L, 'average'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) [1] 54.0 66.0 63.0 7.5 7.5 40.0 54.0 68.5 49.5 63.0 7.5 28.0 60.0 19.5 56.5 [16] 60.0 19.5 46.0 19.5 19.5 46.0 56.5 70.0 52.0 33.5 19.5 60.0 19.5 33.5 19.5 [31] 19.5 19.5 33.5 33.5 19.5 46.0 40.0 7.5 66.0 28.0 28.0 40.0 7.5 7.5 7.5 [46] 7.5 49.5 28.0 7.5 40.0 7.5 40.0 7.5 49.5 40.0 40.0 7.5 28.0 49.5 28.0 [61] 54.0 63.0 7.5 66.0 7.5 28.0 40.0 58.0 71.5 71.5 68.5 40.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank2# #argv <- list(list(), 0L, 'average'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank3# #argv <- list(c(FALSE, FALSE), 2L, 'average'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) [1] 1.5 1.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank4# #argv <- list(c(2, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60), 60L, 'average'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) [1] 1.5 1.5 3.0 4.0 5.0 6.0 7.0 8.0 9.0 10.0 11.0 12.0 13.0 14.0 15.0 [16] 16.0 17.0 18.0 19.0 20.0 21.0 22.0 23.0 24.0 25.0 26.0 27.0 28.0 29.0 30.0 [31] 31.0 32.0 33.0 34.0 35.0 36.0 37.0 38.0 39.0 40.0 41.0 42.0 43.0 44.0 45.0 [46] 46.0 47.0 48.0 49.0 50.0 51.0 52.0 53.0 54.0 55.0 56.0 57.0 58.0 59.0 60.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank5# #argv <- list(structure(c(9.96, 84.84, 93.4, 33.77, 5.16, 90.57, 92.85, 97.16, 97.67, 91.38, 98.61, 8.52, 2.27, 4.43, 2.82, 24.2, 3.3, 12.11, 2.15, 2.84, 5.23, 4.52, 15.14, 4.2, 5.23, 2.56, 7.72, 18.46, 6.1, 99.71, 99.68, 100, 98.96, 98.22, 99.06, 99.46, 96.83, 5.62, 13.79, 11.22, 16.92, 4.97, 8.65, 42.34, 50.43, 58.33), .Names = c('Courtelary', 'Delemont', 'Franches-Mnt', 'Moutier', 'Neuveville', 'Porrentruy', 'Broye', 'Glane', 'Gruyere', 'Sarine', 'Veveyse', 'Aigle', 'Aubonne', 'Avenches', 'Cossonay', 'Echallens', 'Grandson', 'Lausanne', 'La Vallee', 'Lavaux', 'Morges', 'Moudon', 'Nyone', 'Orbe', 'Payerne', 'Paysd\'enhaut', 'Rolle', 'Vevey', 'Yverdon', 'Conthey', 'Entremont', 'Herens', 'Martigwy', 'Monthey', 'St Maurice', 'Sierre', 'Sion', 'Boudry', 'La Chauxdfnd', 'Le Locle', 'Neuchatel', 'Val de Ruz', 'ValdeTravers', 'V. De Geneve', 'Rive Droite', 'Rive Gauche')), 46L, 'average'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) [1] 19.0 31.0 35.0 27.0 11.0 32.0 34.0 37.0 38.0 33.0 40.0 17.0 2.0 8.0 4.0 [16] 26.0 6.0 21.0 1.0 5.0 12.5 9.0 23.0 7.0 12.5 3.0 16.0 25.0 15.0 45.0 [31] 44.0 46.0 41.0 39.0 42.0 43.0 36.0 14.0 22.0 20.0 24.0 10.0 18.0 28.0 29.0 [46] 30.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank6# #argv <- list(structure(c(3, 1, 4, 1, 5, 9, 2, 6, 5, 3, 5), .Names = c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k')), 11L, 'max'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) [1] 5 2 6 2 9 11 3 10 9 5 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank7# #argv <- list(c('9', '9', '8', '7', '6', '5', '4', '3', '2', '1'), 10L, 'min'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) [1] 9 9 8 7 6 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank8# #argv <- list(c(2, 1, 3, 4, 5), 5L, 'average'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) [1] 2 1 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rank.testrank9# #argv <- list(structure(c('Tukey', 'Venables', 'Tierney', 'Ripley', 'Ripley', 'McNeil', 'R Core'), class = 'AsIs'), 7L, 'min'); .Internal(rank(argv[[1]], argv[[2]], argv[[3]])) [1] 6 7 5 3 3 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyExpression#Ignored.Unimplemented# #{rapply(expression('a+b'), function(x) { x })} [1] "a+b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #l2 = list(a = 1:10, b = 11:20,c=c('d','a','t','a')); rapply(l2, mean, how = "list", classes = "integer") $a [1] 5.5 $b [1] 15.5 $c NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #l2 = list(a = 1:10, b = 11:20,c=c('d','a','t','a')); rapply(l2, mean, how = "replace", classes = "integer") $a [1] 5.5 $b [1] 15.5 $c [1] "d" "a" "t" "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #l2 = list(a = 1:10, b = 11:20,c=c('d','a','t','a')); rapply(l2, mean, how = "unlist", classes = "integer") a b 5.5 15.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #rapply(NA, function(x) {2*x}) Error in rapply(NA, function(x) { : 'object' must be a list or expression ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #rapply(NULL, function(x) {2*x}) Error in rapply(NULL, function(x) { : 'object' must be a list or expression ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #rapply(list(NA), function(x) {2*x}) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #rapply(list(NULL), function(x) {2*x}) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #rapply(list(NULL), function(x) {2*x}, how="list") [[1]] list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #rapply(list(NULL), function(x) {2*x}, how="replace") [[1]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #x=list(1,2,3,4,"a"); rapply(x,function(x){x^2},classes="numeric") [1] 1 4 9 16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #x=list(1,list(2,3),4,list(5,list(6,7))); rapply(x,function(x){x^2},classes="numeric") [1] 1 4 9 16 25 36 49 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #x=list(1,list(2,3),4,list(5,list(6,7))); rapply(x,function(x){x^2},classes="numeric",how="unlist",deflt="p") [1] 1 4 9 16 25 36 49 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #x=list(1,list(2,3),4,list(5,list(6,7))); rapply(x,function(x,y){x^y},classes="numeric",how="unlist",deflt="p",y=3) [1] 1 8 27 64 125 216 343 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{X <- list(list(a = pi, b = list(c = 1:1)), d = "a test"); rapply(X, function(x) x, how = "replace")} [[1]] [[1]]$a [1] 3.141593 [[1]]$b [[1]]$b$c [1] 1 $d [1] "a test" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{X <- list(list(a = pi, b = list(c = 1:1)), d = "a test"); rapply(X, log, classes = "numeric", how = "replace", base = 2)} [[1]] [[1]]$a [1] 1.651496 [[1]]$b [[1]]$b$c [1] 1 $d [1] "a test" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{X <- list(list(a = pi, b = list(c = 1:1)), d = "a test"); rapply(X, nchar, classes = "character", deflt = as.integer(NA), how = "list")} [[1]] [[1]]$a [1] NA [[1]]$b [[1]]$b$c [1] NA $d [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{X <- list(list(a = pi, b = list(c = 1:1)), d = "a test"); rapply(X, nchar, classes = "character", deflt = as.integer(NA), how = "unlist")} a b.c d NA NA 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{X <- list(list(a = pi, b = list(c = 1:1)), d = "a test"); rapply(X, nchar, classes = "character", how = "unlist")} d 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{X <- list(list(a = pi, b = list(c = 1:1)), d = "a test"); rapply(X, sqrt, classes = "numeric", how = "replace")} [[1]] [[1]]$a [1] 1.772454 [[1]]$b [[1]]$b$c [1] 1 $d [1] "a test" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{rapply(c(c(1:3),4,5,list(6,7)), function(x) { 2*x }, how = "replace", deflt =)} [[1]] [1] 2 [[2]] [1] 4 [[3]] [1] 6 [[4]] [1] 8 [[5]] [1] 10 [[6]] [1] 12 [[7]] [1] 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{rapply(c(c(1:3),4,5,list(6,7)), function(x) { 2*x }, how = "replace", deflt =, classes=)} [[1]] [1] 2 [[2]] [1] 4 [[3]] [1] 6 [[4]] [1] 8 [[5]] [1] 10 [[6]] [1] 12 [[7]] [1] 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{rapply(c(c(1:3),4,5,list(6,7)), function(x) { 2*x }, how="unlist",deflt =, classes=)} [1] 2 4 6 8 10 12 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{rapply(c(list(1:3),4,5,c(6,7)), function(x) { 2*x }, how = "list", deflt = 0)} [[1]] [1] 2 4 6 [[2]] [1] 8 [[3]] [1] 10 [[4]] [1] 12 [[5]] [1] 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{rapply(list(1:3), function(x) { 2*x })} [1] 2 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{rapply(list(1:3), function(x) { 2*x }, how = "replace")} [[1]] [1] 2 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{rapply(list(list(1:3),4,5,6), function(x) { 2*x })} [1] 2 4 6 8 10 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{rapply(list(list(1:3),4,5,6), function(x) { 2*x }, how = "list")} [[1]] [[1]][[1]] [1] 2 4 6 [[2]] [1] 8 [[3]] [1] 10 [[4]] [1] 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rapply.testLapplyList# #{res <- rapply(list(1,2,3), function(x) function() x); res[[1]](); res[[2]](); res[[3]]()} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_raw.testraw1# #argv <- structure(list(length = 0), .Names = 'length');do.call('raw', argv) raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -1.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 10 3f 40 7f 3d ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -10L), .Names = c('x', 'n'));do.call('rawShift', argv) Error in rawShift(x = as.raw(c(0x00, 0x01, 0x20, 0x7f, 0x80, 0xff, 0x7b : argument 'shift' must be a small integer ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -1L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 10 3f 40 7f 3d ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -2.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 08 1f 20 3f 1e ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -2L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 08 1f 20 3f 1e ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -3.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 04 0f 10 1f 0f ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -3L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 04 0f 10 1f 0f ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -4.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 02 07 08 0f 07 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -4L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 02 07 08 0f 07 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -5.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 01 03 04 07 03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -5L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 01 03 04 07 03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -6.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 00 01 02 03 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -6L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 00 01 02 03 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -7.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 00 00 01 01 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -7L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 00 00 01 01 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -8.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -8L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = -9), .Names = c('x', 'n'));do.call('rawShift', argv) Error in rawShift(x = as.raw(c(0x00, 0x01, 0x20, 0x7f, 0x80, 0xff, 0x7b : argument 'shift' must be a small integer ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 0.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 01 20 7f 80 ff 7b ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 0L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 01 20 7f 80 ff 7b ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 1.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 02 40 fe 00 fe f6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 1L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 02 40 fe 00 fe f6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 2.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 04 80 fc 00 fc ec ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 2L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 04 80 fc 00 fc ec ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 3.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 08 00 f8 00 f8 d8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 3L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 08 00 f8 00 f8 d8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 4.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 10 00 f0 00 f0 b0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 4L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 10 00 f0 00 f0 b0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 5.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 20 00 e0 00 e0 60 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 5L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 20 00 e0 00 e0 60 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 6.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 40 00 c0 00 c0 c0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 6L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 40 00 c0 00 c0 c0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 7.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 80 00 80 00 80 80 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 7L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 80 00 80 00 80 80 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 8.1), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 8L), .Names = c('x', 'n'));do.call('rawShift', argv) [1] 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #argv <- structure(list(x = as.raw(c(0, 1, 32, 127, 128, 255, 123)), n = 9), .Names = c('x', 'n'));do.call('rawShift', argv) Error in rawShift(x = as.raw(c(0x00, 0x01, 0x20, 0x7f, 0x80, 0xff, 0x7b : argument 'shift' must be a small integer ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawShift.testrawShift1# #rawShift( as.raw(c(1,2,3))[1], 1) [1] 02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits('a') Error in rawToBits("a") : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(01) Error in rawToBits(1) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(0:255) Error in rawToBits(0:255) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(NA) Error in rawToBits(NA) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(NULL) Error in rawToBits(NULL) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(as.raw(0)) [1] 00 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(as.raw(0:255)) [1] 00 00 00 00 00 00 00 00 01 00 00 00 00 00 00 00 00 01 00 00 00 00 00 00 [25] 01 01 00 00 00 00 00 00 00 00 01 00 00 00 00 00 01 00 01 00 00 00 00 00 [49] 00 01 01 00 00 00 00 00 01 01 01 00 00 00 00 00 00 00 00 01 00 00 00 00 [73] 01 00 00 01 00 00 00 00 00 01 00 01 00 00 00 00 01 01 00 01 00 00 00 00 [97] 00 00 01 01 00 00 00 00 01 00 01 01 00 00 00 00 00 01 01 01 00 00 00 00 [121] 01 01 01 01 00 00 00 00 00 00 00 00 01 00 00 00 01 00 00 00 01 00 00 00 [145] 00 01 00 00 01 00 00 00 01 01 00 00 01 00 00 00 00 00 01 00 01 00 00 00 [169] 01 00 01 00 01 00 00 00 00 01 01 00 01 00 00 00 01 01 01 00 01 00 00 00 [193] 00 00 00 01 01 00 00 00 01 00 00 01 01 00 00 00 00 01 00 01 01 00 00 00 [217] 01 01 00 01 01 00 00 00 00 00 01 01 01 00 00 00 01 00 01 01 01 00 00 00 [241] 00 01 01 01 01 00 00 00 01 01 01 01 01 00 00 00 00 00 00 00 00 01 00 00 [265] 01 00 00 00 00 01 00 00 00 01 00 00 00 01 00 00 01 01 00 00 00 01 00 00 [289] 00 00 01 00 00 01 00 00 01 00 01 00 00 01 00 00 00 01 01 00 00 01 00 00 [313] 01 01 01 00 00 01 00 00 00 00 00 01 00 01 00 00 01 00 00 01 00 01 00 00 [337] 00 01 00 01 00 01 00 00 01 01 00 01 00 01 00 00 00 00 01 01 00 01 00 00 [361] 01 00 01 01 00 01 00 00 00 01 01 01 00 01 00 00 01 01 01 01 00 01 00 00 [385] 00 00 00 00 01 01 00 00 01 00 00 00 01 01 00 00 00 01 00 00 01 01 00 00 [409] 01 01 00 00 01 01 00 00 00 00 01 00 01 01 00 00 01 00 01 00 01 01 00 00 [433] 00 01 01 00 01 01 00 00 01 01 01 00 01 01 00 00 00 00 00 01 01 01 00 00 [457] 01 00 00 01 01 01 00 00 00 01 00 01 01 01 00 00 01 01 00 01 01 01 00 00 [481] 00 00 01 01 01 01 00 00 01 00 01 01 01 01 00 00 00 01 01 01 01 01 00 00 [505] 01 01 01 01 01 01 00 00 00 00 00 00 00 00 01 00 01 00 00 00 00 00 01 00 [529] 00 01 00 00 00 00 01 00 01 01 00 00 00 00 01 00 00 00 01 00 00 00 01 00 [553] 01 00 01 00 00 00 01 00 00 01 01 00 00 00 01 00 01 01 01 00 00 00 01 00 [577] 00 00 00 01 00 00 01 00 01 00 00 01 00 00 01 00 00 01 00 01 00 00 01 00 [601] 01 01 00 01 00 00 01 00 00 00 01 01 00 00 01 00 01 00 01 01 00 00 01 00 [625] 00 01 01 01 00 00 01 00 01 01 01 01 00 00 01 00 00 00 00 00 01 00 01 00 [649] 01 00 00 00 01 00 01 00 00 01 00 00 01 00 01 00 01 01 00 00 01 00 01 00 [673] 00 00 01 00 01 00 01 00 01 00 01 00 01 00 01 00 00 01 01 00 01 00 01 00 [697] 01 01 01 00 01 00 01 00 00 00 00 01 01 00 01 00 01 00 00 01 01 00 01 00 [721] 00 01 00 01 01 00 01 00 01 01 00 01 01 00 01 00 00 00 01 01 01 00 01 00 [745] 01 00 01 01 01 00 01 00 00 01 01 01 01 00 01 00 01 01 01 01 01 00 01 00 [769] 00 00 00 00 00 01 01 00 01 00 00 00 00 01 01 00 00 01 00 00 00 01 01 00 [793] 01 01 00 00 00 01 01 00 00 00 01 00 00 01 01 00 01 00 01 00 00 01 01 00 [817] 00 01 01 00 00 01 01 00 01 01 01 00 00 01 01 00 00 00 00 01 00 01 01 00 [841] 01 00 00 01 00 01 01 00 00 01 00 01 00 01 01 00 01 01 00 01 00 01 01 00 [865] 00 00 01 01 00 01 01 00 01 00 01 01 00 01 01 00 00 01 01 01 00 01 01 00 [889] 01 01 01 01 00 01 01 00 00 00 00 00 01 01 01 00 01 00 00 00 01 01 01 00 [913] 00 01 00 00 01 01 01 00 01 01 00 00 01 01 01 00 00 00 01 00 01 01 01 00 [937] 01 00 01 00 01 01 01 00 00 01 01 00 01 01 01 00 01 01 01 00 01 01 01 00 [961] 00 00 00 01 01 01 01 00 01 00 00 01 01 01 01 00 00 01 00 01 01 01 01 00 [985] 01 01 00 01 01 01 01 00 00 00 01 01 01 01 01 00 01 00 01 01 01 01 01 00 [1009] 00 01 01 01 01 01 01 00 01 01 01 01 01 01 01 00 00 00 00 00 00 00 00 01 [1033] 01 00 00 00 00 00 00 01 00 01 00 00 00 00 00 01 01 01 00 00 00 00 00 01 [1057] 00 00 01 00 00 00 00 01 01 00 01 00 00 00 00 01 00 01 01 00 00 00 00 01 [1081] 01 01 01 00 00 00 00 01 00 00 00 01 00 00 00 01 01 00 00 01 00 00 00 01 [1105] 00 01 00 01 00 00 00 01 01 01 00 01 00 00 00 01 00 00 01 01 00 00 00 01 [1129] 01 00 01 01 00 00 00 01 00 01 01 01 00 00 00 01 01 01 01 01 00 00 00 01 [1153] 00 00 00 00 01 00 00 01 01 00 00 00 01 00 00 01 00 01 00 00 01 00 00 01 [1177] 01 01 00 00 01 00 00 01 00 00 01 00 01 00 00 01 01 00 01 00 01 00 00 01 [1201] 00 01 01 00 01 00 00 01 01 01 01 00 01 00 00 01 00 00 00 01 01 00 00 01 [1225] 01 00 00 01 01 00 00 01 00 01 00 01 01 00 00 01 01 01 00 01 01 00 00 01 [1249] 00 00 01 01 01 00 00 01 01 00 01 01 01 00 00 01 00 01 01 01 01 00 00 01 [1273] 01 01 01 01 01 00 00 01 00 00 00 00 00 01 00 01 01 00 00 00 00 01 00 01 [1297] 00 01 00 00 00 01 00 01 01 01 00 00 00 01 00 01 00 00 01 00 00 01 00 01 [1321] 01 00 01 00 00 01 00 01 00 01 01 00 00 01 00 01 01 01 01 00 00 01 00 01 [1345] 00 00 00 01 00 01 00 01 01 00 00 01 00 01 00 01 00 01 00 01 00 01 00 01 [1369] 01 01 00 01 00 01 00 01 00 00 01 01 00 01 00 01 01 00 01 01 00 01 00 01 [1393] 00 01 01 01 00 01 00 01 01 01 01 01 00 01 00 01 00 00 00 00 01 01 00 01 [1417] 01 00 00 00 01 01 00 01 00 01 00 00 01 01 00 01 01 01 00 00 01 01 00 01 [1441] 00 00 01 00 01 01 00 01 01 00 01 00 01 01 00 01 00 01 01 00 01 01 00 01 [1465] 01 01 01 00 01 01 00 01 00 00 00 01 01 01 00 01 01 00 00 01 01 01 00 01 [1489] 00 01 00 01 01 01 00 01 01 01 00 01 01 01 00 01 00 00 01 01 01 01 00 01 [1513] 01 00 01 01 01 01 00 01 00 01 01 01 01 01 00 01 01 01 01 01 01 01 00 01 [1537] 00 00 00 00 00 00 01 01 01 00 00 00 00 00 01 01 00 01 00 00 00 00 01 01 [1561] 01 01 00 00 00 00 01 01 00 00 01 00 00 00 01 01 01 00 01 00 00 00 01 01 [1585] 00 01 01 00 00 00 01 01 01 01 01 00 00 00 01 01 00 00 00 01 00 00 01 01 [1609] 01 00 00 01 00 00 01 01 00 01 00 01 00 00 01 01 01 01 00 01 00 00 01 01 [1633] 00 00 01 01 00 00 01 01 01 00 01 01 00 00 01 01 00 01 01 01 00 00 01 01 [1657] 01 01 01 01 00 00 01 01 00 00 00 00 01 00 01 01 01 00 00 00 01 00 01 01 [1681] 00 01 00 00 01 00 01 01 01 01 00 00 01 00 01 01 00 00 01 00 01 00 01 01 [1705] 01 00 01 00 01 00 01 01 00 01 01 00 01 00 01 01 01 01 01 00 01 00 01 01 [1729] 00 00 00 01 01 00 01 01 01 00 00 01 01 00 01 01 00 01 00 01 01 00 01 01 [1753] 01 01 00 01 01 00 01 01 00 00 01 01 01 00 01 01 01 00 01 01 01 00 01 01 [1777] 00 01 01 01 01 00 01 01 01 01 01 01 01 00 01 01 00 00 00 00 00 01 01 01 [1801] 01 00 00 00 00 01 01 01 00 01 00 00 00 01 01 01 01 01 00 00 00 01 01 01 [1825] 00 00 01 00 00 01 01 01 01 00 01 00 00 01 01 01 00 01 01 00 00 01 01 01 [1849] 01 01 01 00 00 01 01 01 00 00 00 01 00 01 01 01 01 00 00 01 00 01 01 01 [1873] 00 01 00 01 00 01 01 01 01 01 00 01 00 01 01 01 00 00 01 01 00 01 01 01 [1897] 01 00 01 01 00 01 01 01 00 01 01 01 00 01 01 01 01 01 01 01 00 01 01 01 [1921] 00 00 00 00 01 01 01 01 01 00 00 00 01 01 01 01 00 01 00 00 01 01 01 01 [1945] 01 01 00 00 01 01 01 01 00 00 01 00 01 01 01 01 01 00 01 00 01 01 01 01 [1969] 00 01 01 00 01 01 01 01 01 01 01 00 01 01 01 01 00 00 00 01 01 01 01 01 [1993] 01 00 00 01 01 01 01 01 00 01 00 01 01 01 01 01 01 01 00 01 01 01 01 01 [2017] 00 00 01 01 01 01 01 01 01 00 01 01 01 01 01 01 00 01 01 01 01 01 01 01 [2041] 01 01 01 01 01 01 01 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(as.raw(1)) [1] 01 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(as.raw(1)[1]) [1] 01 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(as.raw(255)) [1] 01 01 01 01 01 01 01 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(as.raw(c(0,1,255))) [1] 00 00 00 00 00 00 00 00 01 00 00 00 00 00 00 00 01 01 01 01 01 01 01 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(as.raw(c(42))[1]) [1] 00 01 00 01 00 01 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(c(NULL)) Error in rawToBits(c(NULL)) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(c(as.raw(1), as.raw(255))) [1] 01 00 00 00 00 00 00 00 01 01 01 01 01 01 01 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(double(0)) Error in rawToBits(double(0)) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(environment) Error in rawToBits(environment) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(integer(0)) Error in rawToBits(integer(0)) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(list(NULL)) Error in rawToBits(list(NULL)) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(list(list())) Error in rawToBits(list(list())) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(new.env()) Error in rawToBits(new.env()) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(raw(0)) raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(raw(0), raw(1)) Error in rawToBits(raw(0), raw(1)) : unused argument (raw(1)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(raw(10)) [1] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [26] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [51] 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 [76] 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToBits.testRawToBits# #rawToBits(stdout()) Error in rawToBits(stdout()) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToChar.testrawToChar1# #argv <- structure(list(x = as.raw(c(115, 116, 114, 105, 110, 103))), .Names = 'x');do.call('rawToChar', argv) [1] "string" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rawToChar.testrawToChar1# #rawToChar(as.raw(c(42))[1]) [1] "*" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(1L)) } $dim [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(1L, 2L)) } $dim [1] 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(NULL, integer(0))) } $dim [1] 2 0 $dimnames $dimnames[[1]] NULL $dimnames[[2]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(c(1), integer(0))) } $dim [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(c(1L, 2L))) } $dim [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(integer(0))) } $dim [1] 1 0 $dimnames $dimnames[[1]] NULL $dimnames[[2]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(integer(0), integer(0))) } $dim [1] 2 0 $dimnames $dimnames[[1]] NULL $dimnames[[2]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(structure(1:4, dim=c(2,2)), 1L)) } $dim [1] 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(structure(1:4, dim=c(2,2), dimnames=list(c('y1', 'y2'), c('x1', 'x2'))), 1L)) } $dim [1] 3 2 $dimnames $dimnames[[1]] [1] "y1" "y2" "" $dimnames[[2]] [1] "x1" "x2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(structure(1:4, dim=c(2,2), dimnames=list(y=c('y1', 'y2'), x=c('x1', 'x2'))), 1L)) } $dim [1] 3 2 $dimnames $dimnames[[1]] [1] "y1" "y2" "" $dimnames[[2]] [1] "x1" "x2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ attributes(rbind(structure(1:4, dim=c(2,2), dimnames=list(y=c('y1', 'y2'), x=c('x1', 'x2'))), integer(0))) } $dim [1] 2 2 $dimnames $dimnames[[1]] [1] "y1" "y2" $dimnames[[2]] [1] "x1" "x2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ rbind(NULL, integer(0)) } [1,] [2,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ rbind(c(1), integer(0)) } [,1] [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ rbind(integer(0), integer(0)) } [1,] [2,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ rbind(structure(1:4, dim=c(2,2)), 1L) } [,1] [,2] [1,] 1 3 [2,] 2 4 [3,] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ rbind(structure(1:4, dim=c(2,2), dimnames=list(c('y1', 'y2'), c('x1', 'x2'))), 1L) } x1 x2 y1 1 3 y2 2 4 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ rbind(structure(1:4, dim=c(2,2), dimnames=list(y=c('y1', 'y2'), x=c('x1', 'x2'))), 1L) } x1 x2 y1 1 3 y2 2 4 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testDimnames# #{ rbind(structure(1:4, dim=c(2,2), dimnames=list(y=c('y1', 'y2'), x=c('x1', 'x2'))), integer(0)) } x1 x2 y1 1 3 y2 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch#Output.IgnoreErrorContext# #{ setClass('fooo', slots = c(a='numeric')); obj <- new('fooo'); rbind(obj) } Error in rbind2(..1) : no method for coercing this S4 class to a vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; assign('rbind.foo', function(x) {'foo'}, envir=.__S3MethodsTable__.); result <- rbind(v) ; rm('rbind.foo', envir=.__S3MethodsTable__.); result;} [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; rbind(v) } [,1] v 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch#Ignored.WrongCaller# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- function() 'foo'; rbind(v) } Error in rbind(deparse.level, ...) : unused argument (1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- function(...) 'foo'; rbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- function(...) 'foo'; v2 <- 1; class(v2) <- 'foo'; rbind(v2) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- function(deparse.level, ...) 'foo'; rbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- function(deparse.level, x) 'foo'; rbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- function(deparse.level, x1, x2) 'foo'; rbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- function(x) 'foo'; rbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- function(x0, deparse.level, x1, x2) 'foo'; rbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- function(x0, x1, x2) 'foo'; rbind(v) } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch#Ignored.ReferenceError# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- length; rbind(v) } *** caught segfault *** address 0x55cc00000081, cause 'memory not mapped' Traceback: 1: rbind(v) An irrecoverable exception occurred. R is aborting now ... ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch#Output.IgnoreErrorContext# #{ v <- 1; class(v) <- 'foo'; rbind.foo <- rawToBits; rbind(v) } Error in rbind(deparse.level, ...) : argument 'x' must be a raw vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- c('foo1', 'foo2'); rbind.foo1 <- function(...) 'foo1'; rbind(v) } [1] "foo1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- c('foo1', 'foo2'); rbind.foo1 <- function(...) 'foo1'; rbind.foo2 <- function(...) 'foo2'; rbind(v) } [1] "foo1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; class(v) <- c('foo1', 'foo2'); rbind.foo2 <- function(...) 'foo2'; rbind(v) } [1] "foo2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v <- 1; rbind.foo <- function(...) 'foo'; rbind(v) } [,1] v 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v1 <- 1; class(v1) <- 'foo1'; rbind.foo1 <- function(...) 'foo1'; v2 <- 2; class(v2) <- 'foo2'; rbind(v1, v2) } [1] "foo1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v1 <- 1; class(v1) <- 'foo1'; rbind.foo1 <- function(...) 'foo1'; v2 <- 2; class(v2) <- 'foo2'; rbind.foo2 <- function(...) 'foo2'; rbind(v1, v2) } [1] "foo1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testGenericDispatch# #{ v1 <- 1; class(v1) <- 'foo1'; v2 <- 2; class(v2) <- 'foo2'; rbind.foo2 <- function(...) 'foo2'; rbind(v1, v2) } [1] "foo2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #rbind(55, character(0)) [,1] [1,] "55" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #rbind(NULL) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #rbind(a=55, character(0)) [,1] a "55" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #rbind(character(0)) [1,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #rbind(character(0), 'f') [,1] [1,] "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind#Ignored.ImplementationError# #rbind(new.env()) Error in rbind(new.env()) : environments cannot be coerced to other types ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind#Ignored.ImplementationError# #rbind(rbind) Error in rbind(rbind) : cannot coerce type 'closure' to vector of type 'list' ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #v <- 1:3; attr(v, 'a') <- 'a'; attr(v, 'a1') <- 'a1'; rbind(v); rbind(v, v) [,1] [,2] [,3] v 1 2 3 [,1] [,2] [,3] v 1 2 3 v 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #v <- 1:3; v1<-1:3; attr(v, 'a') <- 'a'; attr(v1, 'a1') <- 'a1'; rbind(v, v1) [,1] [,2] [,3] v 1 2 3 v1 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #v <- 1; attr(v, 'a') <- 'a'; attr(v, 'a1') <- 'a1'; rbind(v); rbind(v, v) [,1] v 1 [,1] v 1 v 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #v <- 1; attr(v, 'a') <- 'a'; rbind(v); rbind(v, v) [,1] v 1 [,1] v 1 v 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ info <- c("print", "AES", "print.AES") ; ns <- integer(0) ; rbind(info, ns) } [,1] [,2] [,3] info "print" "AES" "print.AES" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ m <- matrix(1:6, ncol=2) ; rbind(11:12, m) } [,1] [,2] [1,] 11 12 [2,] 1 4 [3,] 2 5 [4,] 3 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ m <- matrix(1:6, ncol=2) ; rbind(m, 11:12) } [,1] [,2] [1,] 1 4 [2,] 2 5 [3,] 3 6 [4,] 11 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind#Output.IgnoreWarningContext# #{ m <- matrix(1:6, nrow=2) ; rbind(11:12, m) } [,1] [,2] [,3] [1,] 11 12 11 [2,] 1 3 5 [3,] 2 4 6 Warning message: In rbind(11:12, m) : number of columns of result is not a multiple of vector length (arg 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind() } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(1.1:3.3,1.1:3.3) } [,1] [,2] [,3] [1,] 1.1 2.1 3.1 [2,] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(1:3,1:3) } [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(1:3,2) } [,1] [,2] [,3] [1,] 1 2 3 [2,] 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(a=c(1,2), b=c(3,4)) } [,1] [,2] a 1 2 b 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(a=c(1,2), b=c(3,y=4)) } y a 1 2 b 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(a=c(1,2), b=c(x=3,y=4)) } x y a 1 2 b 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(a=c(1,x=2), b=c(3,4,5,6)) } [,1] [,2] [,3] [,4] a 1 2 1 2 b 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(a=c(1,x=2), b=c(y=3,4,5,6)) } y a 1 2 1 2 b 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(a=c(b=1,c=2)) } b c a 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(a=c(x=1,2), b=c(3,y=4)) } x a 1 2 b 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(a=c(x=1,y=2), b=c(3,4)) } x y a 1 2 b 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(c(1,2)) } [,1] [,2] [1,] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(c(1,c=2)) } c [1,] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(c(b=1,c=2)) } b c [1,] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(integer(0), NULL, matrix(integer(0),0,1)) } [,1] ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(integer(0), NULL, matrix(integer(0),1,0)) } [1,] [2,] [3,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(logical(0),matrix(character(0),0,0)) } [1,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(matrix(1:4, nrow=2), z=c(m=8,n=9)) } m n 1 3 2 4 z 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(matrix(1:4, nrow=2, dimnames=list(NULL, c('x', 'y'))), c(m=8,n=9)) } x y [1,] 1 3 [2,] 2 4 [3,] 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(matrix(1:4, nrow=2, dimnames=list(c('a', 'b'), NULL)), z=c(8,9)) } [,1] [,2] a 1 3 b 2 4 z 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(matrix(1:4, nrow=2, dimnames=list(c('a', 'b'), c('x', 'y')))) } x y a 1 3 b 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(matrix(1:4, nrow=2, dimnames=list(c('a', 'b'), c('x', 'y'))), c(8,9)) } x y a 1 3 b 2 4 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ rbind(matrix(1:4, nrow=2, dimnames=list(c('a', 'b'), c('x', 'y'))), z=c(8,9)) } x y a 1 3 b 2 4 z 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ v<-c(b=1, c=2); rbind(v) } b c v 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ x<-data.frame(c(1,2),c(3,4)); dimnames(x) <- list(c("A", "B"), c("C", "D")); rbind(x) } C D A 1 3 B 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRbind# #{ x<-list(a=7, b=NULL, c=42); y<-as.data.frame(do.call(rbind,x)); y } V1 a 7 c 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(NULL)) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(NULL, NULL, double(0))) structure(numeric(0), .Dim = c(3L, 0L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(NULL, NULL, double(0), character(0))) structure(character(0), .Dim = c(4L, 0L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(NULL, NULL, double(0), integer(0))) structure(numeric(0), .Dim = c(4L, 0L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(NULL, NULL, double(0), integer(0), character(0))) structure(character(0), .Dim = c(5L, 0L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(NULL, NULL, integer(0))) structure(integer(0), .Dim = c(3L, 0L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(NULL, NULL, integer(0), double(0))) structure(numeric(0), .Dim = c(4L, 0L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(NULL, integer(0))) structure(integer(0), .Dim = c(2L, 0L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(c(NULL, NULL), integer(0))) structure(integer(0), .Dim = c(2L, 0L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(integer(0))) structure(integer(0), .Dim = 1:0, .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testRetType# #dput(rbind(integer(0), NULL, NULL)) structure(integer(0), .Dim = c(3L, 0L), .Dimnames = list(NULL, NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testrbind1# #argv <- list(structure(c(3, 3, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 9, 9, 11, 11, 13, 13, 13, 13, 13, 13, 13, 14, 14, 14, 14, 16, 16, 31, 31, 31, 33, 33, 43, 43, 43, 61, 61, 61, 62, 62, 106, 106, 110, 110, 110, 110, 163, 163, 165, 165, 165, 168, 168, 172, 172, 172, 204, 204, 206, 206, 206, 206, 206, 211, 211, 241, 241, 241, 241, 244, 244, 249, 249, 250, 250, 250, 250, 252, 252, 252, 252, 252, 252, 252, 252, 252, 252, 252, 252, 256, 256, 265, 265, 265, 265, 265, 265, 265, 265, 265, 267, 267, 267, 269, 269, 269, 291, 291, 291, 291, 291, 291, 291, 312, 312, 312, 312, 312, 314, 314, 314, 314, 314, 2.484906649788, 6.27476202124194, 3.97029191355212, 3.98898404656427, 4.52178857704904, 0, 2.30258509299405, 4.59511985013459, 1.6094379124341, 2.94443897916644, 1.94591014905531, 2.99573227355399, 4.36944785246702, 1.38629436111989, 2.39789527279837, 3.98898404656427, 2.07944154167984, 5.64897423816121, 5.75574221358691, 2.89037175789616, 3.09104245335832, 4.70953020131233, 4.98360662170834, 1.6094379124341, 1.6094379124341, 4.70048036579242, 1.6094379124341, 4.54329478227, 1.6094379124341, 4.49980967033027, 5.62762111369064, 5.11799381241676, 2.39789527279837, 6.28785856016178, 5.4380793089232, 3.63758615972639, 5.76205138278018, 2.83321334405622, 5.7037824746562, 5.90263333340137, 3.40119738166216, 3.63758615972639, 4.31748811353631, 5.58724865840025, 5.32787616878958, 4.06044301054642, 6.22059017009974, 6.20455776256869, 5.2040066870768, 6.20253551718792, 3.78418963391826, 2.94443897916644, 2.63905732961526, 6.24804287450843, 2.63905732961526, 5.74620319054015, 1.79175946922805, 5.44241771052179, 4.99721227376411, 5.93753620508243, 4.02535169073515, 4.74493212836325, 5.90536184805457, 6.00388706710654, 4.91998092582813, 5.73979291217923, 3.13549421592915, 3.17805383034795, 3.58351893845611, 4.89783979995091, 4.49980967033027, 6.0913098820777, 5.75257263882563, 2.30258509299405, 2.77258872223978, 5.28826703069454, 6.10924758276437, 4.74493212836325, 6.16331480403464, 4.57471097850338, 3.55534806148941, 1.38629436111989, 4.46590811865458, 5.93224518744801, 0.693147180559945, 3.95124371858143, 4.0943445622221, 3.17805383034795, 2.484906649788, 5.15905529921453, 3.80666248977032, 2.484906649788, 3.3322045101752, 1.94591014905531, 2.77258872223978, 4.71849887129509, 6.23244801655052, 2.99573227355399, 3.71357206670431, 3.36729582998647, 5.64897423816121, 3.55534806148941, 0.693147180559945, 3.04452243772342, 4.30406509320417, 2.56494935746154, 3.61091791264422, 4.69134788222914, 5.93753620508243, 4.95582705760126, -0.693147180559945, 3.87120101090789, 6.31896811374643, 6.06145691892802, 1.79175946922805, 2.19722457733622, 2.07944154167984, 2.07944154167984, 1.94591014905531, 4.51085950651685, 5.85507192220243, 4.57471097850338, 0.693147180559945, 1.6094379124341, 4.36944785246702, 5.36129216570943, 4.40671924726425, 4.85981240436167, 3.61091791264422, 3.73766961828337, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0, 1, 0, 1, 1, 0, 1, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 1, 0, 0, 0, 0, 0, 0, 1, 0, 1, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 1, 1, 0, 0, 0, 1, 1, 1, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 1, 0, 1, 0, 0, 0, 1, 1, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 1, 0, 1, 0, 0, 1, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0, 1, 0, 1, 0, 0, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 0, 0, 0, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 1, 0, 1, 1, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 0, 1, 1, 1, 1, 1, 0, 0, 1, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 0, 0, 1, 1), .Dim = c(130L, 10L)), structure(c(316, 316, 316, 5.3890717298165, 2.39789527279837, 5.67332326717149, 1, 1, 0, 1, 1, 1, 0, 1, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0), .Dim = c(3L, 10L)));do.call('rbind', argv) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] 3 2.4849066 1 0 0 0 0 0 0 0 [2,] 3 6.2747620 0 0 1 1 0 0 0 0 [3,] 8 3.9702919 1 0 0 0 0 0 0 0 [4,] 8 3.9889840 1 0 1 0 1 0 0 0 [5,] 8 4.5217886 1 0 1 0 1 0 0 0 [6,] 8 0.0000000 1 0 1 0 1 0 1 0 [7,] 8 2.3025851 1 0 1 0 0 0 1 0 [8,] 8 4.5951199 1 0 1 0 0 0 1 0 [9,] 8 1.6094379 1 0 1 0 1 0 1 0 [10,] 8 2.9444390 1 0 1 0 0 0 1 0 [11,] 8 1.9459101 1 0 1 0 0 0 1 0 [12,] 8 2.9957323 1 0 1 0 0 0 1 0 [13,] 8 4.3694479 1 0 1 0 0 0 0 1 [14,] 8 1.3862944 1 0 1 0 1 0 0 1 [15,] 8 2.3978953 1 0 1 1 0 0 0 1 [16,] 8 3.9889840 1 0 1 0 0 0 0 1 [17,] 8 2.0794415 1 0 1 0 1 0 0 1 [18,] 9 5.6489742 1 1 0 0 0 0 0 0 [19,] 9 5.7557422 0 1 1 0 1 0 1 0 [20,] 11 2.8903718 1 0 0 0 0 0 0 0 [21,] 11 3.0910425 0 0 1 0 0 0 0 0 [22,] 13 4.7095302 1 0 0 0 0 0 0 0 [23,] 13 4.9836066 1 0 1 1 1 0 0 0 [24,] 13 1.6094379 1 0 1 1 1 0 1 0 [25,] 13 1.6094379 1 0 1 1 0 0 1 0 [26,] 13 4.7004804 1 0 1 1 0 0 1 0 [27,] 13 1.6094379 1 0 1 1 1 0 0 1 [28,] 13 4.5432948 0 0 1 0 0 0 0 1 [29,] 14 1.6094379 1 1 0 0 0 0 0 0 [30,] 14 4.4998097 1 1 1 0 0 0 0 0 [31,] 14 5.6276211 1 1 1 1 1 1 0 0 [32,] 14 5.1179938 0 1 1 0 1 0 0 1 [33,] 16 2.3978953 1 0 0 0 0 0 0 0 [34,] 16 6.2878586 0 0 1 0 0 0 0 0 [35,] 31 5.4380793 1 0 0 0 0 0 0 0 [36,] 31 3.6375862 1 0 1 0 1 0 1 0 [37,] 31 5.7620514 0 0 1 1 0 0 1 0 [38,] 33 2.8332133 1 1 0 0 0 0 0 0 [39,] 33 5.7037825 0 1 1 1 0 1 0 0 [40,] 43 5.9026333 1 1 0 0 0 0 0 0 [41,] 43 3.4011974 1 1 1 1 1 1 0 1 [42,] 43 3.6375862 1 1 1 1 0 1 0 1 [43,] 61 4.3174881 1 0 0 0 0 0 0 0 [44,] 61 5.5872487 1 0 1 1 1 0 0 0 [45,] 61 5.3278762 0 0 1 1 1 0 1 0 [46,] 62 4.0604430 1 1 0 0 0 0 0 0 [47,] 62 6.2205902 0 1 1 0 1 0 0 0 [48,] 106 6.2045578 1 1 0 0 0 0 0 0 [49,] 106 5.2040067 0 1 1 0 1 0 0 1 [50,] 110 6.2025355 1 0 0 0 0 0 0 0 [51,] 110 3.7841896 1 0 1 0 1 0 0 1 [52,] 110 2.9444390 1 0 1 1 1 0 0 1 [53,] 110 2.6390573 0 0 1 0 0 0 0 1 [54,] 163 6.2480429 1 1 0 0 0 0 0 0 [55,] 163 2.6390573 0 1 1 0 1 0 0 1 [56,] 165 5.7462032 1 1 0 0 0 0 0 0 [57,] 165 1.7917595 1 1 1 0 1 0 1 0 [58,] 165 5.4424177 0 1 1 0 0 0 1 0 [59,] 168 4.9972123 1 0 0 0 0 0 0 0 [60,] 168 5.9375362 0 0 1 1 1 0 0 0 [61,] 172 4.0253517 1 0 0 0 0 0 0 0 [62,] 172 4.7449321 1 0 1 0 1 0 0 0 [63,] 172 5.9053618 0 0 1 0 1 0 0 0 [64,] 204 6.0038871 1 0 0 0 0 0 0 0 [65,] 204 4.9199809 0 0 1 0 1 0 0 1 [66,] 206 5.7397929 1 0 0 0 0 0 0 0 [67,] 206 3.1354942 1 0 1 1 1 0 1 0 [68,] 206 3.1780538 1 0 1 0 0 0 1 0 [69,] 206 3.5835189 1 0 1 0 0 0 0 1 [70,] 206 4.8978398 0 0 1 0 0 0 0 1 [71,] 211 4.4998097 1 1 0 0 0 0 0 0 [72,] 211 6.0913099 0 1 1 1 1 1 0 0 [73,] 241 5.7525726 1 0 0 0 0 0 0 0 [74,] 241 2.3025851 1 0 1 0 1 0 1 0 [75,] 241 2.7725887 1 0 1 1 0 0 1 0 [76,] 241 5.2882670 0 0 1 0 0 0 1 0 [77,] 244 6.1092476 1 1 0 0 0 0 0 0 [78,] 244 4.7449321 0 1 1 0 1 0 0 1 [79,] 249 6.1633148 1 1 0 0 0 0 0 0 [80,] 249 4.5747110 0 1 1 0 1 0 0 1 [81,] 250 3.5553481 1 0 0 0 0 0 0 0 [82,] 250 1.3862944 1 0 1 1 0 0 0 0 [83,] 250 4.4659081 1 0 1 0 0 0 0 0 [84,] 250 5.9322452 0 0 1 1 1 0 0 0 [85,] 252 0.6931472 1 0 0 0 0 0 0 0 [86,] 252 3.9512437 1 0 1 0 0 0 0 0 [87,] 252 4.0943446 1 0 1 0 1 0 0 0 [88,] 252 3.1780538 1 0 1 0 1 0 0 0 [89,] 252 2.4849066 1 0 1 0 0 0 0 0 [90,] 252 5.1590553 1 0 1 1 0 0 0 0 [91,] 252 3.8066625 1 0 1 0 1 0 1 0 [92,] 252 2.4849066 1 0 1 0 1 0 0 1 [93,] 252 3.3322045 1 0 1 0 0 0 0 1 [94,] 252 1.9459101 1 0 1 0 0 0 0 1 [95,] 252 2.7725887 1 0 1 0 0 0 0 1 [96,] 252 4.7184989 0 0 1 0 0 0 0 1 [97,] 256 6.2324480 1 1 0 0 0 0 0 0 [98,] 256 2.9957323 0 1 1 1 1 1 0 1 [99,] 265 3.7135721 1 0 0 0 0 0 0 0 [100,] 265 3.3672958 1 0 1 0 1 0 0 0 [101,] 265 5.6489742 1 0 1 0 0 0 0 0 [102,] 265 3.5553481 1 0 1 0 1 0 1 0 [103,] 265 0.6931472 1 0 1 0 0 0 0 1 [104,] 265 3.0445224 1 0 1 0 0 0 0 1 [105,] 265 4.3040651 1 0 1 0 0 0 0 1 [106,] 265 2.5649494 1 0 1 0 1 0 0 1 [107,] 265 3.6109179 0 0 1 0 0 0 0 1 [108,] 267 4.6913479 1 0 0 0 0 0 0 0 [109,] 267 5.9375362 1 0 1 1 1 0 0 0 [110,] 267 4.9558271 0 0 1 0 1 0 0 1 [111,] 269 -0.6931472 1 0 0 0 0 0 0 0 [112,] 269 3.8712010 1 0 1 1 0 0 0 0 [113,] 269 6.3189681 0 0 1 0 1 0 0 0 [114,] 291 6.0614569 1 1 0 0 0 0 0 0 [115,] 291 1.7917595 1 1 1 0 1 0 0 1 [116,] 291 2.1972246 1 1 1 0 0 0 0 1 [117,] 291 2.0794415 1 1 1 0 0 0 0 1 [118,] 291 2.0794415 1 1 1 0 0 0 0 1 [119,] 291 1.9459101 1 1 1 0 0 0 0 1 [120,] 291 4.5108595 0 1 1 0 0 0 0 1 [121,] 312 5.8550719 1 1 0 0 0 0 0 0 [122,] 312 4.5747110 1 1 1 1 1 1 1 0 [123,] 312 0.6931472 1 1 1 0 1 0 0 1 [124,] 312 1.6094379 1 1 1 0 0 0 0 1 [125,] 312 4.3694479 0 1 1 0 0 0 0 1 [126,] 314 5.3612922 1 0 0 0 0 0 0 0 [127,] 314 4.4067192 1 0 1 0 1 0 1 0 [128,] 314 4.8598124 1 0 1 1 1 0 1 0 [129,] 314 3.6109179 1 0 1 1 1 0 0 1 [130,] 314 3.7376696 1 0 1 1 0 0 0 1 [131,] 316 5.3890717 1 1 0 0 0 0 0 0 [132,] 316 2.3978953 1 1 1 0 1 0 1 0 [133,] 316 5.6733233 0 1 1 0 0 0 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testrbind2# #argv <- list(c(0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 6L, 1L, 0L, 1L, 20L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 4L, 0L, 0L, 3L, 6L, 2L, 0L, 14L, 1L, 0L, 16L, 0L, 1L, 0L, 5L, 1L, 0L, 2L, 4L, 0L, 0L, 5L, 0L, 2L, 0L, 1L, 7L, 2L, 0L, 0L, 2L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 2L, 0L, 0L, 0L, 4L, 0L, 0L, 4L, 0L, 0L, 0L, 0L, 5L, 0L, 18L, 0L, 4L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 5L, 0L, 10L, 0L, 2L, 2L, 6L, 0L, 5L, 7L, 0L, 3L, 0L, 1L, 0L, 3L, 2L, 0L, 5L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 2L, 3L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 2L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 3L, 0L, 1L, 3L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 4L, 5L, 0L, 0L, 0L, 4L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 2L, 0L, 0L, 2L), c(0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 4L, 1L, 5L, 1L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 7L, 0L, 0L, 0L, 0L, 7L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 8L, 3L, 3L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 2L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 2L, 0L, 0L, 7L, 0L, 1L, 0L, 13L, 1L, 2L, 0L, 0L, 0L, 0L, 0L, 5L, 0L, 2L, 0L, 8L, 0L, 3L, 0L, 0L, 5L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 10L, 0L, 0L, 27L, 3L, 1L, 0L, 0L, 0L, 0L, 2L, 3L, 0L, 1L, 1L, 0L, 4L, 7L, 6L, 3L, 0L, 0L, 0L, 0L, 0L, 0L, 14L, 8L, 0L, 0L, 19L, 0L, 0L, 0L, 1L, 0L, 2L, 0L, 6L, 2L, 2L, 0L, 0L, 3L, 0L, 0L, 0L, 0L, 0L, 0L, 4L, 1L, 1L, 8L, 0L, 0L, 2L, 0L, 4L, 0L, 2L, 0L, 0L, 0L, 3L, 0L, 8L, 0L, 0L, 1L, 0L, 1L, 1L, 0L));do.call('rbind', argv) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [,14] [1,] 0 1 0 0 0 1 0 0 0 0 0 0 0 0 [2,] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [,15] [,16] [,17] [,18] [,19] [,20] [,21] [,22] [,23] [,24] [,25] [,26] [1,] 0 0 0 0 0 0 0 1 0 0 0 0 [2,] 0 0 0 1 0 0 0 0 0 0 0 0 [,27] [,28] [,29] [,30] [,31] [,32] [,33] [,34] [,35] [,36] [,37] [,38] [1,] 0 0 0 0 0 0 0 0 0 0 0 0 [2,] 0 0 0 0 0 0 0 0 0 0 0 0 [,39] [,40] [,41] [,42] [,43] [,44] [,45] [,46] [,47] [,48] [,49] [,50] [1,] 0 0 0 0 0 0 0 0 0 0 0 0 [2,] 0 0 0 0 0 0 0 0 0 0 1 0 [,51] [,52] [,53] [,54] [,55] [,56] [,57] [,58] [,59] [,60] [,61] [,62] [1,] 0 0 0 0 0 0 0 0 0 0 0 0 [2,] 0 0 1 0 0 0 0 0 0 0 0 0 [,63] [,64] [,65] [,66] [,67] [,68] [,69] [,70] [,71] [,72] [,73] [,74] [1,] 1 0 0 0 0 0 0 0 0 0 0 0 [2,] 0 0 0 0 0 1 0 0 0 0 0 0 [,75] [,76] [,77] [,78] [,79] [,80] [,81] [,82] [,83] [,84] [,85] [,86] [1,] 0 0 0 0 0 0 0 0 0 0 1 0 [2,] 0 0 0 0 0 0 0 0 0 0 0 0 [,87] [,88] [,89] [,90] [,91] [,92] [,93] [,94] [,95] [,96] [,97] [,98] [1,] 0 1 0 0 0 0 0 0 0 0 1 0 [2,] 0 0 0 0 0 0 0 0 0 0 0 0 [,99] [,100] [,101] [,102] [,103] [,104] [,105] [,106] [,107] [,108] [1,] 0 0 0 0 1 1 0 0 0 1 [2,] 0 0 0 0 0 0 0 0 0 0 [,109] [,110] [,111] [,112] [,113] [,114] [,115] [,116] [,117] [,118] [1,] 0 0 0 0 0 0 0 0 0 0 [2,] 0 0 0 0 0 0 0 0 0 0 [,119] [,120] [,121] [,122] [,123] [,124] [,125] [,126] [,127] [,128] [1,] 0 0 0 0 0 0 0 6 1 0 [2,] 0 0 0 0 0 0 0 4 1 5 [,129] [,130] [,131] [,132] [,133] [,134] [,135] [,136] [,137] [,138] [1,] 1 20 1 0 1 1 0 0 0 0 [2,] 1 0 1 0 0 0 0 0 0 0 [,139] [,140] [,141] [,142] [,143] [,144] [,145] [,146] [,147] [,148] [1,] 0 0 0 1 4 0 0 3 6 2 [2,] 7 0 0 0 0 7 0 0 1 0 [,149] [,150] [,151] [,152] [,153] [,154] [,155] [,156] [,157] [,158] [1,] 0 14 1 0 16 0 1 0 5 1 [2,] 0 0 0 0 0 0 0 1 0 0 [,159] [,160] [,161] [,162] [,163] [,164] [,165] [,166] [,167] [,168] [1,] 0 2 4 0 0 5 0 2 0 1 [2,] 0 0 0 0 0 0 0 0 0 0 [,169] [,170] [,171] [,172] [,173] [,174] [,175] [,176] [,177] [,178] [1,] 7 2 0 0 2 0 0 0 0 0 [2,] 0 0 0 0 0 0 0 0 0 0 [,179] [,180] [,181] [,182] [,183] [,184] [,185] [,186] [,187] [,188] [1,] 0 1 2 0 0 0 4 0 0 4 [2,] 0 0 0 0 0 0 0 8 3 3 [,189] [,190] [,191] [,192] [,193] [,194] [,195] [,196] [,197] [,198] [1,] 0 0 0 0 5 0 18 0 4 0 [2,] 0 0 1 0 0 1 0 0 0 0 [,199] [,200] [,201] [,202] [,203] [,204] [,205] [,206] [,207] [,208] [1,] 0 0 0 0 0 0 5 0 10 0 [2,] 0 0 0 0 0 0 0 0 0 0 [,209] [,210] [,211] [,212] [,213] [,214] [,215] [,216] [,217] [,218] [1,] 2 2 6 0 5 7 0 3 0 1 [2,] 0 0 0 0 0 0 0 0 0 0 [,219] [,220] [,221] [,222] [,223] [,224] [,225] [,226] [,227] [,228] [1,] 0 3 2 0 5 0 0 0 0 0 [2,] 0 0 1 0 0 0 0 0 0 0 [,229] [,230] [,231] [,232] [,233] [,234] [,235] [,236] [,237] [,238] [1,] 0 0 0 0 2 3 0 0 0 0 [2,] 0 0 0 0 0 0 0 0 0 0 [,239] [,240] [,241] [,242] [,243] [,244] [,245] [,246] [,247] [,248] [1,] 0 0 0 0 0 0 0 0 0 2 [2,] 0 0 0 0 0 0 0 0 0 0 [,249] [,250] [,251] [,252] [,253] [,254] [,255] [,256] [,257] [,258] [1,] 0 0 0 0 1 0 0 0 0 0 [2,] 0 0 0 0 0 0 0 0 0 0 [,259] [,260] [,261] [,262] [,263] [,264] [,265] [,266] [,267] [,268] [1,] 0 0 0 0 0 0 0 0 0 1 [2,] 0 0 0 0 0 0 0 0 0 0 [,269] [,270] [,271] [,272] [,273] [,274] [,275] [,276] [,277] [,278] [1,] 0 0 0 0 0 0 1 0 0 0 [2,] 0 0 0 0 0 0 0 0 2 0 [,279] [,280] [,281] [,282] [,283] [,284] [,285] [,286] [,287] [,288] [1,] 0 0 0 0 0 0 0 0 0 0 [2,] 0 1 0 0 0 0 2 0 0 7 [,289] [,290] [,291] [,292] [,293] [,294] [,295] [,296] [,297] [,298] [1,] 0 0 0 1 0 0 0 0 0 0 [2,] 0 1 0 13 1 2 0 0 0 0 [,299] [,300] [,301] [,302] [,303] [,304] [,305] [,306] [,307] [,308] [1,] 0 0 0 0 0 0 0 0 0 0 [2,] 0 5 0 2 0 8 0 3 0 0 [,309] [,310] [,311] [,312] [,313] [,314] [,315] [,316] [,317] [,318] [1,] 0 0 0 0 0 0 0 0 0 0 [2,] 5 0 0 0 0 0 0 0 0 1 [,319] [,320] [,321] [,322] [,323] [,324] [,325] [,326] [,327] [,328] [1,] 0 0 0 0 0 0 0 0 0 0 [2,] 0 0 0 0 1 0 0 0 10 0 [,329] [,330] [,331] [,332] [,333] [,334] [,335] [,336] [,337] [,338] [1,] 0 0 0 0 0 0 0 0 0 0 [2,] 0 27 3 1 0 0 0 0 2 3 [,339] [,340] [,341] [,342] [,343] [,344] [,345] [,346] [,347] [,348] [1,] 0 0 0 0 0 0 0 0 0 0 [2,] 0 1 1 0 4 7 6 3 0 0 [,349] [,350] [,351] [,352] [,353] [,354] [,355] [,356] [,357] [,358] [1,] 0 0 0 0 0 0 3 0 1 3 [2,] 0 0 0 0 14 8 0 0 19 0 [,359] [,360] [,361] [,362] [,363] [,364] [,365] [,366] [,367] [,368] [1,] 0 0 0 1 1 0 0 0 0 0 [2,] 0 0 1 0 2 0 6 2 2 0 [,369] [,370] [,371] [,372] [,373] [,374] [,375] [,376] [,377] [,378] [1,] 0 0 0 0 1 0 0 0 1 0 [2,] 0 3 0 0 0 0 0 0 4 1 [,379] [,380] [,381] [,382] [,383] [,384] [,385] [,386] [,387] [,388] [1,] 0 4 5 0 0 0 4 0 1 0 [2,] 1 8 0 0 2 0 4 0 2 0 [,389] [,390] [,391] [,392] [,393] [,394] [,395] [,396] [,397] [,398] [1,] 0 0 1 0 0 0 1 0 2 0 [2,] 0 0 3 0 8 0 0 1 0 1 [,399] [,400] [1,] 0 2 [2,] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rbind.testrbind3# #argv <- list(c(32L, 34L, 37L, 33L, 20L, 40L, 39L, 22L, 33L, 37L, 37L, 38L, 39L, 37L, 36L, 39L, 39L, 40L, 37L, 38L, 35L, 40L, 17L, 39L, 40L, 34L, 40L, 37L, 26L, 40L, 33L, 36L, 38L, 27L, 36L, 36L, 37L, 39L, 40L, 37L, 39L, 40L, 38L, 32L, 37L, 36L, 17L, 36L, 39L, 34L, 40L, 40L, 40L, 37L, 40L, 38L, 39L, 36L, 38L, 40L, 39L, 38L, 39L, 38L, 38L, 40L, 33L, 39L, 40L, 33L, 36L, 34L, 40L, 37L, 26L, 37L, 40L, 40L, 40L, 36L, 39L, 33L, 38L, 40L, 13L, 37L, 22L, 40L, 37L, 40L, 27L, 39L, 35L, 36L, 31L, 24L, 39L, 32L, 38L, 38L), c(8, 6, 3, 7, 20, 0, 1, 18, 7, 3, 3, 2, 1, 3, 4, 1, 1, 0, 3, 2, 5, 0, 23, 1, 0, 6, 0, 3, 14, 0, 7, 4, 2, 13, 4, 4, 3, 1, 0, 3, 1, 0, 2, 8, 3, 4, 23, 4, 1, 6, 0, 0, 0, 3, 0, 2, 1, 4, 2, 0, 1, 2, 1, 2, 2, 0, 7, 1, 0, 7, 4, 6, 0, 3, 14, 3, 0, 0, 0, 4, 1, 7, 2, 0, 27, 3, 18, 0, 3, 0, 13, 1, 5, 4, 9, 16, 1, 8, 2, 2));do.call('rbind', argv) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [,14] [1,] 32 34 37 33 20 40 39 22 33 37 37 38 39 37 [2,] 8 6 3 7 20 0 1 18 7 3 3 2 1 3 [,15] [,16] [,17] [,18] [,19] [,20] [,21] [,22] [,23] [,24] [,25] [,26] [1,] 36 39 39 40 37 38 35 40 17 39 40 34 [2,] 4 1 1 0 3 2 5 0 23 1 0 6 [,27] [,28] [,29] [,30] [,31] [,32] [,33] [,34] [,35] [,36] [,37] [,38] [1,] 40 37 26 40 33 36 38 27 36 36 37 39 [2,] 0 3 14 0 7 4 2 13 4 4 3 1 [,39] [,40] [,41] [,42] [,43] [,44] [,45] [,46] [,47] [,48] [,49] [,50] [1,] 40 37 39 40 38 32 37 36 17 36 39 34 [2,] 0 3 1 0 2 8 3 4 23 4 1 6 [,51] [,52] [,53] [,54] [,55] [,56] [,57] [,58] [,59] [,60] [,61] [,62] [1,] 40 40 40 37 40 38 39 36 38 40 39 38 [2,] 0 0 0 3 0 2 1 4 2 0 1 2 [,63] [,64] [,65] [,66] [,67] [,68] [,69] [,70] [,71] [,72] [,73] [,74] [1,] 39 38 38 40 33 39 40 33 36 34 40 37 [2,] 1 2 2 0 7 1 0 7 4 6 0 3 [,75] [,76] [,77] [,78] [,79] [,80] [,81] [,82] [,83] [,84] [,85] [,86] [1,] 26 37 40 40 40 36 39 33 38 40 13 37 [2,] 14 3 0 0 0 4 1 7 2 0 27 3 [,87] [,88] [,89] [,90] [,91] [,92] [,93] [,94] [,95] [,96] [,97] [,98] [1,] 22 40 37 40 27 39 35 36 31 24 39 32 [2,] 18 0 3 0 13 1 5 4 9 16 1 8 [,99] [,100] [1,] 38 38 [2,] 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rcond.testrcond1#Ignored.Unimplemented# #argv <- structure(list(x = structure(c(FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = c(5L, 5L))), .Names = 'x');do.call('rcond', argv) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rcond.testrcond2#Ignored.Unimplemented# #argv <- structure(list(x = structure(c(0.483017750550061 + (0+0i), 0.399143285583705 + (0+0i), 0.0162145779468119 + (0+0i), 0.125083255348727 + (0+0i), 0.0706489166477695 + (0+0i), 0.504917626501992 + (0+0i), 0.327679358422756 + (0+0i), 0.411779605317861 + (0+0i), 0.202413034392521 + (0+0i), 0.307096319855191 + (0+0i), 0.642031987197697 + (0+0i), 0.276873307069764 + (0+0i), 0.103556007146835 + (0+0i), 0.256002754438668 + (0+0i), 0.179779380792752 + (0+0i), 0.247455857461318 + (0+0i), 0.215011228807271 + (0+0i), 0.493673762306571 + (0+0i), 0.653446026844904 + (0+0i), 0.573559894575737 + (0+0i), 0.863887825980783 + (0+0i), 0.637789903208613 + (0+0i), 0.0137805955018848 + (0+0i), 0.529164811130613 + (0+0i), 0.271472703316249 + (0+0i)), .Dim = c(5L, 5L))), .Names = 'x');do.call('rcond', argv) [1] 5.327333e-18 ##com.oracle.truffle.r.test.builtins.TestBuiltin_read.testReadDCF# #{ f <- tempfile(); write('hi', file=f); read.dcf(f); unlink(f); } Error in read.dcf(f) : Line starting 'hi ...' is malformed! ##com.oracle.truffle.r.test.builtins.TestBuiltin_read.testReadDCFKeepWhiteSpaces#Output.IgnoreWarningMessage# #{ f <- tempfile(); write("Authors@R: c(<<>> person('John', 'Doe'))<<>>Collate: 'assertions.R' 'built.R'<<>> 'collate.R' 'constants.R '<<>>", file=f); print(read.dcf(f)); unlink(f); } Authors@R [1,] "c(\nperson('John', 'Doe'))" Collate [1,] "'assertions.R' 'built.R'\n'collate.R' 'constants.R '" ##com.oracle.truffle.r.test.builtins.TestBuiltin_read.testReadDCFKeepWhiteSpaces#Output.IgnoreWarningMessage# #{ f <- tempfile(); write("Authors@R: c(<<>> person('John', 'Doe'))<<>>Collate: 'assertions.R' 'built.R'<<>> 'collate.R' 'constants.R '<<>>", file=f); print(read.dcf(f, keep.white='Authors@R', all=FALSE)); unlink(f); } Authors@R [1,] "c(\n person('John', 'Doe'))" Collate [1,] "'assertions.R' 'built.R'\n'collate.R' 'constants.R '" ##com.oracle.truffle.r.test.builtins.TestBuiltin_read.testReadDCFKeepWhiteSpaces#Output.IgnoreWarningMessage# #{ f <- tempfile(); write("Authors@R: c(<<>> person('John', 'Doe'))<<>>Collate: 'assertions.R' 'built.R'<<>> 'collate.R' 'constants.R '<<>>", file=f); print(read.dcf(f, keep.white='Authors@R', all=TRUE)); unlink(f); } Authors@R 1 c(\n person('John', 'Doe')) Collate 1 'assertions.R' 'built.R'\n'collate.R' 'constants.R ' ##com.oracle.truffle.r.test.builtins.TestBuiltin_read.testReadDCFKeepWhiteSpaces#Output.IgnoreWarningMessage# #{ f <- tempfile(); write("Authors@R: c(<<>> person('John', 'Doe'))<<>>Collate: 'assertions.R' 'built.R'<<>> 'collate.R' 'constants.R '<<>>", file=f); print(read.dcf(f, keep.white='Collate', all=FALSE)); unlink(f); } Authors@R [1,] "c(\nperson('John', 'Doe'))" Collate [1,] "'assertions.R' 'built.R'\n 'collate.R' 'constants.R '" ##com.oracle.truffle.r.test.builtins.TestBuiltin_read.testReadDCFKeepWhiteSpaces#Output.IgnoreWarningMessage# #{ f <- tempfile(); write("Authors@R: c(<<>> person('John', 'Doe'))<<>>Collate: 'assertions.R' 'built.R'<<>> 'collate.R' 'constants.R '<<>>", file=f); print(read.dcf(f, keep.white='Collate', all=TRUE)); unlink(f); } Authors@R 1 c(\nperson('John', 'Doe')) Collate 1 'assertions.R' 'built.R'\n 'collate.R' 'constants.R ' ##com.oracle.truffle.r.test.builtins.TestBuiltin_read.testReadDCFKeepWhiteSpaces#Output.IgnoreWarningMessage# #{ f <- tempfile(); write("Authors@R: c(<<>> person('John', 'Doe'))<<>>Collate: 'assertions.R' 'built.R'<<>> 'collate.R' 'constants.R '<<>>", file=f); print(read.dcf(f, keep.white=NULL, all=FALSE)); unlink(f); } Authors@R [1,] "c(\nperson('John', 'Doe'))" Collate [1,] "'assertions.R' 'built.R'\n'collate.R' 'constants.R '" ##com.oracle.truffle.r.test.builtins.TestBuiltin_read.testReadDCFKeepWhiteSpaces#Output.IgnoreWarningMessage# #{ f <- tempfile(); write("Authors@R: c(<<>> person('John', 'Doe'))<<>>Collate: 'assertions.R' 'built.R'<<>> 'collate.R' 'constants.R '<<>>", file=f); print(read.dcf(f, keep.white=NULL, all=TRUE)); unlink(f); } Authors@R 1 c(\nperson('John', 'Doe')) Collate 1 'assertions.R' 'built.R'\n'collate.R' 'constants.R ' ##com.oracle.truffle.r.test.builtins.TestBuiltin_read.testReadDCFKeepWhiteSpaces#Output.IgnoreWarningMessage# #{ f <- tempfile(); write("Authors@R: c(<<>> person('John', 'Doe'))<<>>Collate: 'assertions.R' 'built.R'<<>> 'collate.R' 'constants.R '<<>>", file=f); print(read.dcf(f, keep.white=c('Authors@R', 'Collate'), all=FALSE)); unlink(f); } Authors@R [1,] "c(\n person('John', 'Doe'))" Collate [1,] "'assertions.R' 'built.R'\n 'collate.R' 'constants.R '" ##com.oracle.truffle.r.test.builtins.TestBuiltin_read.testReadDCFKeepWhiteSpaces#Output.IgnoreWarningMessage# #{ f <- tempfile(); write("Authors@R: c(<<>> person('John', 'Doe'))<<>>Collate: 'assertions.R' 'built.R'<<>> 'collate.R' 'constants.R '<<>>", file=f); print(read.dcf(f, keep.white=c('Authors@R', 'Collate'), all=TRUE)); unlink(f); } Authors@R 1 c(\n person('John', 'Doe')) Collate 1 'assertions.R' 'built.R'\n 'collate.R' 'constants.R ' ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'character', 1) [1] "\001\002\003" ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'character', 3) [1] "\001\002\003" "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'character', 5) [1] "\001\002\003" "" "" "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'complex', 5) complex(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'double', 5) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'int', 5) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'integer', 5) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'logical', 5) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'numeric', 5) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'raw', 1) [1] 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'raw', 3) [1] 01 02 03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'raw', 5) [1] 01 02 03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_readBin.testReadBinRawVector# #readBin(as.raw(as.raw(c(1, 2, 3))), 'tralala', 5) [1] "\001\002\003" "" "" "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_readChar.testreadChar1#Ignored.ImplementationError# #argv <- structure(list(con = as.raw(c(65, 66, 67, 68, 69, 70, 71, 72, 73, 74)), nchars = c(3, 3, 0, 3, 3, 3)), .Names = c('con', 'nchars'));do.call('readChar', argv) [1] "ABC" "DEF" "" "GHI" "J" ##com.oracle.truffle.r.test.builtins.TestBuiltin_readChar.testreadChar1#Ignored.ImplementationError# #readChar(as.raw(c(65,66,67)), nchars=3); [1] "ABC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1#Output.IgnoreWhitespace# #argv <- list('^(([^:]+)://)?([^:/]+)(:([0-9]+))?(/.*)', 'http://stat.umn.edu:80/xyz', FALSE, FALSE, FALSE); .Internal(regexec(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [[1]] [1] 1 1 1 8 20 21 23 attr(,"match.length") [1] 26 7 4 12 3 2 4 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^((.*))$", 'A1', perl=T) [[1]] [1] 1 1 1 attr(,"match.length") [1] 2 2 2 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(([A-Z)|([a-z]))$", 'Aa', perl=T) [[1]] [1] -1 attr(,"match.length") [1] -1 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(([A-Z)|([a-z]))$", c('A', 'Aa'), perl=T) [[1]] [1] 1 1 1 attr(,"match.length") [1] 1 1 1 attr(,"useBytes") [1] TRUE [[2]] [1] -1 attr(,"match.length") [1] -1 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(([A-Z)|([a-z]))$", c('Aa', 'A'), perl=T) [[1]] [1] -1 attr(,"match.length") [1] -1 attr(,"useBytes") [1] TRUE [[2]] [1] 1 1 1 attr(,"match.length") [1] 1 1 1 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(.*)$", 'A1', perl=T) [[1]] [1] 1 1 attr(,"match.length") [1] 2 2 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(?:(?:^\\[([^\\]]+)\\])?(?:'?([^']+)'?!)?([a-zA-Z0-9:\\-$\\[\\]]+)|(.*))$", 'A1 A1', perl=T) [[1]] [1] 1 0 0 0 1 attr(,"match.length") [1] 5 0 0 0 5 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1#Output.IgnoreWhitespace# #regexec("^(?:(?:^\\[([^\\]]+)\\])?(?:'?([^']+)'?!)?([a-zA-Z0-9:\\-$\\[\\]]+)|(.*))$", 'A1', perl=T) [[1]] [1] 1 0 0 1 0 attr(,"match.length") [1] 2 0 0 2 0 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(?:(?:^\\[([^\\]]+)\\])?(?:'?([^']+)'?!)?([a-zA-Z0-9:\\-$\\[\\]]+)|(.*))$", 'A1A1', perl=T) [[1]] [1] 1 0 0 1 0 attr(,"match.length") [1] 4 0 0 4 0 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(?:(?:^\\[([^\\]]+)\\])?(?:'?([^']+)'?!)?([a-zA-Z0-9:\\-$\\[\\]]+)|(.*))$", 'A1', perl=T) [[1]] [1] 1 0 0 0 1 0 attr(,"match.length") [1] 2 0 0 0 2 0 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(?:(?:^\\[([^\\]]+)\\])?(?:'?([^']+)'?!)?([a-zA-Z0-9:\\-$\\[\\]]+)|(.*))$", 'A1', perl=T) [[1]] [1] 1 1 0 0 0 1 attr(,"match.length") [1] 2 2 0 0 0 2 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(?:(?:^\\[([^\\]]+)\\])?(?:'?([^']+)'?!)?([a-zA-Z0-9:\\-$\\[\\]]+)|(.*))$", 'A1', perl=T) [[1]] [1] 1 1 0 0 0 0 1 attr(,"match.length") [1] 2 2 0 0 0 0 2 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(?(.*))$", 'A1', perl=T) [[1]] [1] 1 1 1 attr(,"match.length") [1] 2 2 2 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexec.testregexec1# #regexec("^(?.*)$", 'A1', perl=T) [[1]] [1] 1 1 attr(,"match.length") [1] 2 2 attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr#Ignored.ImplementationError# #regexpr("(a)[^a]\\1", c("andrea apart", "amadeus", NA)) [1] 6 1 NA attr(,"match.length") [1] 3 3 NA attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #regexpr("e",c("arm","foot","lefroo", "bafoobar")) [1] -1 -1 2 -1 attr(,"match.length") [1] -1 -1 1 -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr#Output.IgnoreErrorMessage# #regexpr('(', 'abc()', fixed = FALSE) Error in regexpr("(", "abc()", fixed = FALSE) : invalid regular expression '(', reason 'Missing ')'' ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #regexpr('(', 'abc()', fixed = TRUE) [1] 4 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #regexpr(')', 'abc()', fixed = FALSE) [1] 5 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #regexpr(')', 'abc()', fixed = TRUE) [1] 5 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #regexpr('\\(', 'abc()', fixed = FALSE) [1] 4 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #regexpr('\\)', 'abc()', fixed = FALSE) [1] 5 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ .Internal(regexpr("7", 42, F, F, F, F)) } Error: invalid 'text' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ .Internal(regexpr(7, "42", F, F, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ .Internal(regexpr(character(), "42", F, F, F, F)) } Error: invalid 'pattern' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ as.integer(regexpr("foo", c("bar foo foo", "foo"), fixed=F)) } [1] 5 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ as.integer(regexpr("foo", c("bar foo foo", "foo"), fixed=T)) } [1] 5 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ regexpr("aaa", "bbbaaaccc", fixed=TRUE) } [1] 4 attr(,"match.length") [1] 3 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ regexpr("aaa", c("bbbaaaccc", "haaah"), fixed=TRUE) } [1] 4 2 attr(,"match.length") [1] 3 3 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ regexpr("aaa", c("bbbaaaccc", "hah"), fixed=TRUE) } [1] 4 -1 attr(,"match.length") [1] 3 -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ x <- "methods.html"; pos <- regexpr("\\.([[:alnum:]]+)$", x); substring(x, pos + 1L) } [1] "html" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ x<-regexpr("aaa", "bbbaaaccc", fixed=TRUE); c(x[1]) } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ x<-regexpr("aaa", c("bbbaaaccc", "haaah"), fixed=TRUE); c(x[1], x[2]) } [1] 4 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ x<-regexpr("aaa", c("bbbaaaccc", "hah"), fixed=TRUE); c(x[1], x[2]) } [1] 4 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ x<-regexpr("foo", c("bar foo foo", "foo")); attr(x, "match.length") } [1] 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExpr# #{ x<-regexpr("foo", c("bar foo foo", "foo"), fixed=T); attr(x, "match.length") } [1] 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #regexpr(structure('.*: (?X*)', class = 'regex'), list(), perl=T) integer(0) attr(,"match.length") integer(0) attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") message attr(,"capture.length") message attr(,"capture.names") [1] "message" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #regexpr(structure('^(?:ABC(?!_DEF))', class = 'regex'), list(), perl=T) integer(0) attr(,"match.length") integer(0) attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #{ argv <- structure(list(pattern = '', text = c('abc', 'defg'), perl = TRUE), .Names = c('pattern', 'text', 'perl'));do.call('regexpr', argv) } [1] 1 1 attr(,"match.length") [1] 0 0 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #{ regexpr('(?P[a-z]+)(1)', 'abc1', perl=TRUE) } [1] 1 attr(,"match.length") [1] 4 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") word [1,] 1 4 attr(,"capture.length") word [1,] 3 1 attr(,"capture.names") [1] "word" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #{ regexpr('(?P[a-z]+)|(1)', '1', perl=TRUE) } [1] 1 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") word [1,] 0 1 attr(,"capture.length") word [1,] 0 1 attr(,"capture.names") [1] "word" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #{ regexpr('(a)(b)', 'ab', perl=TRUE) } [1] 1 attr(,"match.length") [1] 2 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") [1,] 1 2 attr(,"capture.length") [1,] 1 1 attr(,"capture.names") [1] "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #{ regexpr('(a)|(b)', 'a', perl=TRUE) } [1] 1 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") [1,] 1 0 attr(,"capture.length") [1,] 1 0 attr(,"capture.names") [1] "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #{ regexpr('(a)|(b)', 'b', perl=TRUE) } [1] 1 attr(,"match.length") [1] 1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") [1,] 0 1 attr(,"capture.length") [1,] 0 1 attr(,"capture.names") [1] "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE#Ignored.ImplementationError# #{ regexpr('[⚽]', '─', perl=TRUE) } [1] -1 attr(,"match.length") [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #{ x<-c("Aaa Bbb Aaa Bbb", "Aaa bbb Aaa bbb"); p<-"(?[[:upper:]][[:lower:]]+) (?[[:upper:]][[:lower:]]+)"; regexpr(p, x, perl=TRUE) } [1] 1 -1 attr(,"match.length") [1] 7 -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 1 5 [2,] -1 -1 attr(,"capture.length") first last [1,] 3 3 [2,] -1 -1 attr(,"capture.names") [1] "first" "last" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #{ x<-c("Aaa bbb Aaa bbb", "Aaa Bbb Aaa Bbb"); p<-"(?[[:upper:]][[:lower:]]+) (?[[:upper:]][[:lower:]]+)"; regexpr(p, x, perl=TRUE) } [1] -1 1 attr(,"match.length") [1] -1 7 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] -1 -1 [2,] 1 5 attr(,"capture.length") first last [1,] -1 -1 [2,] 3 3 attr(,"capture.names") [1] "first" "last" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testRegExprPCRE# #{ x<-c("Aaa bbb Aaa bbb", "Aaa Bbb Aaa Bbb", "Aaa bbb Aaa bbb"); p<-"(?[[:upper:]][[:lower:]]+) (?[[:upper:]][[:lower:]]+)"; regexpr(p, x, perl=TRUE) } [1] -1 1 -1 attr(,"match.length") [1] -1 7 -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] -1 -1 [2,] 1 5 [3,] -1 -1 attr(,"capture.length") first last [1,] -1 -1 [2,] 3 3 [3,] -1 -1 attr(,"capture.names") [1] "first" "last" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr1# #argv <- list('package:', 'exNSS4', FALSE, FALSE, TRUE, FALSE); .Internal(regexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr10# #argv <- list('package:', 'environmental', FALSE, FALSE, TRUE, FALSE); .Internal(regexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr12#Output.IgnoreErrorMessage# #argv <- structure(list(pattern = '\d', text = c('1', 'B', '3')), .Names = c('pattern', 'text'));do.call('regexpr', argv) Error: '\d' is an unrecognized escape in character string starting "'\d" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr13#Ignored.ImplementationError# #argv <- structure(list(pattern = '[a-z]', text = NA), .Names = c('pattern', 'text'));do.call('regexpr', argv) [1] NA attr(,"match.length") [1] NA attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr13#Ignored.ImplementationError# #regexpr('a', NA) [1] NA attr(,"match.length") [1] NA attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr2#Ignored.ImplementationError# #argv <- list('éè', '«Latin-1 accented chars»: éè øØ å<Å æ<Æ é éè', FALSE, FALSE, TRUE, TRUE); .Internal(regexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] 29 attr(,"match.length") [1] 4 attr(,"index.type") [1] "bytes" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr3# #argv <- list('package:', 'graphics', FALSE, FALSE, TRUE, FALSE); .Internal(regexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr4# #argv <- list('^.*\\{n', 'my(ugly[file{name', FALSE, FALSE, FALSE, FALSE); .Internal(regexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] 1 attr(,"match.length") [1] 14 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr5# #argv <- list('(\\\\S4method\\{([._[:alnum:]]*|\\$|\\[\\[?|\\+|\\-|\\*|\\/|\\^|<=?|>=?|!=?|==|\\&|\\||\\%[[:alnum:][:punct:]]*\\%)\\}\\{((([._[:alnum:]]+|`[^`]+`),)*([._[:alnum:]]+|`[^`]+`))\\})', '\nread.00Index(file)\n', FALSE, FALSE, FALSE, FALSE); .Internal(regexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr6# #argv <- list('\\.([[:alnum:]]+)$', character(0), FALSE, FALSE, FALSE, FALSE); .Internal(regexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) integer(0) attr(,"match.length") integer(0) attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr7# #argv <- list('(?[[:upper:]][[:lower:]]+) (?[[:upper:]][[:lower:]]+)', c(' Ben Franklin and Jefferson Davis', '\tMillard Fillmore'), FALSE, TRUE, FALSE, FALSE); .Internal(regexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] 3 2 attr(,"match.length") [1] 12 16 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE attr(,"capture.start") first last [1,] 3 7 [2,] 2 10 attr(,"capture.length") first last [1,] 3 8 [2,] 7 8 attr(,"capture.names") [1] "first" "last" ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr8# #argv <- list('^[[:space:]]*@(?i)attribute', '% 4. Relevant Information Paragraph:', FALSE, TRUE, FALSE, FALSE); .Internal(regexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regexpr.testregexpr9# #argv <- list('package:', 'dummy', FALSE, FALSE, TRUE, FALSE); .Internal(regexpr(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]])) [1] -1 attr(,"match.length") [1] -1 attr(,"index.type") [1] "chars" attr(,"useBytes") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_regmatchesassign_.testregmatchesassign_1# #argv <- structure(list(x = c('A', 'B', 'C'), m = structure(c(1L, -1L, 1L), match.length = c(1L, -1L, 1L), useBytes = TRUE), value = c('A', 'C')), .Names = c('x', 'm', 'value'));do.call('regmatches<-', argv) [1] "A" "B" "C" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #rep(' ', 20L, collapse = ' ') [1] " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " [20] " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep#Output.IgnoreWarningMessage# #rep(3, 4,) [1] 3 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #rep(4, x=3) [1] 3 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #rep(NULL) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #rep(character(), length.out=2) [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #rep(complex(), length.out=2) [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #rep(list(), length.out=2) [[1]] NULL [[2]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #rep(numeric(), length.out=2) [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #rep(numeric(), times=3) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #rep(raw(), length.out=2) [1] 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #rep(x<-42) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #v <- 1; class(v) <- 'asdf'; names(v) <- 'asdf'; rep(v, 1) asdf 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #v <- 1; class(v) <- 'asdf'; names(v) <- 'asdf'; rep(v, 2) asdf asdf 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #v <- 1; class(v) <- 'asdf'; rep(v, 1) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #v <- 1; class(v) <- 'asdf'; rep(v, 2) [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #v <- 1; names(v) <- 'asdf'; rep(v, 1) asdf 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #v <- 1; names(v) <- 'asdf'; rep(v, 2) asdf asdf 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep("hello", 3) } [1] "hello" "hello" "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(1,3) } [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(1:3, length.out=4) } [1] 1 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(1:3, length.out=NA) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(1:3,2) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, each="7") } [1] 7 7 7 7 7 7 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, each=NA) } [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, each=NULL) } [1] 7 Warning message: In rep(7, each = NULL) : first element used of 'each' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, each=c(7, 42)) } [1] 7 7 7 7 7 7 7 Warning message: In rep(7, each = c(7, 42)) : first element used of 'each' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, each=integer()) } [1] 7 Warning message: In rep(7, each = integer()) : first element used of 'each' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, length.out="7") } [1] 7 7 7 7 7 7 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, length.out=NA) } [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, length.out=NULL) } [1] 7 Warning message: In rep(7, length.out = NULL) : first element used of 'length.out' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, length.out=c(7, 42)) } [1] 7 7 7 7 7 7 7 Warning message: In rep(7, length.out = c(7, 42)) : first element used of 'length.out' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, length.out=integer()) } [1] 7 Warning message: In rep(7, length.out = integer()) : first element used of 'length.out' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, times="7") } [1] 7 7 7 7 7 7 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep#Output.IgnoreWarningContext# #{ rep(7, times="foo") } Error in rep(7, times = "foo") : invalid 'times' argument In addition: Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, times=-1) } Error in rep(7, times = -1) : invalid 'times' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, times=NA) } Error in rep(7, times = NA) : invalid 'times' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, times=NULL) } Error in rep(7, times = NULL) : invalid 'times' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(7, times=character()) } Error in rep(7, times = character()) : invalid 'times' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(NA,8) } [1] NA NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(TRUE,8) } [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(as.raw(14), 4) } [1] 0e 0e 0e 0e ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(c(1, 2), each = 2) } [1] 1 1 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(c(1, 2), each = 2, length.out = 3) } [1] 1 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(c(1, 2), each = 2, length.out = 5) } [1] 1 1 2 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(c(1, 2), times = 3) } [1] 1 2 1 2 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(c(1, 2), times = c(1, 2, 3)) } Error in rep(c(1, 2), times = c(1, 2, 3)) : invalid 'times' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(c(1, 2), times = c(2, 3)) } [1] 1 1 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(c(1, 2), times = c(2, 3), each = 2) } Error in rep(c(1, 2), times = c(2, 3), each = 2) : invalid 'times' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(c(1,2),0) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(c(1,2),c(3,3)) } [1] 1 1 1 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(c(7, 42), times=c(2, NA)) } Error in rep(c(7, 42), times = c(2, NA)) : invalid 'times' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep#Output.IgnoreErrorContext# #{ rep(function() 42) } Error in rep(function() 42) : attempt to replicate an object of type 'closure' ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(paste0('hello', 1:10), 10) } [1] "hello1" "hello2" "hello3" "hello4" "hello5" "hello6" "hello7" [8] "hello8" "hello9" "hello10" "hello1" "hello2" "hello3" "hello4" [15] "hello5" "hello6" "hello7" "hello8" "hello9" "hello10" "hello1" [22] "hello2" "hello3" "hello4" "hello5" "hello6" "hello7" "hello8" [29] "hello9" "hello10" "hello1" "hello2" "hello3" "hello4" "hello5" [36] "hello6" "hello7" "hello8" "hello9" "hello10" "hello1" "hello2" [43] "hello3" "hello4" "hello5" "hello6" "hello7" "hello8" "hello9" [50] "hello10" "hello1" "hello2" "hello3" "hello4" "hello5" "hello6" [57] "hello7" "hello8" "hello9" "hello10" "hello1" "hello2" "hello3" [64] "hello4" "hello5" "hello6" "hello7" "hello8" "hello9" "hello10" [71] "hello1" "hello2" "hello3" "hello4" "hello5" "hello6" "hello7" [78] "hello8" "hello9" "hello10" "hello1" "hello2" "hello3" "hello4" [85] "hello5" "hello6" "hello7" "hello8" "hello9" "hello10" "hello1" [92] "hello2" "hello3" "hello4" "hello5" "hello6" "hello7" "hello8" [99] "hello9" "hello10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep(paste0('hello', 1:10), 1:10) } [1] "hello1" "hello2" "hello2" "hello3" "hello3" "hello3" "hello4" [8] "hello4" "hello4" "hello4" "hello5" "hello5" "hello5" "hello5" [15] "hello5" "hello6" "hello6" "hello6" "hello6" "hello6" "hello6" [22] "hello7" "hello7" "hello7" "hello7" "hello7" "hello7" "hello7" [29] "hello8" "hello8" "hello8" "hello8" "hello8" "hello8" "hello8" [36] "hello8" "hello9" "hello9" "hello9" "hello9" "hello9" "hello9" [43] "hello9" "hello9" "hello9" "hello10" "hello10" "hello10" "hello10" [50] "hello10" "hello10" "hello10" "hello10" "hello10" "hello10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ rep.cls <- function(x) 42; rep(structure(c(1,2), class='cls')); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x <- 1 ; names(x) <- c("X") ; rep(x, times=0) } named numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x <- 1+1i ; names(x) <- c("X") ; rep(x, times=2) } X X 1+1i 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x <- 1L ; names(x) <- c("X") ; rep(x, times=2) } X X 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x <- as.raw(11) ; names(x) <- c("X") ; rep(x, 3) } X X X 0b 0b 0b ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x <- as.raw(c(11,12)) ; names(x) <- c("X","Y") ; rep(x, 2) } X Y X Y 0b 0c 0b 0c ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x <- c("A","B") ; names(x) <- c("X") ; rep(x, length.out=3) } X X "A" "B" "A" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x <- c(1+1i,1+2i) ; names(x) <- c("X") ; rep(x, times=2) } X X 1+1i 1+2i 1+1i 1+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x <- c(TRUE,NA) ; names(x) <- c("X",NA) ; rep(x, length.out=3) } X X TRUE NA TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x<-c(1,2); names(x)<-c("X", "Y"); rep(x, c(3,2)) } X X X Y Y 1 1 1 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x<-factor(c("a", "b", "a")); rep(x, length=5) } [1] a b a a b Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRep# #{ x<-factor(c("a", "b", "a")); rep(x, times=3) } [1] a b a a b a a b a Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRepLenNull# #rep_len(NULL,0) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testRepLenNull# #rep_len(NULL,2) Error in rep_len(NULL, 2) : cannot replicate NULL to a non-zero length ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testSideEffect#Ignored.ReferenceError# #{ x <- c(1,2,3); f <- function() { x[1] <<- 10; 2 }; rep(x, f()) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep1# #argv <- list(NA, 7); .Internal(rep_len(argv[[1]], argv[[2]])) [1] NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep10# #argv <- list(c(NA, 3L, 4L), 3L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] NA 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep11# #argv <- list(c(NA, NA, 30, -30), 4L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] NA NA 30 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep12# #argv <- list(c(2, 3, 4, 5, 6, 7, 12, 22), 8L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] 2 3 4 5 6 7 12 22 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep13# #argv <- list(c('50-54', '55-59', '60-64', '65-69', '70-74'), 20L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] "50-54" "55-59" "60-64" "65-69" "70-74" "50-54" "55-59" "60-64" "65-69" [10] "70-74" "50-54" "55-59" "60-64" "65-69" "70-74" "50-54" "55-59" "60-64" [19] "65-69" "70-74" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep14# #argv <- list(987.338461538462, 2L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] 987.3385 987.3385 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep15# #argv <- list(1:5, 15); .Internal(rep_len(argv[[1]], argv[[2]])) [1] 1 2 3 4 5 1 2 3 4 5 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep16# #argv <- list(c(NA, 'green', 'black', 'blue'), 4L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] NA "green" "black" "blue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep17# #argv <- list(1, 2L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep18# #argv <- list(0, 0L); .Internal(rep_len(argv[[1]], argv[[2]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep19# #argv <- list(FALSE, 1L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep2# #argv <- list(NA, 4L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep21# #argv <- structure(list(1:5, each = 2), .Names = c('', 'each'));do.call('rep', argv) [1] 1 1 2 2 3 3 4 4 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep22# #argv <- list(structure(c(1L, 1L, 1L, 2L, 2L, 2L), .Label = c('Batch1', 'Batch2'), class = 'factor'), 2);do.call('rep', argv) [1] Batch1 Batch1 Batch1 Batch2 Batch2 Batch2 Batch1 Batch1 Batch1 Batch2 [11] Batch2 Batch2 Levels: Batch1 Batch2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep23# #argv <- list(structure(c(11.3164921459501, 9.56444166646261, 23.868524352596, 8.592077957758, 0.187318691429722, -11.3963997363604, -6.26079624982537, 6.05560822307356, -6.03903226622761, 4.13503361306269), .Names = c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j')), 15);do.call('rep', argv) a b c d e f 11.3164921 9.5644417 23.8685244 8.5920780 0.1873187 -11.3963997 g h i j a b -6.2607962 6.0556082 -6.0390323 4.1350336 11.3164921 9.5644417 c d e f g h 23.8685244 8.5920780 0.1873187 -11.3963997 -6.2607962 6.0556082 i j a b c d -6.0390323 4.1350336 11.3164921 9.5644417 23.8685244 8.5920780 e f g h i j 0.1873187 -11.3963997 -6.2607962 6.0556082 -6.0390323 4.1350336 a b c d e f 11.3164921 9.5644417 23.8685244 8.5920780 0.1873187 -11.3963997 g h i j a b -6.2607962 6.0556082 -6.0390323 4.1350336 11.3164921 9.5644417 c d e f g h 23.8685244 8.5920780 0.1873187 -11.3963997 -6.2607962 6.0556082 i j a b c d -6.0390323 4.1350336 11.3164921 9.5644417 23.8685244 8.5920780 e f g h i j 0.1873187 -11.3963997 -6.2607962 6.0556082 -6.0390323 4.1350336 a b c d e f 11.3164921 9.5644417 23.8685244 8.5920780 0.1873187 -11.3963997 g h i j a b -6.2607962 6.0556082 -6.0390323 4.1350336 11.3164921 9.5644417 c d e f g h 23.8685244 8.5920780 0.1873187 -11.3963997 -6.2607962 6.0556082 i j a b c d -6.0390323 4.1350336 11.3164921 9.5644417 23.8685244 8.5920780 e f g h i j 0.1873187 -11.3963997 -6.2607962 6.0556082 -6.0390323 4.1350336 a b c d e f 11.3164921 9.5644417 23.8685244 8.5920780 0.1873187 -11.3963997 g h i j a b -6.2607962 6.0556082 -6.0390323 4.1350336 11.3164921 9.5644417 c d e f g h 23.8685244 8.5920780 0.1873187 -11.3963997 -6.2607962 6.0556082 i j a b c d -6.0390323 4.1350336 11.3164921 9.5644417 23.8685244 8.5920780 e f g h i j 0.1873187 -11.3963997 -6.2607962 6.0556082 -6.0390323 4.1350336 a b c d e f 11.3164921 9.5644417 23.8685244 8.5920780 0.1873187 -11.3963997 g h i j a b -6.2607962 6.0556082 -6.0390323 4.1350336 11.3164921 9.5644417 c d e f g h 23.8685244 8.5920780 0.1873187 -11.3963997 -6.2607962 6.0556082 i j a b c d -6.0390323 4.1350336 11.3164921 9.5644417 23.8685244 8.5920780 e f g h i j 0.1873187 -11.3963997 -6.2607962 6.0556082 -6.0390323 4.1350336 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep24# #argv <- list(0, 2000);do.call('rep', argv) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [38] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [75] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [112] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [149] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [186] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [223] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [260] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [297] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [334] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [371] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [408] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [445] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [482] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [519] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [556] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [593] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [630] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [667] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [704] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [741] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [778] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [815] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [852] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [889] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [926] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [963] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1000] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1037] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1074] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1111] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1148] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1185] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1222] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1259] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1296] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1333] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1370] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1407] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1444] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1481] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1518] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1555] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1592] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1629] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1666] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1703] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1740] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1777] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1814] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1851] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1888] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1925] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1962] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [1999] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep25# #argv <- list(0 - (0+2i), 13);do.call('rep', argv) [1] 0-2i 0-2i 0-2i 0-2i 0-2i 0-2i 0-2i 0-2i 0-2i 0-2i 0-2i 0-2i 0-2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep26# #argv <- list(c(1, 2, 3, 4, 7), c(3, 4, 5, 4, 2));do.call('rep', argv) [1] 1 1 1 2 2 2 2 3 3 3 3 3 4 4 4 4 7 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep27# #argv <- list(1:14, c(3, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4, 4));do.call('rep', argv) [1] 1 1 1 2 2 2 2 3 3 3 3 4 4 4 4 5 5 5 5 6 6 6 6 7 7 [26] 7 7 8 8 8 8 9 9 9 9 10 10 10 10 11 11 11 11 12 12 12 12 13 13 13 [51] 13 14 14 14 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep28# #argv <- structure(list(c(2, 2, -1, -1, -1, -1, 0, 0), each = 48), .Names = c('', 'each'));do.call('rep', argv) [1] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [26] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [51] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [76] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 -1 -1 -1 -1 [101] -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 [126] -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 [151] -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 [176] -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 [201] -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 [226] -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 [251] -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 [276] -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 0 0 0 0 0 0 0 0 0 0 0 0 [301] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [326] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [351] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [376] 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep29# #argv <- list(c('A', 'B'), c(48L, 44L));do.call('rep', argv) [1] "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" [20] "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" [39] "A" "A" "A" "A" "A" "A" "A" "A" "A" "A" "B" "B" "B" "B" "B" "B" "B" "B" "B" [58] "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" [77] "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" "B" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep3# #argv <- list(-Inf, 1L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] -Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep30# #argv <- structure(list(c('a', 'b', 'c'), each = 3), .Names = c('', 'each'));do.call('rep', argv) [1] "a" "a" "a" "b" "b" "b" "c" "c" "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep4# #argv <- list(list(), 0L); .Internal(rep_len(argv[[1]], argv[[2]])) list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep5# #argv <- list(FALSE, FALSE); .Internal(rep_len(argv[[1]], argv[[2]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep6# #argv <- list(c(4.60173175921079, 4.46741031725783, 4.30749719409961, 4.12438637683712, 4.51499342053481, 4.24874137138388, 3.92699081698724, 3.6052402625906, 3.92699081698724), 9L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] 4.601732 4.467410 4.307497 4.124386 4.514993 4.248741 3.926991 3.605240 [9] 3.926991 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep7# #argv <- list(c(3L, 6L), 2L); .Internal(rep_len(argv[[1]], argv[[2]])) [1] 3 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep8# #argv <- list(list(c(' ', ' ')), 1L); .Internal(rep_len(argv[[1]], argv[[2]])) [[1]] [1] " " " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep.testrep9#Ignored.ReferenceError# #argv <- list(structure(1:4, .Label = c('A', 'B', 'C', 'D'), class = 'factor', .Names = c('a', 'b', 'c', 'd')), 10); .Internal(rep_len(argv[[1]], argv[[2]])) a b c d a b c d a b A B C D A B C D A B Levels: A B C D ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len('RepeatTest', 5) [1] "RepeatTest" "RepeatTest" "RepeatTest" "RepeatTest" "RepeatTest" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(1, 2) [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(1:4, 10) [1] 1 2 3 4 1 2 3 4 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(1:4, 3) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(1:4, 4) [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(1L, 4L) [1] 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(2+6i, 4) [1] 2+6i 2+6i 2+6i 2+6i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(3.14159, 3) [1] 3.14159 3.14159 3.14159 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(4, x='text') [1] "text" "text" "text" "text" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(7, '7') [1] 7 7 7 7 7 7 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(7, NA) Error in rep_len(7, NA) : invalid 'length.out' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(7, NULL) Error in rep_len(7, NULL) : invalid 'length.out' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(7, c(7, 42)) Error in rep_len(7, c(7, 42)) : invalid 'length.out' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(7, integer()) Error in rep_len(7, integer()) : invalid 'length.out' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(TRUE, 2) [1] TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(c('abcd', 'efg'), 0) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(c('abcd', 'efg'), 1) [1] "abcd" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(c('abcd', 'efg'), 14) [1] "abcd" "efg" "abcd" "efg" "abcd" "efg" "abcd" "efg" "abcd" "efg" [11] "abcd" "efg" "abcd" "efg" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(c('abcd', 'efg'), 2) [1] "abcd" "efg" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(c('abcd', 'efg'), 7) [1] "abcd" "efg" "abcd" "efg" "abcd" "efg" "abcd" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(c('abcd', 'efg'), 8) [1] "abcd" "efg" "abcd" "efg" "abcd" "efg" "abcd" "efg" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(c(2i+3, 4+2i), 4) [1] 3+2i 4+2i 3+2i 4+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(c(3.1415, 0.8), 1) [1] 3.1415 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(c(a=1,b=4), 4) [1] 1 4 1 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(expression(1,4,'foo'), 7) expression(1, 4, "foo", 1, 4, "foo", 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen#Output.IgnoreErrorContext# #rep_len(function() 42, 7) Error in rep_len(function() 42, 7) : attempt to replicate non-vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(length.out=4, 'text') [1] "text" "text" "text" "text" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(length.out=4, x=1:2) [1] 1 2 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #rep_len(x=1:2, length.out=4) [1] 1 2 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #x<-'text'; length.out<-4; rep_len(length.out=length.out, x=x) [1] "text" "text" "text" "text" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #x<-'text'; length.out<-4; rep_len(x=x, length.out=length.out) [1] "text" "text" "text" "text" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #x<-as.raw(16); rep_len(x, 2) [1] 10 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rep_len.testRepLen# #x<-as.raw(16); y<-as.raw(5); rep_len(c(x, y), 5) [1] 10 05 10 05 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #rep.int(character(0), numeric(0)) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #rep.int(integer(0), character(0)) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #rep.int(integer(0), numeric(0)) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int("a",3) } [1] "a" "a" "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(1,3) } [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(1:3,2) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(1L,3L) } [1] 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(7, "7") } [1] 7 7 7 7 7 7 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(7, -4) } Error in rep.int(7, -4) : invalid 'times' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(7, NA) } Error in rep.int(7, NA) : invalid 'times' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(7, NULL) } Error in rep.int(7, NULL) : invalid type (NULL) for 'times' (must be a vector) ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(7, c(7, 42)) } Error in rep.int(7, c(7, 42)) : invalid 'times' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(7, character()) } Error in rep.int(7, character()) : invalid 'times' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(as.raw(14), 4) } [1] 0e 0e 0e 0e ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(c(1,2),0) } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(c(1,2),2) } [1] 1 2 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(c(1,2,3),c(2,8)) } Error in rep.int(c(1, 2, 3), c(2, 8)) : invalid 'times' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(c(1,2,3),c(2,8,3)) } [1] 1 1 2 2 2 2 2 2 2 2 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(c(7,1), c(1,-4)) } Error in rep.int(c(7, 1), c(1, -4)) : invalid 'times' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(c(7,1), c(1,4,5)) } Error in rep.int(c(7, 1), c(1, 4, 5)) : invalid 'times' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt#Output.IgnoreErrorContext# #{ rep.int(function() 42, 7) } Error in rep.int(function() 42, 7) : attempt to replicate an object of type 'closure' ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt# #{ rep.int(seq_len(2), rep.int(8, 2)) } [1] 1 1 1 1 1 1 1 1 2 2 2 2 2 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepInt#Output.IgnoreErrorContext# #{ rep_int(7, function() 42) } Error in rep_int(7, function() 42) : could not find function "rep_int" ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepIntComplex# #{ rep.int(c(1+2i,100-400i,20+30i), c(3,-7)) } Error in rep.int(c(1 + (0+2i), 100 - (0+400i), 20 + (0+30i)), c(3, -7)) : invalid 'times' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepIntComplex# #{ rep.int(c(1+2i,100-400i,20+30i), c(3,7)) } Error in rep.int(c(1 + (0+2i), 100 - (0+400i), 20 + (0+30i)), c(3, 7)) : invalid 'times' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepIntComplex# #{ rep.int(c(1+2i,100-400i,20+30i), c(3,7,2)) } [1] 1+ 2i 1+ 2i 1+ 2i 100-400i 100-400i 100-400i 100-400i 100-400i [9] 100-400i 100-400i 20+ 30i 20+ 30i ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepIntComplex# #{ rep.int(c(1+2i,20+30i,100-400i), -3) } Error in rep.int(c(1 + (0+2i), 20 + (0+30i), 100 - (0+400i)), -3) : invalid 'times' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testRepIntComplex# #{ rep.int(c(1+2i,20+30i,100-400i), 2) } [1] 1+ 2i 20+ 30i 100-400i 1+ 2i 20+ 30i 100-400i ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint1# #argv <- list(1, 6); .Internal(rep.int(argv[[1]], argv[[2]])) [1] 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint10# #argv <- list(c(1L, 1L, 2L, 2L), 6); .Internal(rep.int(argv[[1]], argv[[2]])) [1] 1 1 2 2 1 1 2 2 1 1 2 2 1 1 2 2 1 1 2 2 1 1 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint11# #argv <- list(NA_character_, 3L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint12# #argv <- list(NA_character_, 5L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint13#Ignored.OutputFormatting# #argv <- list(structure(1:4, .Label = c('A', 'B', 'C', 'D'), class = 'factor', .Names = c('a', 'b', 'c', 'd')), 2); .Internal(rep.int(argv[[1]], argv[[2]])) a b c d a b c d A B C D A B C D Levels: A B C D ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint14# #argv <- list(2e-08, 9); .Internal(rep.int(argv[[1]], argv[[2]])) [1] 2e-08 2e-08 2e-08 2e-08 2e-08 2e-08 2e-08 2e-08 2e-08 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint15# #argv <- list(c('A', 'B'), structure(list(A = 2L, B = 1L), .Names = c('A', 'B'))); .Internal(rep.int(argv[[1]], argv[[2]])) [1] "A" "A" "B" ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint16# #argv <- list(0.8625, 2); .Internal(rep.int(argv[[1]], argv[[2]])) [1] 0.8625 0.8625 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint17# #argv <- list(FALSE, FALSE); .Internal(rep.int(argv[[1]], argv[[2]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint18# #argv <- list(c(-1.74520963996789, -1.58308930128988, NA), 100L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [8] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [15] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [22] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [29] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [36] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [43] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [50] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [57] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [64] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [71] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [78] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [85] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [92] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [99] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [106] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [113] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [120] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [127] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [134] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [141] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [148] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [155] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [162] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [169] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [176] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [183] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [190] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [197] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [204] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [211] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [218] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [225] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [232] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [239] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [246] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [253] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [260] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [267] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [274] -1.745210 -1.583089 NA -1.745210 -1.583089 NA -1.745210 [281] -1.583089 NA -1.745210 -1.583089 NA -1.745210 -1.583089 [288] NA -1.745210 -1.583089 NA -1.745210 -1.583089 NA [295] -1.745210 -1.583089 NA -1.745210 -1.583089 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint19# #argv <- list(structure(c(1974, 1974.08333333333, 1974.16666666667, 1974.25, 1974.33333333333, 1974.41666666667, 1974.5, 1974.58333333333, 1974.66666666667, 1974.75, 1974.83333333333, 1974.91666666667, 1975, 1975.08333333333, 1975.16666666667, 1975.25, 1975.33333333333, 1975.41666666667, 1975.5, 1975.58333333333, 1975.66666666667, 1975.75, 1975.83333333333, 1975.91666666667, 1976, 1976.08333333333, 1976.16666666667, 1976.25, 1976.33333333333, 1976.41666666667, 1976.5, 1976.58333333333, 1976.66666666667, 1976.75, 1976.83333333333, 1976.91666666667, 1977, 1977.08333333333, 1977.16666666667, 1977.25, 1977.33333333333, 1977.41666666667, 1977.5, 1977.58333333333, 1977.66666666667, 1977.75, 1977.83333333333, 1977.91666666667, 1978, 1978.08333333333, 1978.16666666667, 1978.25, 1978.33333333333, 1978.41666666667, 1978.5, 1978.58333333333, 1978.66666666667, 1978.75, 1978.83333333333, 1978.91666666667, 1979, 1979.08333333333, 1979.16666666667, 1979.25, 1979.33333333333, 1979.41666666667, 1979.5, 1979.58333333333, 1979.66666666667, 1979.75, 1979.83333333333, 1979.91666666667), .Tsp = c(1974, 1979.91666666667, 12), class = 'ts'), 3L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] 1974.000 1974.083 1974.167 1974.250 1974.333 1974.417 1974.500 1974.583 [9] 1974.667 1974.750 1974.833 1974.917 1975.000 1975.083 1975.167 1975.250 [17] 1975.333 1975.417 1975.500 1975.583 1975.667 1975.750 1975.833 1975.917 [25] 1976.000 1976.083 1976.167 1976.250 1976.333 1976.417 1976.500 1976.583 [33] 1976.667 1976.750 1976.833 1976.917 1977.000 1977.083 1977.167 1977.250 [41] 1977.333 1977.417 1977.500 1977.583 1977.667 1977.750 1977.833 1977.917 [49] 1978.000 1978.083 1978.167 1978.250 1978.333 1978.417 1978.500 1978.583 [57] 1978.667 1978.750 1978.833 1978.917 1979.000 1979.083 1979.167 1979.250 [65] 1979.333 1979.417 1979.500 1979.583 1979.667 1979.750 1979.833 1979.917 [73] 1974.000 1974.083 1974.167 1974.250 1974.333 1974.417 1974.500 1974.583 [81] 1974.667 1974.750 1974.833 1974.917 1975.000 1975.083 1975.167 1975.250 [89] 1975.333 1975.417 1975.500 1975.583 1975.667 1975.750 1975.833 1975.917 [97] 1976.000 1976.083 1976.167 1976.250 1976.333 1976.417 1976.500 1976.583 [105] 1976.667 1976.750 1976.833 1976.917 1977.000 1977.083 1977.167 1977.250 [113] 1977.333 1977.417 1977.500 1977.583 1977.667 1977.750 1977.833 1977.917 [121] 1978.000 1978.083 1978.167 1978.250 1978.333 1978.417 1978.500 1978.583 [129] 1978.667 1978.750 1978.833 1978.917 1979.000 1979.083 1979.167 1979.250 [137] 1979.333 1979.417 1979.500 1979.583 1979.667 1979.750 1979.833 1979.917 [145] 1974.000 1974.083 1974.167 1974.250 1974.333 1974.417 1974.500 1974.583 [153] 1974.667 1974.750 1974.833 1974.917 1975.000 1975.083 1975.167 1975.250 [161] 1975.333 1975.417 1975.500 1975.583 1975.667 1975.750 1975.833 1975.917 [169] 1976.000 1976.083 1976.167 1976.250 1976.333 1976.417 1976.500 1976.583 [177] 1976.667 1976.750 1976.833 1976.917 1977.000 1977.083 1977.167 1977.250 [185] 1977.333 1977.417 1977.500 1977.583 1977.667 1977.750 1977.833 1977.917 [193] 1978.000 1978.083 1978.167 1978.250 1978.333 1978.417 1978.500 1978.583 [201] 1978.667 1978.750 1978.833 1978.917 1979.000 1979.083 1979.167 1979.250 [209] 1979.333 1979.417 1979.500 1979.583 1979.667 1979.750 1979.833 1979.917 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint2# #argv <- list(NA_integer_, 1L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint20# #argv <- list(NA, 10L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] NA NA NA NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint21# #argv <- list(c('C', 'A', 'B'), structure(list(C = 1L, A = 1L, B = 1L), .Names = c('C', 'A', 'B'))); .Internal(rep.int(argv[[1]], argv[[2]])) [1] "C" "A" "B" ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint22# #argv <- list(NA_real_, 4L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint23# #argv <- list(0.26784, 49); .Internal(rep.int(argv[[1]], argv[[2]])) [1] 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 [10] 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 [19] 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 [28] 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 [37] 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 0.26784 [46] 0.26784 0.26784 0.26784 0.26784 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint24# #argv <- list(3.1e-06, 49); .Internal(rep.int(argv[[1]], argv[[2]])) [1] 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 [10] 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 [19] 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 [28] 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 [37] 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 3.1e-06 [46] 3.1e-06 3.1e-06 3.1e-06 3.1e-06 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint25# #argv <- list(NA, 5L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint26# #argv <- list(TRUE, 6L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint27# #argv <- list(structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96, 97, 98, 99, 100, 101), .Tsp = c(1, 101, 1), class = 'ts'), 3L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 [19] 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 [37] 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 [55] 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 [73] 73 74 75 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 [91] 91 92 93 94 95 96 97 98 99 100 101 1 2 3 4 5 6 7 [109] 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [127] 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 [145] 44 45 46 47 48 49 50 51 52 53 54 55 56 57 58 59 60 61 [163] 62 63 64 65 66 67 68 69 70 71 72 73 74 75 76 77 78 79 [181] 80 81 82 83 84 85 86 87 88 89 90 91 92 93 94 95 96 97 [199] 98 99 100 101 1 2 3 4 5 6 7 8 9 10 11 12 13 14 [217] 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 [235] 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 [253] 51 52 53 54 55 56 57 58 59 60 61 62 63 64 65 66 67 68 [271] 69 70 71 72 73 74 75 76 77 78 79 80 81 82 83 84 85 86 [289] 87 88 89 90 91 92 93 94 95 96 97 98 99 100 101 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint3# #argv <- list(1L, 4L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint4# #argv <- list(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), 1); .Internal(rep.int(argv[[1]], argv[[2]])) [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint5# #argv <- list(FALSE, 0L); .Internal(rep.int(argv[[1]], argv[[2]])) logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint6# #argv <- list('', 2L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint7# #argv <- list(TRUE, 1L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint8# #argv <- list(' ', 8L); .Internal(rep.int(argv[[1]], argv[[2]])) [1] " " " " " " " " " " " " " " " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_repint.testrepint9# #argv <- list(c(-4L, 11L, 23L, -3L, -2L, -1L, -6L, 0L, 8L, -13L, 6L, -32L, -8L, NA, 0L), c(10L, 9L, 11L, 17L, 9L, 18L, 8L, 11L, 8L, 15L, 4L, 12L, 12L, 1L, 34L)); .Internal(rep.int(argv[[1]], argv[[2]])) [1] -4 -4 -4 -4 -4 -4 -4 -4 -4 -4 11 11 11 11 11 11 11 11 [19] 11 23 23 23 23 23 23 23 23 23 23 23 -3 -3 -3 -3 -3 -3 [37] -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -2 -2 -2 -2 -2 -2 -2 [55] -2 -2 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 [73] -1 -1 -6 -6 -6 -6 -6 -6 -6 -6 0 0 0 0 0 0 0 0 [91] 0 0 0 8 8 8 8 8 8 8 8 -13 -13 -13 -13 -13 -13 -13 [109] -13 -13 -13 -13 -13 -13 -13 -13 6 6 6 6 -32 -32 -32 -32 -32 -32 [127] -32 -32 -32 -32 -32 -32 -8 -8 -8 -8 -8 -8 -8 -8 -8 -8 -8 -8 [145] NA 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [163] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rev.testRev# #{ rev(1:3) } [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rev.testRev# #{ rev(c(1+1i, 2+2i)) } [1] 2+2i 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rev.testrev1# #argv <- structure(list(x = c('#FF0000FF', '#FFFF00FF', '#00FF00FF')), .Names = 'x');do.call('rev', argv) [1] "#00FF00FF" "#FFFF00FF" "#FF0000FF" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rhyper.testNullAndMissing# #rmultinom(0,0,0) Error in rmultinom(0, 0, 0) : no positive probabilities ##com.oracle.truffle.r.test.builtins.TestBuiltin_rhyper.testNullAndMissing# #rmultinom(0,0,0,NULL) Error in rmultinom(0, 0, 0, NULL) : unused argument (NULL) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rhyper.testSimple# #rhyper(0,0,0,0) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# # e <- new.env(); e$a <- 42; rm(list='a', envir=e); e$a NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #tmp <- 42; f <- function() rm(list='tmp',inherits=T); f(); tmp Error: object 'tmp' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #tmp <- 42; rm(list='tmp'); tmp Error: object 'tmp' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #tmp <- 42; rm(tmp); tmp Error: object 'tmp' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ e <- new.env(); e$a <- 1234L; lockBinding('a', e); rm(list='a', envir=e); ls(e) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ e <- new.env(); e$a <- 1234L; lockEnvironment(e); rm(list='a', envir=e); ls(e) } Error in rm(list = "a", envir = e) : cannot remove bindings from a locked environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ e <- new.env(); e$a <- 1234L; rm(list=c('c', 'a'), envir=e); ls(e) } character(0) Warning message: In rm(list = c("c", "a"), envir = e) : object 'c' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ e <- new.env(parent=baseenv()); e$a <- 1234L; rm(c('c', 'a'), envir=e, inherits=T); ls(e) } Error in rm(c("c", "a"), envir = e, inherits = T) : ... must contain names or character strings ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ e <- new.env(parent=baseenv()); rm('c', envir=e, inherits=T) } Error in rm("c", envir = e, inherits = T) : cannot remove variables from the base environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ env0 <- new.env(); env0$a <- 123L; env1 <- new.env(parent=env0); env1$b <- 456L; rm('a', envir=env1, inherits=F); lapply(c(env0, env1), function(x) ls(x)) } [[1]] [1] "a" [[2]] [1] "b" Warning message: In rm("a", envir = env1, inherits = F) : object 'a' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ env0 <- new.env(); env0$a <- 123L; env1 <- new.env(parent=env0); env1$b <- 456L; rm('a', envir=env1, inherits=T); lapply(c(env0, env1), function(x) ls(x)) } [[1]] character(0) [[2]] [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ env0 <- new.env(); env0$b <- 123L; env1 <- new.env(parent=env0); env1$b <- 456L; rm('b', envir=env1, inherits=F); lapply(c(env0, env1), function(x) ls(x)) } [[1]] [1] "b" [[2]] character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ rm(list='a', envir=emptyenv()) } Warning message: In rm(list = "a", envir = emptyenv()) : object 'a' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ rm(list=ls(baseenv(), all.names=TRUE), envir=baseenv()) } Error in rm(list = ls(baseenv(), all.names = TRUE), envir = baseenv()) : cannot remove variables from the base environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.basicTests# #{ rm(list=ls(emptyenv()), envir=emptyenv()) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.testArgsCasting# #.Internal(remove(list=33, environment(), F)) Error: invalid first argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.testArgsCasting# #tmp <- 42; rm(tmp, envir=42) Error in rm(tmp, envir = 42) : invalid 'envir' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.testArgsCasting# #tmp <- 42; rm(tmp, envir=NULL) Error in rm(tmp, envir = NULL) : use of NULL environment is defunct ##com.oracle.truffle.r.test.builtins.TestBuiltin_rm.testArgsCasting# #tmp <- 42; rm(tmp, inherits='asd') Error in rm(tmp, inherits = "asd") : invalid 'inherits' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rmultinom.testNullAndMissing# #rmultinom(1, 1) Error in rmultinom(1, 1) : argument "prob" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_rmultinom.testNullAndMissing# #rmultinom(1, 1, NULL) Error in rmultinom(1, 1, NULL) : no positive probabilities ##com.oracle.truffle.r.test.builtins.TestBuiltin_rmultinom.testSimple# #rmultinom(1,1,1) [,1] [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testAttrs# #round(structure(1:3, .Names=c('a','b','c'), mya=42)) a b c 1 2 3 attr(,"mya") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testAttrs# #round(structure(c(1,2,4), .Names=c('a','b','c'), mya=42)) a b c 1 2 4 attr(,"mya") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testAttrs# #round(structure(c(T,T,T), .Names=c('a','b','c'), mya=42)) a b c 1 1 1 attr(,"mya") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(-1.5) } [1] -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(0.4) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(0.5) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(0.6) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound#Ignored.Unimplemented# #{ round(1.1234+1i, 3.1+1i); } [1] 1.123+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(1.123456,digit=2.3) } [1] 1.12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(1.123456,digit=2.5) } [1] 1.123 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(1.123456,digit=2.8) } [1] 1.123 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(1.5) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(1/0) } [1] Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(12344.123456,digit=-2.3) } [1] 12300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(12344.123456,digit=-2.5) } [1] 12300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(12344.126,digit=-2.8) } [1] 12000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(1L) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(as.complex(c(0,0.2,NaN,0.6,NA,1))) } [1] 0+0i 0+0i NaN+0i 1+0i NA 1+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(c(0,0.2,0.4,0.6,0.8,1)) } [1] 0 0 0 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ round(c(0,0.2,NaN,0.6,NA,1)) } [1] 0 0 NaN 1 NA 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ typeof(round(1L)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ typeof(round(42L)); } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testRound# #{ typeof(round(TRUE)); } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testround1# #argv <- list(3.98778192287757, 3);do.call('round', argv) [1] 3.988 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testround2# #argv <- structure(list(c(37.9490090935718, 34.1981894015095), digits = 3), .Names = c('', 'digits'));do.call('round', argv) [1] 37.949 34.198 ##com.oracle.truffle.r.test.builtins.TestBuiltin_round.testround3# #argv <- list(structure(list(lowerNorm = c(1, 0.7074793118252, 0.703783359109958, 0.633667085530785, 0.629171386131588, 0.55900804989023, 0.553693829615336, 0.547917347996141, 0.470383100744677, 0.397621760007547, 0.390548442517381, 0.382779091361949, 0.374191514453686, 0.276654053495554, 0.186268067402784, 0.176381170003996, 0.152703583557352, 0.138281755556403, 0.121518607618675), upperNorm = c(1, 1, 1, 0.979778292620476, 0.984273992019672, 0.946874303050947, 0.952188523325841, 0.957965004945035, 0.910009056118068, 0.857280200776766, 0.864353518266933, 0.872122869422365, 0.880710446330628, 0.798976198605286, 0.710090476014583, 0.719977373413371, 0.743654959860015, 0.758076787860964, 0.774839935798692), lowerNormS = c(0.910985448809634, 0.683392923012911, 0.679522139376878, 0.614273605024573, 0.609653530675358, 0.543887035370979, 0.538488520130148, 0.532620411085642, 0.459604218176941, 0.390811451215735, 0.383715321807271, 0.375920913978781, 0.367305641565109, 0.274783502246108, 0.188735721130942, 0.178848823732154, 0.15517123728551, 0.140749409284561, 0.123986261346832), upperNorms = c(1, 0.996879185830627, 1, 0.969960088452818, 0.974580162802033, 0.937905681715855, 0.943304196956687, 0.949172306001193, 0.902674026454245, 0.851952320959801, 0.859048450368266, 0.866842858196755, 0.875458130610427, 0.797245309278501, 0.712558129742741, 0.722445027141529, 0.746122613588173, 0.760544441589122, 0.77730758952685)), .Names = c('lowerNorm', 'upperNorm', 'lowerNormS', 'upperNorms'), row.names = c(NA, -19L), class = 'data.frame'), 3);do.call('round', argv) lowerNorm upperNorm lowerNormS upperNorms 1 1.000 1.000 0.911 1.000 2 0.707 1.000 0.683 0.997 3 0.704 1.000 0.680 1.000 4 0.634 0.980 0.614 0.970 5 0.629 0.984 0.610 0.975 6 0.559 0.947 0.544 0.938 7 0.554 0.952 0.538 0.943 8 0.548 0.958 0.533 0.949 9 0.470 0.910 0.460 0.903 10 0.398 0.857 0.391 0.852 11 0.391 0.864 0.384 0.859 12 0.383 0.872 0.376 0.867 13 0.374 0.881 0.367 0.875 14 0.277 0.799 0.275 0.797 15 0.186 0.710 0.189 0.713 16 0.176 0.720 0.179 0.722 17 0.153 0.744 0.155 0.746 18 0.138 0.758 0.141 0.761 19 0.122 0.775 0.124 0.777 ##com.oracle.truffle.r.test.builtins.TestBuiltin_row.testArgsCasts# #.Internal(row('str')) Error: a matrix-like object is required as argument to 'row' In addition: Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_row.testrow1# #argv <- list(c(14L, 14L)); .Internal(row(argv[[1]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [1,] 1 1 1 1 1 1 1 1 1 1 1 1 1 [2,] 2 2 2 2 2 2 2 2 2 2 2 2 2 [3,] 3 3 3 3 3 3 3 3 3 3 3 3 3 [4,] 4 4 4 4 4 4 4 4 4 4 4 4 4 [5,] 5 5 5 5 5 5 5 5 5 5 5 5 5 [6,] 6 6 6 6 6 6 6 6 6 6 6 6 6 [7,] 7 7 7 7 7 7 7 7 7 7 7 7 7 [8,] 8 8 8 8 8 8 8 8 8 8 8 8 8 [9,] 9 9 9 9 9 9 9 9 9 9 9 9 9 [10,] 10 10 10 10 10 10 10 10 10 10 10 10 10 [11,] 11 11 11 11 11 11 11 11 11 11 11 11 11 [12,] 12 12 12 12 12 12 12 12 12 12 12 12 12 [13,] 13 13 13 13 13 13 13 13 13 13 13 13 13 [14,] 14 14 14 14 14 14 14 14 14 14 14 14 14 [,14] [1,] 1 [2,] 2 [3,] 3 [4,] 4 [5,] 5 [6,] 6 [7,] 7 [8,] 8 [9,] 9 [10,] 10 [11,] 11 [12,] 12 [13,] 13 [14,] 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_row.testrow2# #argv <- list(c(4L, 3L)); .Internal(row(argv[[1]])) [,1] [,2] [,3] [1,] 1 1 1 [2,] 2 2 2 [3,] 3 3 3 [4,] 4 4 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_row.testrow3# #argv <- list(0:1); .Internal(row(argv[[1]])) [,1] ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{ m <- matrix(1:6, nrow=2) ; rowMeans(x = m, na.rm = TRUE) } [1] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{ m <- matrix(c(1,2,3,4,5,6), nrow=2) ; rowMeans(m) } [1] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{ m <- matrix(c(NA,2,3,4,NA,6), nrow=2) ; rowMeans(m, na.rm = TRUE) } [1] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{ rowMeans(matrix((1:6)*(1+1i), nrow=2)) } [1] 3+3i 4+4i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{ rowMeans(matrix(as.complex(1:6), nrow=2)) } [1] 3+0i 4+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(NA,NA,NA),TRUE)} Error in matrix(NA, NA, NA) : invalid 'nrow' value (too large or NA) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(3+2i,4+5i,2+0i,5+10i)))} [1] 3+ 2i 4+ 5i 2+ 0i 5+10i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(3,4,2,5)))} [1] 3 4 2 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(3,4,NaN,5),ncol=2,nrow=2), na.rm = FALSE)} [1] NaN 4.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(3,4,NaN,5),ncol=2,nrow=2), na.rm = TRUE)} [1] 3.0 4.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(3L,4L,2L,5L)))} [1] 3 4 2 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(3L,NA,2L,5L),ncol=2,nrow=2), na.rm = FALSE)} [1] 2.5 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(3L,NA,2L,5L),ncol=2,nrow=2), na.rm = TRUE)} [1] 2.5 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(3L,NaN,2L,5L),ncol=2,nrow=2), na.rm = FALSE)} [1] 2.5 NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(3L,NaN,2L,5L),ncol=2,nrow=2), na.rm = TRUE)} [1] 2.5 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(NA,NaN,NaN,NA),ncol=2,nrow=2))} [1] NA NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(NaN,4+5i,2+0i,5+10i),nrow=2,ncol=2), na.rm = FALSE)} [1] NaN+0.0i 4.5+7.5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(NaN,4+5i,2+0i,5+10i),nrow=2,ncol=2), na.rm = TRUE)} [1] 2.0+0.0i 4.5+7.5i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(TRUE,FALSE,FALSE,NA),nrow=2,ncol=2), na.rm = FALSE)} [1] 0.5 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(TRUE,FALSE,FALSE,NA),nrow=2,ncol=2), na.rm = TRUE)} [1] 0.5 0.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(TRUE,FALSE,FALSE,NaN),nrow=2,ncol=2), na.rm = FALSE)} [1] 0.5 NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(TRUE,FALSE,FALSE,NaN),nrow=2,ncol=2), na.rm = TRUE)} [1] 0.5 0.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{rowMeans(matrix(c(TRUE,FALSE,FALSE,TRUE)))} [1] 1 0 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testRowMeans# #{x<-matrix(c("1","2","3","4"),ncol=2);rowMeans(x)} Error in rowMeans(x) : 'x' must be numeric ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testrowMeans1# #argv <- list(structure(c(3, 3, NA, 3, 3, 3, 3, 3, 4, 3, NA, NA, 2, 3, 4, 5), .Dim = c(8L, 2L), .Dimnames = list(NULL, c('x1', 'x2'))), 8, 2, TRUE); .Internal(rowMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 3.5 3.0 NaN 3.0 2.5 3.0 3.5 4.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testrowMeans2# #argv <- list(structure(c(50.7138381326659, 6.51590327164277, 24.9887625571708, 6.50401666172534, 16.6227411608333, 24.2873904534041, 56.036205319809, 9.42637482307856, 6.7207351702689e-16, 6.51590327164276, 106.05353593478, 13.0563348605106, 29.556736958112, 26.535297847233, 83.1597312749807, 86.1180411620546, 4.28836475146602, 3.05748120025494e-16, 24.9887625571708, 13.0563348605107, 382.901882167719, 28.709795659465, 7.19910301202793, 51.849911207061, 76.6652389324741, 13.4232601222667, 9.57039987233639e-16, 6.50401666172536, 29.556736958112, 28.709795659465, 286.290790661071, 29.5533327979648, 105.611010510127, 106.256264404531, 22.4644024278478, 1.60164752950704e-15, 16.6227411608333, 26.535297847233, 7.19910301202793, 29.5533327979648, 611.022025519874, 52.7749434153259, 19.5698513619914, 23.9507376116895, 1.70761896956049e-15, 24.2873904534041, 83.1597312749807, 51.849911207061, 105.611010510127, 52.7749434153259, 736.165134132116, 133.440685552903, 91.9053353168322, 6.55258708668096e-15, 56.036205319809, 86.1180411620546, 76.6652389324741, 106.256264404531, 19.5698513619915, 133.440685552903, 1401.55449200362, 107.582093653927, 7.67029504004995e-15, 9.42637482307856, 4.28836475146602, 13.4232601222667, 22.4644024278478, 23.9507376116895, 91.9053353168321, 107.582093653927, 57.6052682140803, 4.10709057665822e-15, 6.7207351702689e-16, 3.05748120025493e-16, 9.57039987233639e-16, 1.60164752950703e-15, 1.70761896956049e-15, 6.55258708668095e-15, 7.67029504004995e-15, 4.10709057665822e-15, 2.92823790737107e-31), .Dim = c(9L, 9L)), 9, 9, FALSE); .Internal(rowMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 2.167725e+01 3.947599e+01 6.653270e+01 6.832737e+01 8.746978e+01 [6] 1.421327e+02 2.208025e+02 3.673843e+01 2.619345e-15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowMeans.testrowMeans3# #argv <- list(structure(c(2, 2, NA, 2, 2, 2, 2, 2, -5, -5, NA, NA, -5, -5, -5, -5), .Dim = c(8L, 2L), .Dimnames = list(NULL, c('x1', 'x2'))), 8, 2, TRUE); .Internal(rowMeans(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] -1.5 -1.5 NaN 2.0 -1.5 -1.5 -1.5 -1.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ a = rowSums(array(1:24,c(2,3,4))); c(a[1],a[2]) } [1] 144 156 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ a = rowSums(array(1:24,c(2,3,4))); is.null(dim(a)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ a = rowSums(array(1:24,c(2,3,4))); length(a) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ a = rowSums(matrix(1:12,3,4)); c(a[1],a[2],a[3]) } [1] 22 26 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ a = rowSums(matrix(1:12,3,4)); is.null(dim(a)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ a = rowSums(matrix(1:12,3,4)); length(a) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ m <- matrix(1:6, nrow=2) ; rowSums(x = m) } [1] 9 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ m <- matrix(c(1,2,3,4,5,6), nrow=2) ; rowSums(m) } [1] 9 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ m <- matrix(c(NA,2,3,4,NA,6), nrow=2) ; rowSums(m) } [1] NA 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ m <- matrix(c(NA,2,3,4,NA,6), nrow=2) ; rowSums(m, na.rm = TRUE) } [1] 3 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ rowSums(matrix((1:6)*(1+1i), nrow=2)) } [1] 9+ 9i 12+12i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{ rowSums(matrix(as.complex(1:6), nrow=2)) } [1] 9+0i 12+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{rowSums(matrix(c(3+2i,4+5i,2+0i,5+10i)))} [1] 3+ 2i 4+ 5i 2+ 0i 5+10i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{rowSums(matrix(c(NA,NaN,NaN,NA),ncol=2,nrow=2))} [1] NA NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{rowSums(matrix(c(NaN,4+5i,2+0i,5+10i),nrow=2,ncol=2), na.rm = TRUE)} [1] 2+ 0i 9+15i ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{rowSums(matrix(c(TRUE,FALSE,FALSE,NA),nrow=2,ncol=2), na.rm = FALSE)} [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{rowSums(matrix(c(TRUE,FALSE,FALSE,NA),nrow=2,ncol=2), na.rm = TRUE)} [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{rowSums(matrix(c(TRUE,FALSE,FALSE,NaN),nrow=2,ncol=2), na.rm = FALSE)} [1] 1 NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{rowSums(matrix(c(TRUE,FALSE,FALSE,NaN),nrow=2,ncol=2), na.rm = TRUE)} [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{x<-cbind(1:3, 4:6, 7:9); rowSums(x)} [1] 12 15 18 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{x<-cbind(1:3, NA, 7:9); rowSums(x)} [1] NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{x<-cbind(1:3, NaN, 7:9); rowSums(x)} [1] NaN NaN NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{x<-cbind(1:3, NaN, 7:9, 10:12); rowSums(x, na.rm=TRUE)} [1] 18 21 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{x<-cbind(1:4, NA, NaN, 9:12); rowSums(x, na.rm=TRUE)} [1] 10 12 14 16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{x<-cbind(2L:10L,3L); rowSums(x)} [1] 5 6 7 8 9 10 11 12 13 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testRowSums# #{x<-matrix(c("1","2","3","4"),ncol=2);rowSums(x)} Error in rowSums(x) : 'x' must be numeric ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testrowSums1# #argv <- list(structure(c(1L, 0L, 0L, 0L, 2L, 0L, 0L, 0L, 3L), .Dim = c(3L, 3L)), 3, 3, FALSE); .Internal(rowSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testrowSums2# #argv <- list(structure(c(0.999999999999996, -5.93240323105314e-31, -1.22690013807617e-30, -2.66771163434776e-30, 6.26446113912225e-17, -5.95448228496283e-17, -3.41105197331973e-17, 2.9023639112071e-17, -1.98544126594555e-18, 5.0222594521389e-17, -2.11849144310153e-17, 1.78452635853509e-17, -6.4482597529713e-30, -5.93240323105314e-31, 1, -2.70177878542148e-31, 4.10223078154481e-30, -7.29760565072095e-17, 4.21528303119361e-16, 1.69346505683726e-16, -8.46179388945247e-17, -2.12579366024309e-17, -1.08608258515243e-16, -1.91006916081825e-17, -1.09544412010741e-16, 1.52841800386571e-30, -1.22690013807617e-30, -2.70177878542148e-31, 1, 5.63751592936848e-30, 4.44597451723816e-17, -1.70262938021701e-16, -4.55196812407612e-17, 1.77744051006272e-17, -5.96596846288922e-17, 9.58999363873063e-17, -5.74900426053008e-17, 1.14815157965335e-16, -3.6669706141133e-30, -2.66771163434776e-30, 4.10223078154481e-30, 5.63751592936848e-30, 1, -5.9187048613625e-18, -1.70068399080916e-16, -6.90189597604163e-18, -6.36439216662415e-19, -4.18657854049523e-19, 3.0354538418548e-17, -7.42749951284567e-18, -8.90495022022045e-18, 1.55306990715387e-30, 6.26446113912225e-17, -7.29760565072095e-17, 4.44597451723816e-17, -5.9187048613625e-18, 0.55411820856073, -0.00247216583270833, -0.0121967562426746, -0.0136834443420207, 0.00612437416936414, -0.00919613834986896, -0.017907465564047, 0.0210800496836485, 0, -5.95448228496283e-17, 4.21528303119361e-16, -1.70262938021701e-16, -1.70068399080916e-16, -0.00247216583270833, 0.0915588872840349, 0.00402469784261988, 0.0225004116141538, 0.00428277377776577, 0.0217395090957974, 0.00506691575079725, -0.155787004553276, -1.57863385792422e-15, -3.41105197331973e-17, 1.69346505683726e-16, -4.55196812407612e-17, -6.90189597604163e-18, -0.0121967562426746, 0.00402469784261988, 0.00831687169973403, 0.00905869237132552, 0.00121203034126938, 0.00939616211925082, 0.00270063068023987, -0.0350427136160765, 1.66845523703974e-15, 2.9023639112071e-17, -8.46179388945247e-17, 1.77744051006272e-17, -6.36439216662415e-19, -0.0136834443420207, 0.0225004116141538, 0.00905869237132552, 0.0237646346509256, 0.0107094040391417, 0.0632843775518589, 0.0165995956409034, -0.317638195769953, 3.75582594532732e-16, -1.98544126594555e-18, -2.12579366024309e-17, -5.96596846288922e-17, -4.18657854049523e-19, 0.00612437416936414, 0.00428277377776577, 0.00121203034126938, 0.0107094040391417, 0.000250414165674235, 0.0118733901248423, 0.0032448838873885, -0.0719898325072222, -4.32029144045995e-15, 5.0222594521389e-17, -1.08608258515243e-16, 9.58999363873063e-17, 3.0354538418548e-17, -0.00919613834986896, 0.0217395090957974, 0.00939616211925082, 0.0632843775518589, 0.0118733901248423, 0.0578950164197554, 0.0182925914744869, -0.367565522079614, -1.23944977824402e-15, -2.11849144310153e-17, -1.91006916081825e-17, -5.74900426053008e-17, -7.42749951284567e-18, -0.017907465564047, 0.00506691575079725, 0.00270063068023987, 0.0165995956409034, 0.0032448838873885, 0.0182925914744869, 0.00349919192597366, -0.0788502030216034, 0, 1.78452635853509e-17, -1.09544412010741e-16, 1.14815157965335e-16, -8.90495022022045e-18, 0.0210800496836485, -0.155787004553276, -0.0350427136160765, -0.317638195769953, -0.0719898325072222, -0.367565522079614, -0.0788502030216034, 2.49598569418347, -8.69223914290117e-16, -6.4482597529713e-30, 1.52841800386571e-30, -3.6669706141133e-30, 1.55306990715387e-30, 0, -1.57863385792422e-15, 1.66845523703974e-15, 3.75582594532732e-16, -4.32029144045995e-15, -1.23944977824402e-15, 0, -8.69223914290117e-16, 1), .Dim = c(13L, 13L), .Dimnames = list(c('(Intercept)', 'fac2', 'fac3', 'fac4', '', '', '', '', '', '', '', '', ''), NULL)), 13, 13, FALSE); .Internal(rowSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1.000000000 1.000000000 1.000000000 1.000000000 0.525866662 [6] -0.009085975 -0.012530385 -0.185404524 -0.034292562 -0.194280614 [11] -0.047353859 1.490192272 1.000000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testrowSums3# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Dim = c(16L, 16L), .Dimnames = list(NULL, NULL)), 16, 16, TRUE); .Internal(rowSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 3 2 1 1 3 2 1 1 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testrowSums4# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, NA, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, NA, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(16L, 16L), .Dimnames = list(NULL, NULL)), 16, 16, FALSE); .Internal(rowSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] NA 1 0 0 NA 2 1 1 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testrowSums5# #argv <- list(structure(numeric(0), .Dim = c(0L, 3L), .Dimnames = list(NULL, c('wt.loss', 'age', 'I(age)'))), 0, 3, FALSE); .Internal(rowSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testrowSums6# #argv <- list(structure(c(1L, 0L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 1L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), .Dim = c(61L, 4L), .Dimnames = list(c('190', '191', '192', '193', '194', '195', '196', '197', '198', '199', '200', '201', '202', '203', '204', '205', '206', '207', '208', '209', '210', '211', '212', '213', '214', '215', '216', '217', '218', '219', '220', '221', '222', '223', '224', '225', '226', '227', '228', '229', '230', '231', '232', '233', '234', '235', '236', '237', '238', '239', '240', '241', '242', '243', '244', '245', '246', '247', '248', '249', '250'), NULL)), 61, 4, FALSE); .Internal(rowSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 [39] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testrowSums7# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, NA, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, NA, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(16L, 16L), .Dimnames = list(NULL, NULL)), 16, 16, TRUE); .Internal(rowSums(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 1 0 0 2 2 1 1 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowSums.testrowSums9# #argv <- structure(list(x = structure(numeric(0), .Dim = c(0L, 2L))), .Names = 'x');do.call('rowSums', argv) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_rownames.testrownames1# #argv <- structure(list(x = structure(list(x = 1:3, y = c(6.28318530717959, 3.14159265358979, 0)), .Names = c('x', 'y'), row.names = c(NA, -3L), class = 'data.frame')), .Names = 'x');do.call('row.names', argv) [1] "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rownames.testrownames2# #argv <- structure(list(x = structure(logical(0), .Dim = c(4L, 0L)), do.NULL = FALSE), .Names = c('x', 'do.NULL'));do.call('rownames', argv) [1] "row1" "row2" "row3" "row4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rownames.testrownames3# #argv <- structure(list(x = structure(list(x = 3:4), .Names = 'x', row.names = c(NA, -2L), class = 'data.frame')), .Names = 'x');do.call('rownames', argv) [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rownamesdataframe.testrownamesdataframe1# #argv <- structure(list(x = structure(list(x = 3:4), .Names = 'x', row.names = c(NA, -2L), class = 'data.frame')), .Names = 'x');do.call('row.names.data.frame', argv) [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testRowsumArgCoverage# #if (!any(R.version$engine == "FastR")) { cat("Error: invalid 'g' argument\n") } else { x <- matrix(1:10, ncol=2); g <- c(1,2,3,2,1); ug <-unique(g); .Internal(rowsum_matrix(x, NULL, ug, FALSE,as.character(ug))) } Error: invalid 'g' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testRowsumArgCoverage# #if (!any(R.version$engine == "FastR")) { cat("Error: invalid 'g' argument\n") } else { x <- matrix(1:10, ncol=2); g <- c(1,2,3,2,1); ug <-unique(g); .Internal(rowsum_matrix(x, print, ug, FALSE, as.character(ug))); } Error: invalid 'g' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testRowsumArgCoverage#Output.IgnoreErrorMessage# #x <- matrix(1:10, ncol=2); g <- c(1,2,3,2,1); ug <-unique(g); .Internal(rowsum_matrix(x, , ug, FALSE,as.character(ug))) Error in .Internal(rowsum_matrix(x, , ug, FALSE, as.character(ug))) : argument 2 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testRowsumArgCoverage#Output.IgnoreErrorMessage# #x <- matrix(1:10, ncol=2); g <- c(1,2,3,2,1); ug <-unique(g); .Internal(rowsum_matrix(x, g, , FALSE,as.character(ug))) Error in .Internal(rowsum_matrix(x, g, , FALSE, as.character(ug))) : argument 3 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testRowsumArgCoverage#Output.IgnoreErrorMessage# #x <- matrix(1:10, ncol=2); g <- c(1,2,3,2,1); ug <-unique(g); .Internal(rowsum_matrix(x, g, NULL, FALSE,as.character(ug))) Error: unimplemented type 'NULL' in 'HashTableSetup' ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testRowsumArgCoverage#Output.IgnoreErrorMessage# #x <- matrix(1:10, ncol=2); g <- c(1,2,3,2,1); ug <-unique(g); .Internal(rowsum_matrix(x, g, print, FALSE, as.character(ug))) Error: unimplemented type 'closure' in 'HashTableSetup' ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testRowsumArgCoverage# #x <- matrix(1:10, ncol=2); g <- c(1,2,3,2,1); ug <-unique(g); .Internal(rowsum_matrix(x, g, ug, FALSE, as.character(ug))) [,1] [,2] 1 6 16 2 6 16 3 3 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testrowsum1# #argv <- list(structure(1:12, .Dim = 3:4), c('Y', 'X', 'Y'), c('X', 'Y'), FALSE, c('X', 'Y')); .Internal(rowsum_matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [,1] [,2] [,3] [,4] X 2 5 8 11 Y 4 10 16 22 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testrowsum2# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2.83678930089809, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0.807183221448213, 0, 0, 0, 0, 0, 0, 0, 2.28512598329689, 0, 2.63247834995855, 0, 2.20238351041917, 0, 0.769295244943351, 0, 0, 0, 0, 0, 2.39247868547682, 2.35872046276927, 0, 1.96863683476113, 1.77908247814048, 0, 0, 0, 1.30635392456315, 0, 1.90387659717817, 0, 0.869405556702986, 1.81335102661978, 2.03683243726846, 0, 0.594853387563489, 0, 0, 0.546043346519582, 2.43847447982989, 0, 0, 2.01202685781755, 0, 2.67064226802904, 2.9177625705488, 0.566296850563958, 0, 1.07001449051313, 1.02747153153177, 0, 1.14719850081019, 2.56380862975493, 0.760732567403466, 0.778199262684211, 0, 0.871444851625711, 2.75724254851229, 1.6366914055543, 0.606628090143204, 1.09201998403296, 0.729518678388558, 2.26406822516583, 2.41699231159873, 1.90058654651511), .Names = c('7', '8', '12', '13', '19', '22', '26', '31', '34', '36', '38', '40', '42', '43', '44', '46', '50', '51', '57', '59', '60', '61', '64', '67', '68', '72', '75', '76', '77', '78', '84', '87', '89', '94', '95', '100', '101', '102', '107', '110', '114', '115', '122', '123', '129', '130', '131', '134', '136', '137', '141', '144', '146', '150', '153', '154', '157', '160', '161', '162', '166', '167', '172', '174', '176', '178', '179', '180', '183', '184', '185', '186', '187', '197', '199', '201', '203', '204', '205', '207', '208', '210', '211', '214', '217', '219', '220', '222', '226', '228')), structure(c(310, 361, 654, 728, 61, 81, 520, 473, 107, 122, 965, 731, 153, 433, 145, 95, 765, 735, 5, 687, 345, 444, 60, 208, 821, 305, 226, 426, 705, 363, 167, 641, 740, 245, 588, 166, 559, 450, 529, 351, 201, 524, 199, 550, 551, 543, 293, 511, 511, 371, 201, 62, 356, 340, 315, 182, 364, 376, 384, 268, 266, 194, 348, 382, 296, 186, 145, 269, 350, 272, 292, 332, 285, 243, 276, 79, 240, 202, 235, 224, 239, 173, 252, 92, 192, 211, 175, 203, 105, 177), .Names = c('7', '8', '12', '13', '19', '22', '26', '31', '34', '36', '38', '40', '42', '43', '44', '46', '50', '51', '57', '59', '60', '61', '64', '67', '68', '72', '75', '76', '77', '78', '84', '87', '89', '94', '95', '100', '101', '102', '107', '110', '114', '115', '122', '123', '129', '130', '131', '134', '136', '137', '141', '144', '146', '150', '153', '154', '157', '160', '161', '162', '166', '167', '172', '174', '176', '178', '179', '180', '183', '184', '185', '186', '187', '197', '199', '201', '203', '204', '205', '207', '208', '210', '211', '214', '217', '219', '220', '222', '226', '228')), c(5, 60, 61, 62, 79, 81, 92, 95, 105, 107, 122, 145, 153, 166, 167, 173, 175, 177, 182, 186, 192, 194, 199, 201, 202, 203, 208, 211, 224, 226, 235, 239, 240, 243, 245, 252, 266, 268, 269, 272, 276, 285, 292, 293, 296, 305, 310, 315, 332, 340, 345, 348, 350, 351, 356, 361, 363, 364, 371, 376, 382, 384, 426, 433, 444, 450, 473, 511, 520, 524, 529, 543, 550, 551, 559, 588, 641, 654, 687, 705, 728, 731, 735, 740, 765, 821, 965), FALSE, c('5', '60', '61', '62', '79', '81', '92', '95', '105', '107', '122', '145', '153', '166', '167', '173', '175', '177', '182', '186', '192', '194', '199', '201', '202', '203', '208', '211', '224', '226', '235', '239', '240', '243', '245', '252', '266', '268', '269', '272', '276', '285', '292', '293', '296', '305', '310', '315', '332', '340', '345', '348', '350', '351', '356', '361', '363', '364', '371', '376', '382', '384', '426', '433', '444', '450', '473', '511', '520', '524', '529', '543', '550', '551', '559', '588', '641', '654', '687', '705', '728', '731', '735', '740', '765', '821', '965')); .Internal(rowsum_matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [,1] 5 0.0000000 60 0.0000000 61 0.0000000 62 0.0000000 79 0.0000000 81 0.0000000 92 1.6366914 95 0.0000000 105 2.4169923 107 0.0000000 122 0.0000000 145 0.0000000 153 0.0000000 166 0.0000000 167 0.0000000 173 0.8714449 175 0.7295187 177 1.9005865 182 0.0000000 186 0.0000000 192 0.6066281 194 0.0000000 199 0.0000000 201 0.0000000 202 2.5638086 203 2.2640682 208 0.0000000 211 1.0920200 224 0.7781993 226 0.0000000 235 0.7607326 239 0.0000000 240 1.1471985 243 1.0700145 245 0.0000000 252 2.7572425 266 0.5948534 268 0.0000000 269 2.0120269 272 2.6706423 276 1.0274715 285 0.0000000 292 2.9177626 293 0.0000000 296 2.4384745 305 0.0000000 310 0.0000000 315 1.9038766 332 0.5662969 340 0.0000000 345 0.0000000 348 0.0000000 350 0.0000000 351 0.0000000 356 1.3063539 361 0.0000000 363 0.0000000 364 0.8694056 371 0.0000000 376 1.8133510 382 0.5460433 384 2.0368324 426 0.0000000 433 0.0000000 444 0.0000000 450 0.0000000 473 0.0000000 511 3.7477193 520 0.0000000 524 0.0000000 529 0.7692952 543 2.3587205 550 0.0000000 551 2.3924787 559 2.2023835 588 2.6324783 641 0.0000000 654 0.0000000 687 0.0000000 705 0.0000000 728 0.0000000 731 0.0000000 735 0.0000000 740 2.2851260 765 0.0000000 821 0.8071832 965 2.8367893 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testrowsum3# #argv <- list(numeric(0), numeric(0), numeric(0), FALSE, character(0)); .Internal(rowsum_matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [,1] ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testrowsum4# #argv <- list(structure(c(0.432389384893196, 2.31273022636069, 0, 2.31273022636069, 0.432389384893196, 0), .Names = c('1', '3', '4', '5', '6', '7')), structure(c(9, 1, 1, 6, 6, 8), .Names = c('1', '3', '4', '5', '6', '7')), c(1, 6, 8, 9), FALSE, c('1', '6', '8', '9')); .Internal(rowsum_matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [,1] 1 2.3127302 6 2.7451196 8 0.0000000 9 0.4323894 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testrowsum5# #argv <- list(structure(c(0.102430555555556, 0.102430555555556, 0.102430555555556, 0.546875, -0.078125, 0.477430555555556, -0.0642361111111111, 0.102430555555556), .Names = c('1', '2', '3', '4', '5', '6', '7', '8')), structure(1:8, .Label = c('1', '2', '3', '4', '5', '6', '7', '8'), class = 'factor'), structure(1:8, .Label = c('1', '2', '3', '4', '5', '6', '7', '8'), class = 'factor'), FALSE, c('1', '2', '3', '4', '5', '6', '7', '8')); .Internal(rowsum_matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [,1] 1 0.10243056 2 0.10243056 3 0.10243056 4 0.54687500 5 -0.07812500 6 0.47743056 7 -0.06423611 8 0.10243056 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testrowsum6#Ignored.OutputFormatting# #argv <- list(structure(c(0, 0.719170679378362, -0.280829320621638, 0, -0.43834135875385, 0, -0.0525040127116955, 0.783590877798991, -0.365543432545085, -0.0525040127116955, -0.31303941983339, 0, 0, NA), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14')), c(3, 3, 4, 5, 5, 6, 6, 6, 7, 1, 1, 1, 1, 2), c(1, 2, 3, 4, 5, 6, 7), FALSE, c('1', '2', '3', '4', '5', '6', '7')); .Internal(rowsum_matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [,1] 1 -0.3655434 2 NA 3 0.7191707 4 -0.2808293 5 -0.4383414 6 0.7310869 7 -0.3655434 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testrowsum7# #argv <- list(structure(c(0.10270237599789, 2.6083215370191, 11.0196744330572, 2.6083215370191, 0.10270237599789, 0.10270237599789, 0.10270237599789, -0.441795512568419, 2.6083215370191, 0.10270237599789, -0.441795512568419), .Dim = c(11L, 1L), .Dimnames = list(c('11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21'), 'x')), structure(c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11), .Names = c('11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21')), c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11), FALSE, c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11')); .Internal(rowsum_matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) x 1 0.1027024 2 2.6083215 3 11.0196744 4 2.6083215 5 0.1027024 6 0.1027024 7 0.1027024 8 -0.4417955 9 2.6083215 10 0.1027024 11 -0.4417955 ##com.oracle.truffle.r.test.builtins.TestBuiltin_rowsum.testrowsum8# #argv <- list(structure(c(1.33333333333333, -1.33333333333333, 1, 1.33333333333333, -2, 0.666666666666667, -0.666666666666667, 0.666666666666667, -0.666666666666667), .Dim = c(9L, 1L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9'), 'x')), structure(c(1, 1, 2, 2, 2, 2, 3, 4, 5), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9')), c(1, 2, 3, 4, 5), FALSE, c('1', '2', '3', '4', '5')); .Internal(rowsum_matrix(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) x 1 0.0000000 2 1.0000000 3 -0.6666667 4 0.6666667 5 -0.6666667 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sQuote.testsQuote1# #argv <- structure(list(x = character(0)), .Names = 'x');do.call('sQuote', argv) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts#Output.IgnoreErrorMessage# #set.seed(42); .Internal(sample(1/0, 1, FALSE, NULL)) Error: invalid first argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); .Internal(sample(4.5e20, 4.5e20, FALSE, NULL)) Error: vector size specified is too large ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts#Output.IgnoreErrorMessage# #set.seed(42); .Internal(sample(5,6,T,)) Error in .Internal(sample(5, 6, T, )) : argument 4 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); .Internal(sample(5,6,T,NULL)) [1] 1 5 1 1 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts#Output.IgnoreErrorMessage# #set.seed(42); .Internal(sample(5,6,T,seq(1.2,3))) Error: incorrect number of probabilities ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); .Internal(sample(NA, NA, FALSE, NULL)) Error: invalid first argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); .Internal(sample(NULL, NULL, F, NULL)) Error: invalid first argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); .Internal(sample(NULL, NULL, F, seq(1.2,3))) Error: invalid first argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); .Internal(sample(NaN, NaN, FALSE, NULL)) Error: vector size cannot be NA/NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(-1) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(0, 0) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(2, 0) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(3, '2') [1] 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(3, -3) Error in sample.int(x, size, replace, prob) : invalid 'size' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(3, 2.0) [1] 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(3, NA) Error in sample.int(x, size, replace, prob) : invalid 'size' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(3, TRUE) Error in sample.int(x, size, replace, prob) : invalid 'size' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(3, c(2,3)) [1] 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(4, prob=c(-1,1,1,2)) Error in sample.int(x, size, replace, prob) : negative probability ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(4, prob=c(1,2)) Error in sample.int(x, size, replace, prob) : incorrect number of probabilities ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts#Output.IgnoreErrorMessage# #set.seed(42); sample(4, replace='s') Error in !replace : invalid argument type ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(4, replace=1) [1] 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(4, replace=1.2) [1] 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testArgsCasts# #set.seed(42); sample(4, replace=c(T,F)) Error in sample.int(x, size, replace, prob) : invalid 'replace' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(4357, "default"); x <- 5 ; sample(x, 5, FALSE, NULL) ;} [1] 1 4 2 5 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(4357, "default"); x <- 5 ; sample(x, 5, TRUE, NULL) ;} [1] 1 4 2 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(4357, "default"); x <- c(5, "cat"); sample(x, 2, TRUE, NULL) ;} [1] "5" "cat" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(4357, "default"); x <- 5 ; prob <- c(.1, .2, .3, .2, .1); sample(x, 10, TRUE, prob) ; } [1] 2 5 5 4 2 5 1 2 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(4357, "default"); x <- 5 ; prob <- c(.2, .2, .2, .2, .2 ); sample(x, 5, FALSE, prob) ; } [1] 4 1 5 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(4357, "default"); x <- 5 ; prob <- c(.5, .5, .5, .5, .5); sample(x, 5, FALSE, prob) ; } [1] 4 1 5 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample#Ignored.ImplementationError# #{ set.seed(4357, "default"); x <- 5 ; sample(x, 6, FALSE, NULL) ;} Error in sample.int(x, size, replace, prob) : cannot take a sample larger than the population when 'replace = FALSE' ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(4357, "default"); x <- c("Heads", "Tails"); prob <- c(.3, .7) ; sample(x, 10, TRUE, prob) ; } [1] "Tails" "Heads" "Heads" "Tails" "Tails" "Heads" "Heads" "Tails" "Tails" [10] "Tails" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample#Ignored.ImplementationError# #{ set.seed(4357, "default"); x <- c(5) ; prob <- c(1, 2, 3, 4, 5) ; sample(x, 5, FALSE, prob) ; } [1] 4 2 3 5 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample#Ignored.ImplementationError# #{ set.seed(4357, "default"); x <- c(5) ; prob <- c(1, 2, 3, 4, 5) ; sample(x, 5, TRUE, prob) ; } [1] 4 2 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(4357, "default"); x <- c(5, "cat"); sample(x, 2, FALSE, NULL) ;} [1] "5" "cat" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(4357, "default"); x <- c(5, "cat"); sample(x, 3, TRUE, NULL) ;} [1] "5" "cat" "cat" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(9567, "Marsaglia-Multicarry"); x <- 5 ; prob <- c(.1, .2, .3, .2, .1) ; sample(x, 10, TRUE, prob) ; } [1] 4 3 4 1 3 2 1 5 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(9567, "Marsaglia-Multicarry"); x <- 5 ; prob <- c(.2, .2, .2, .2, .2 ) ; sample(x, 5, FALSE, prob) ; } [1] 5 2 1 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(9567, "Marsaglia-Multicarry"); x <- 5 ; prob <- c(.5, .5, .5, .5, .5) ; sample(x, 5, FALSE, prob) ; } [1] 5 2 1 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample#Ignored.ImplementationError# #{ set.seed(9567, "Marsaglia-Multicarry"); x <- 5 ; sample(x, 6, FALSE, NULL) ;} Error in sample.int(x, size, replace, prob) : cannot take a sample larger than the population when 'replace = FALSE' ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(9567, "Marsaglia-Multicarry"); x <- 5; sample(x, 5, FALSE, NULL) ;} [1] 5 3 2 1 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(9567, "Marsaglia-Multicarry"); x <- 5; sample(x, 5, TRUE, NULL) ;} [1] 5 3 2 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(9567, "Marsaglia-Multicarry"); x <- c(5, "cat") ; sample(x, 2, FALSE, NULL) ;} [1] "5" "cat" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(9567, "Marsaglia-Multicarry"); x <- c(5, "cat") ; sample(x, 2, TRUE, NULL) ;} [1] "5" "5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(9567, "Marsaglia-Multicarry"); x <- c(5, "cat") ; sample(x, 3, TRUE, NULL) ;} [1] "5" "5" "cat" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample# #{ set.seed(9567, "Marsaglia-Multicarry");x <- c("Heads", "Tails") ; prob <- c(.3, .7) ; sample(x, 10, TRUE, prob) ; } [1] "Heads" "Tails" "Tails" "Heads" "Tails" "Tails" "Heads" "Heads" "Heads" [10] "Heads" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample#Ignored.ImplementationError# #{ set.seed(9567, "Marsaglia-Multicarry");x <- c(5) ; prob <- c(1, 2, 3, 4, 5) ; sample(x, 5, FALSE, prob) ; } [1] 3 5 2 1 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testSample#Ignored.ImplementationError# #{ set.seed(9567, "Marsaglia-Multicarry");x <- c(5) ; prob <- c(1, 2, 3, 4, 5) ; sample(x, 5, TRUE, prob) ; } [1] 3 5 3 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testsample1# #argv <- list(0L, 0L, FALSE, NULL); .Internal(sample(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testsample2# #argv <- list(1L, 1L, FALSE, NULL); .Internal(sample(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testsample3# #argv <- list(2L, 499, TRUE, c(0, 0.525)); .Internal(sample(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [38] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [75] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [112] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [149] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [186] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [223] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [260] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [297] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [334] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [371] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [408] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [445] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 [482] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample.testsample5# #argv <- structure(list(x = c(0, 0)), .Names = 'x');do.call('sample', argv) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testArgsCasts# #set.seed(42); .Internal(sample2(-2, 1)) Error: invalid first argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testArgsCasts# #set.seed(42); .Internal(sample2(-2L, 1)) Error: invalid first argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testArgsCasts# #set.seed(42); .Internal(sample2(10, -2)) Error: invalid 'size' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testArgsCasts# #set.seed(42); .Internal(sample2(10, 2.99)) [1] 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testArgsCasts# #set.seed(42); .Internal(sample2(10, 8)) Error: This algorithm is for size <= n/2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testArgsCasts# #set.seed(42); .Internal(sample2(NA, 1)) Error: invalid first argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testArgsCasts# #set.seed(42); .Internal(sample2(NaN, 1)) Error: invalid first argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testSample2# #set.seed(42); .Internal(sample2(10, 2)) [1] 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testSample2# #set.seed(42); .Internal(sample2(10L, 3L)) [1] 1 5 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testSample2# #set.seed(42); .Internal(sample2(4147483647, 10)) [1] 4024715585 2756281572 578398257 1965996056 1097037401 2406606703 [7] 2208523237 1919735301 3483460444 16962874 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testSample2# #set.seed(42); .Internal(sample2(NULL,3)) Error: invalid first argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sample2.testSample2# #set.seed(42); x <- .Internal(sample2(10L, 3L)); y <- .Internal(sample2(10L, 3L)); list(x, y); [[1]] [1] 1 5 9 [[2]] [1] 10 4 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scale.testscale1# #argv <- structure(list(x = structure(c(0.0280387932434678, 0.789736648323014, 0.825624888762832, 0.102816025260836, 0.290661531267688, 0.0517604837659746, 0.610383243998513, 0.78207225818187, 0.136790128657594, 0.8915234063752, 0.0216042066458613, 0.408875584136695, 0.69190051057376, 0.595735886832699, 0.936268283519894, 0.592950375983492, 0.852736486820504, 0.610123937483877, 0.600582004291937, 0.38303488586098, 0.412859325064346, 0.388432375853881, 0.457582515198737, 0.701614629011601, 0.449137942166999, 0.533179924823344, 0.317685069283471, 0.800954289967194, 0.0273033923003823, 0.496913943905383, 0.903582146391273, 0.725298138801008, 0.616459952667356, 0.341360273305327, 0.0613401387818158, 0.7339238144923, 0.720672776456922, 0.214702291414142, 0.283225567312911, 0.515186718199402, 0.558621872216463, 0.770191126968712, 0.959201833466068, 0.80451478343457, 0.307586128590629, 0.902739278972149, 0.992322677979246, 0.167487781029195, 0.796250741928816, 0.549091263208538, 0.0876540709286928, 0.424049312015995, 0.573274190537632, 0.763274750672281, 0.405174027662724, 0.828049632022157, 0.128607030957937, 0.479592794785276, 0.631105397362262, 0.406053610146046, 0.661386628635228, 0.958720558788627, 0.576542558381334, 0.0483133427333087, 0.615997062064707, 0.341076754732057, 0.901286069769412, 0.521056747529656, 0.92834516079165, 0.228773980634287, 0.458389508537948, 0.987496873131022, 0.0315267851110548, 0.872887850506231, 0.59517983533442, 0.935472247190773, 0.145392092177644, 0.255368477664888, 0.322336541488767, 0.507066876627505, 0.0745627176947892, 0.0313172969035804, 0.499229126842692, 0.868204665370286, 0.232835006900132, 0.422810809221119, 0.803322346881032, 0.00151223805733025, 0.175151102710515, 0.469289294909686), .Dim = c(10L, 9L))), .Names = 'x');do.call('scale', argv) [,1] [,2] [,3] [,4] [,5] [,6] [1,] -1.1738646 -2.13161362 -0.21782465 1.43089487 -0.4395136 -1.59570778 [2,] 0.9404083 -0.62458991 -0.33423548 0.78012666 0.3215637 -0.20155843 [3,] 1.0400247 0.47677028 -0.00468859 0.38284800 1.0014912 0.41688601 [4,] -0.9663027 0.10255628 1.15828845 -0.62131457 0.4450360 1.20432033 [5,] -0.4448929 1.42770043 -0.04493266 -1.64343767 -1.3425636 -0.27978476 [6,] -1.1080194 0.09171678 0.35558388 0.81161190 0.7983787 1.47277199 [7,] 0.4425705 1.10264568 -0.67139395 0.76324327 1.1206367 -1.42598319 [8,] 0.9191340 0.15854579 1.63170870 -1.08363865 -1.8465388 0.02863481 [9,] -0.8719995 0.12141441 -2.05525781 -0.83351655 0.4153078 0.65656045 [10,] 1.2229416 -0.72514613 0.18275210 0.01318275 -0.4737980 -0.27613944 [,7] [,8] [,9] [1,] 0.27205090 -0.15718232 -0.9172007 [2,] 1.24385687 1.42026175 -1.0572298 [3,] -0.00525339 -1.42980129 0.4578728 [4,] -1.73171732 1.07857434 1.6526187 [5,] 0.12369968 0.25063489 -0.4047137 [6,] -0.77484963 1.26515913 0.2104296 [7,] 1.05613803 -1.09033114 1.4425292 [8,] -0.18660317 -0.76245516 -1.1537388 [9,] 1.14457794 -0.56280121 -0.5914947 [10,] -1.14189992 -0.01205898 0.3609273 attr(,"scaled:center") [1] 0.4509407 0.5693812 0.4585663 0.5115752 0.6808007 0.4726835 0.5781499 [8] 0.5111117 0.3578235 attr(,"scaled:scale") [1] 0.3602647 0.2569776 0.2098340 0.2739593 0.2779866 0.2412907 0.3059602 [8] 0.3354207 0.3088318 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testArgsCasts#Output.IgnoreErrorContext# #{ con<-textConnection(c("1 2 3", "4 5 6")); .Internal(scan(con, , 2, ' ', '.', '"', 0, 3, "NA", F, F, F, T, T, '', '#', T, 'utf8', F)) } Error in .Internal(scan(con, , 2, " ", ".", "\"", 0, 3, "NA", F, F, F, : argument 2 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testArgsCasts# #{ con<-textConnection(c("1 2 3", "4 5 6")); .Internal(scan(con, 1L, 2, NULL, '.', '"', 0, 3, "NA", F, F, F, T, T, '', '#', T, 'utf8', F)) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testArgsCasts# #{ con<-textConnection(c("1 2 3", "4 5 6")); .Internal(scan(con, NULL, 2, ' ', '.', '"', 0, 3, "NA", F, F, F, T, T, '', '#', T, 'utf8', F)) } Error: invalid 'what' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testArgsCasts# #{ con<-textConnection(c("1 2 3", "4 5 6")); .Internal(scan(con, print, 2, ' ', '.', '"', 0, 3, "NA", F, F, F, T, T, '', '#', T, 'utf8', F)) } Error: invalid 'what' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testArgsCasts# #{ con<-textConnection(c("1.5 2.89 3", "4 5 6")); .Internal(scan(con, 1.2, 2, ' ', NULL, '"', 0, 3, "NA", F, F, F, T, T, '', '#', T, 'utf8', F)) } [1] 1.50 2.89 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testPooling# #if (!any(R.version$engine == "FastR")) { TRUE } else { s <- scan(textConnection(paste0(rep('asdf\n', 1000))), character(0), quiet=T); all(sapply(s, function(x) .fastr.identity(x) == .fastr.identity(s[[1]]))) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testReadCsv# #fileConn<-file('__TestBuiltin_scan_testReadCsvTestFile.cvs'); writeLines(c('n1,n2<<>>v1,"v5, v5"<<>>'), fileConn); m <- read.csv('__TestBuiltin_scan_testReadCsvTestFile.cvs'); m n1 n2 1 v1 v5, v5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #con <- textConnection("A|B|C\n1|2|3\n4|5|6"); read.csv(con, sep="|") A B C 1 1 2 3 2 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #con <- textConnection('%%MatrixMarket matrix coordinate real general'); list(scan(con, nmax = 1, what = character(), quiet = TRUE), scan(con, nmax = 1, what = character(), quiet = TRUE), scan(con, nmax = 1, what = character(), quiet = TRUE), scan(con, nmax = 1, what = character(), quiet = TRUE), scan(con, nmax = 1, what = character(), quiet = TRUE)) [[1]] [1] "%%MatrixMarket" [[2]] [1] "matrix" [[3]] [1] "coordinate" [[4]] [1] "real" [[5]] [1] "general" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #con<-textConnection(c("foo,'bar,bar'")); scan(con, what=list(""), sep=',') Read 2 records [[1]] [1] "foo" "bar,bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #con<-textConnection(c("foo,\"bar,bar\"")); scan(con, what=list(""), sep=',') Read 2 records [[1]] [1] "foo" "bar,bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("'foo'")); scan(con, what=list("")) } Read 1 record [[1]] [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("2 3 5", "", "11 13 17")); scan(con, what=list("")) } Read 6 records [[1]] [1] "2" "3" "5" "11" "13" "17" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("2 3 5", "", "11 13 17")); scan(con, what=list(""), blank.lines.skip=FALSE) } Read 7 records [[1]] [1] "2" "3" "5" "" "11" "13" "17" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("2 3 5", "", "11 13 17")); scan(con, what=list(integer()), blank.lines.skip=FALSE) } Read 7 records [[1]] [1] 2 3 5 NA 11 13 17 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("HEADER", "7 2 3", "4 5 42")); scan(con, skip = 1) } Read 6 items [1] 7 2 3 4 5 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("HEADER", "7 2 3", "4 5 42")); scan(con, skip = 1, nlines = 1) } Read 3 items [1] 7 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("HEADER", "7 2 3", "4 5 42")); scan(con, skip = 1, quiet=TRUE) } [1] 7 2 3 4 5 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("HEADER", "7 2 3", "4 5 42")); scan(con, what = list("","","")) } Read 3 records [[1]] [1] "HEADER" "3" "42" [[2]] [1] "7" "4" "" [[3]] [1] "2" "5" "" Warning message: In scan(con, what = list("", "", "")) : number of items read is not a multiple of the number of columns ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("HEADER", "7 2 3", "4 5 42")); scan(con, what = list("","",""), fill=TRUE) } Read 3 records [[1]] [1] "HEADER" "7" "4" [[2]] [1] "" "2" "5" [[3]] [1] "" "3" "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("HEADER", "7 2 3", "4 5 42")); scan(con, what = list("","",""), fill=TRUE, multi.line=FALSE) } Read 3 records [[1]] [1] "HEADER" "7" "4" [[2]] [1] "" "2" "5" [[3]] [1] "" "3" "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("HEADER", "7 2 3", "4 5 42")); scan(con, what = list("","",""), multi.line=FALSE) } Error in scan(con, what = list("", "", ""), multi.line = FALSE) : line 1 did not have 3 elements ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("TITLE extra line", "2 3 5 7", "11 13 17")); scan(con, skip = 1) } Read 7 items [1] 2 3 5 7 11 13 17 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("TITLE extra line", "2 3 5 7", "11 13 17")); scan(con, skip = 1, nlines = 1) } Read 4 items [1] 2 3 5 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("TITLE extra line", "2 3 5 7", "11 13 17")); scan(con, skip = 1, quiet = TRUE) } [1] 2 3 5 7 11 13 17 ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("TITLE extra line", "2 3 5 7", "11 13 17")); scan(con, what = list("","","")) } Read 4 records [[1]] [1] "TITLE" "2" "7" "17" [[2]] [1] "extra" "3" "11" "" [[3]] [1] "line" "5" "13" "" Warning message: In scan(con, what = list("", "", "")) : number of items read is not a multiple of the number of columns ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("TITLE extra line", "2 3 5 7", "11 13 17")); scan(con, what = list("","",""), flush=TRUE) } Read 3 records [[1]] [1] "TITLE" "2" "11" [[2]] [1] "extra" "3" "13" [[3]] [1] "line" "5" "17" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("\"2\"", "\"11\"")); scan(con, what=list("")) } Read 2 records [[1]] [1] "2" "11" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("bar 'foo'")); scan(con, what=list("")) } Read 2 records [[1]] [1] "bar" "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("bar'foo'")); scan(con, what=list("")) } Read 1 record [[1]] [1] "bar'foo'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("foo faz", "\"bar\" \"baz\"")); scan(con, what=list("", "")) } Read 2 records [[1]] [1] "foo" "bar" [[2]] [1] "faz" "baz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("foo faz", "bar \"baz\"")); scan(con, what=list("", "")) } Read 2 records [[1]] [1] "foo" "bar" [[2]] [1] "faz" "baz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_scan.testScan# #{ con<-textConnection(c("foo, faz", "bar, baz")); scan(con, what=list("", ""), sep=",") } Read 2 records [[1]] [1] "foo" "bar" [[2]] [1] " faz" " baz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep1# #argv <- list(1, 1);`/`(argv[[1]],argv[[2]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep10# #argv <- list(c(0, 9.88131291682493e-324, 1.03753785626662e-322, 1.02271588689138e-321, 1.02320995253722e-320, 1.02330876566639e-319, 1.02329394369701e-318, 1.02329295556572e-317, 1.02329300497229e-316, 1.02329299015032e-315, 1.02329299212658e-314, 1.0232929922748e-313, 1.02329299227974e-312, 1.02329299228073e-311, 1.02329299228073e-310, 1.02329299228073e-309, 1.02329299228073e-308, 1.02329299228073e-307), 1.02329299228075);`/`(argv[[1]],argv[[2]]); [1] 0.000000e+00 9.881313e-324 1.037538e-322 9.980126e-322 9.999889e-321 [6] 1.000038e-319 9.999987e-319 9.999997e-318 1.000000e-316 1.000000e-315 [11] 1.000000e-314 1.000000e-313 1.000000e-312 1.000000e-311 1.000000e-310 [16] 1.000000e-309 1.000000e-308 1.000000e-307 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep11# #argv <- list(structure(c(29.35, 23.32, 23.8, 41.89, 42.19, 31.72, 39.74, 44.75, 46.64, 47.64, 24.42, 46.31, 27.84, 25.06, 23.31, 25.62, 46.05, 47.32, 34.03, 41.31, 31.16, 24.52, 27.01, 41.74, 21.8, 32.54, 25.95, 24.71, 32.61, 45.04, 43.56, 41.18, 44.19, 46.26, 28.96, 31.94, 31.92, 27.74, 21.44, 23.49, 43.42, 46.12, 23.27, 29.81, 46.4, 45.25, 41.12, 28.13, 43.69, 47.2, 2.86999999999999, 4.41, 4.43, 1.67, 0.829999999999999, 2.85, 1.34, 0.669999999999999, 1.06, 1.14, 3.93, 1.19, 2.37, 4.7, 3.35, 3.1, 0.869999999999999, 0.579999999999999, 3.08, 0.959999999999999, 4.19, 3.48, 1.91, 0.909999999999999, 3.73, 2.47, 3.67, 3.25, 3.17, 1.21, 1.2, 1.05, 1.28, 1.12, 2.85, 2.28, 1.52, 2.87, 4.54, 3.73, 1.08, 1.21, 4.46, 3.43, 0.899999999999999, 0.559999999999999, 1.73, 2.72, 2.07, 0.659999999999999, 2329.68000000001, 1507.99, 2108.47, 189.130000000001, 728.470000000001, 2982.88, 662.860000000001, 289.520000000001, 276.650000000001, 471.240000000001, 2496.53, 287.770000000001, 1681.25, 2213.82, 2457.12, 870.85, 289.710000000001, 232.440000000001, 1900.1, 88.940000000001, 1139.95, 1390, 1257.28, 207.680000000001, 2449.39, 601.050000000001, 2231.03, 1740.7, 1487.52, 325.540000000001, 568.560000000001, 220.560000000001, 400.060000000001, 152.010000000001, 579.51, 651.110000000001, 250.960000000001, 768.79, 3299.49, 2630.96, 389.660000000001, 249.870000000001, 1813.93, 4001.89, 813.390000000001, 138.330000000001, 380.470000000001, 766.54, 123.580000000001, 242.690000000001, 2.87000000000001, 3.93, 3.82, 0.219999999999998, 4.56, 2.43, 2.67, 6.51, 3.08, 2.8, 3.99, 2.19, 4.32, 4.52, 3.44, 6.28, 1.48, 3.19, 1.12, 1.54, 2.99, 3.54, 8.21, 5.81, 1.57, 8.12, 3.62, 7.66, 1.76, 2.48, 3.61, 1.03, 0.670000000000002, 2, 7.48, 2.19, 2, 4.35, 3.01, 2.7, 2.96, 1.13, 2.01, 2.45, 0.530000000000004, 5.14, 10.23, 1.88, 16.71, 5.08), .Dim = c(50L, 4L), .Dimnames = list(c('Australia', 'Austria', 'Belgium', 'Bolivia', 'Brazil', 'Canada', 'Chile', 'China', 'Colombia', 'Costa Rica', 'Denmark', 'Ecuador', 'Finland', 'France', 'Germany', 'Greece', 'Guatamala', 'Honduras', 'Iceland', 'India', 'Ireland', 'Italy', 'Japan', 'Korea', 'Luxembourg', 'Malta', 'Norway', 'Netherlands', 'New Zealand', 'Nicaragua', 'Panama', 'Paraguay', 'Peru', 'Philippines', 'Portugal', 'South Africa', 'South Rhodesia', 'Spain', 'Sweden', 'Switzerland', 'Turkey', 'Tunisia', 'United Kingdom', 'United States', 'Venezuela', 'Zambia', 'Jamaica', 'Uruguay', 'Libya', 'Malaysia'), c('pop15', 'pop75', 'dpi', 'ddpi'))), structure(c(29.35, 23.32, 23.8, 41.89, 42.19, 31.72, 39.74, 44.75, 46.64, 47.64, 24.42, 46.31, 27.84, 25.06, 23.31, 25.62, 46.05, 47.32, 34.03, 41.31, 31.16, 24.52, 27.01, 41.74, 21.8, 32.54, 25.95, 24.71, 32.61, 45.04, 43.56, 41.18, 44.19, 46.26, 28.96, 31.94, 31.92, 27.74, 21.44, 23.49, 43.42, 46.12, 23.27, 29.81, 46.4, 45.25, 41.12, 28.13, 43.69, 47.2, 2.87, 4.41, 4.43, 1.67, 0.83, 2.85, 1.34, 0.67, 1.06, 1.14, 3.93, 1.19, 2.37, 4.7, 3.35, 3.1, 0.87, 0.58, 3.08, 0.96, 4.19, 3.48, 1.91, 0.91, 3.73, 2.47, 3.67, 3.25, 3.17, 1.21, 1.2, 1.05, 1.28, 1.12, 2.85, 2.28, 1.52, 2.87, 4.54, 3.73, 1.08, 1.21, 4.46, 3.43, 0.9, 0.56, 1.73, 2.72, 2.07, 0.66, 2329.68, 1507.99, 2108.47, 189.130000000001, 728.470000000001, 2982.88, 662.860000000001, 289.520000000001, 276.650000000001, 471.240000000001, 2496.53, 287.770000000001, 1681.25, 2213.82, 2457.12, 870.85, 289.710000000001, 232.440000000001, 1900.1, 88.9400000000012, 1139.95, 1390, 1257.28, 207.680000000001, 2449.39, 601.050000000001, 2231.03, 1740.7, 1487.52, 325.540000000001, 568.560000000001, 220.560000000001, 400.060000000001, 152.010000000001, 579.51, 651.11, 250.960000000001, 768.79, 3299.49, 2630.96, 389.660000000001, 249.870000000001, 1813.93, 4001.89, 813.390000000001, 138.330000000001, 380.470000000001, 766.54, 123.580000000001, 242.690000000001, 2.87, 3.92999999999999, 3.82, 0.22, 4.56, 2.43, 2.67, 6.51, 3.08, 2.8, 3.99, 2.19, 4.32, 4.52, 3.44, 6.28, 1.48, 3.19, 1.12, 1.54, 2.99, 3.54, 8.21, 5.81, 1.57, 8.12, 3.62, 7.66, 1.76, 2.48, 3.61, 1.03, 0.670000000000002, 2, 7.48, 2.19, 2, 4.35, 3.01, 2.7, 2.96, 1.13, 2.01, 2.45, 0.530000000000002, 5.14, 10.23, 1.88, 16.71, 5.08), .Dim = c(50L, 4L), .Dimnames = list(NULL, c('pop15', 'pop75', 'dpi', 'ddpi'))));`/`(argv[[1]],argv[[2]]); pop15 pop75 dpi ddpi Australia 1 1 1 1 Austria 1 1 1 1 Belgium 1 1 1 1 Bolivia 1 1 1 1 Brazil 1 1 1 1 Canada 1 1 1 1 Chile 1 1 1 1 China 1 1 1 1 Colombia 1 1 1 1 Costa Rica 1 1 1 1 Denmark 1 1 1 1 Ecuador 1 1 1 1 Finland 1 1 1 1 France 1 1 1 1 Germany 1 1 1 1 Greece 1 1 1 1 Guatamala 1 1 1 1 Honduras 1 1 1 1 Iceland 1 1 1 1 India 1 1 1 1 Ireland 1 1 1 1 Italy 1 1 1 1 Japan 1 1 1 1 Korea 1 1 1 1 Luxembourg 1 1 1 1 Malta 1 1 1 1 Norway 1 1 1 1 Netherlands 1 1 1 1 New Zealand 1 1 1 1 Nicaragua 1 1 1 1 Panama 1 1 1 1 Paraguay 1 1 1 1 Peru 1 1 1 1 Philippines 1 1 1 1 Portugal 1 1 1 1 South Africa 1 1 1 1 South Rhodesia 1 1 1 1 Spain 1 1 1 1 Sweden 1 1 1 1 Switzerland 1 1 1 1 Turkey 1 1 1 1 Tunisia 1 1 1 1 United Kingdom 1 1 1 1 United States 1 1 1 1 Venezuela 1 1 1 1 Zambia 1 1 1 1 Jamaica 1 1 1 1 Uruguay 1 1 1 1 Libya 1 1 1 1 Malaysia 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep12# #argv <- list(1, c(6.25, 36, 36, 56.25, 64, 64, 256, 36, 25, 36, 784, 25, 90.25, 36, 20.25, 100, 196, 9, 20.25, 30.25, 9, 12.25, 36, 4, 9, 16, 36, 25, 42.25, 25, 100, 36, 324, 20.25, 400));`/`(argv[[1]],argv[[2]]); [1] 0.160000000 0.027777778 0.027777778 0.017777778 0.015625000 0.015625000 [7] 0.003906250 0.027777778 0.040000000 0.027777778 0.001275510 0.040000000 [13] 0.011080332 0.027777778 0.049382716 0.010000000 0.005102041 0.111111111 [19] 0.049382716 0.033057851 0.111111111 0.081632653 0.027777778 0.250000000 [25] 0.111111111 0.062500000 0.027777778 0.040000000 0.023668639 0.040000000 [31] 0.010000000 0.027777778 0.003086420 0.049382716 0.002500000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep13#Output.IgnoreWarningContext# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'), structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = 'data.frame'));`/`(argv[[1]],argv[[2]]); [1] c0 <0 rows> (or 0-length row.names) Warning message: In Ops.factor(left, right) : ‘/’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep14# #argv <- list(structure(list(A = c(52L, 52L, 47L, 45L, 40L, 37L, 27L, 27L, 23L, 22L, 21L, 25L, 24L, 22L, 22L, 20L, 16L, 17L, 14L, 13L, 13L, 14L, 24L), F = c(42L, 44L, 48L, 49L, 50L, 54L, 58L, 54L, 59L, 59L, 60L, 53L, 54L, 55L, 56L, 58L, 62L, 57L, 54L, 55L, 52L, 47L, 56L), M = c(6L, 4L, 5L, 6L, 10L, 9L, 15L, 19L, 18L, 19L, 19L, 22L, 22L, 23L, 22L, 22L, 22L, 26L, 32L, 32L, 35L, 39L, 20L)), .Names = c('A', 'F', 'M'), class = 'data.frame', row.names = c(NA, 23L)), 100);`/`(argv[[1]],argv[[2]]); A F M 1 0.52 0.42 0.06 2 0.52 0.44 0.04 3 0.47 0.48 0.05 4 0.45 0.49 0.06 5 0.40 0.50 0.10 6 0.37 0.54 0.09 7 0.27 0.58 0.15 8 0.27 0.54 0.19 9 0.23 0.59 0.18 10 0.22 0.59 0.19 11 0.21 0.60 0.19 12 0.25 0.53 0.22 13 0.24 0.54 0.22 14 0.22 0.55 0.23 15 0.22 0.56 0.22 16 0.20 0.58 0.22 17 0.16 0.62 0.22 18 0.17 0.57 0.26 19 0.14 0.54 0.32 20 0.13 0.55 0.32 21 0.13 0.52 0.35 22 0.14 0.47 0.39 23 0.24 0.56 0.20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep15# #argv <- list(c(1, 0), structure(c(1, 0, 0, 1), .Dim = c(2L, 2L)));`/`(argv[[1]],argv[[2]]); [,1] [,2] [1,] 1 Inf [2,] NaN 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep16# #argv <- list(structure(c(126.49966838981, 123.340306958365, 124.994330270046, 129.001056705356, 131.639025779016, 124.408594738421, 125.475982014377, 125.929559340094, 126.630542479839, 127.249057014908, 127.661400038288, 128.403617480371, 129.888052364537, 131.702361667407, 133.516670970277, 135.001105854443, 135.990729110554, 137.310226785368, 144.127817178676, 144.648818160919, 147.114894939813, 142.21953431078, 139.936534657354, 152.343274976711), .Tsp = c(1949, 1950.91666666667, 12), class = 'ts'), structure(c(NA, NA, NA, NA, NA, NA, 126.791666666667, 127.25, 127.958333333333, 128.583333333333, 129, 129.75, 131.25, 133.083333333333, 134.916666666667, 136.416666666667, 137.416666666667, 138.75, NA, NA, NA, NA, NA, NA), .Tsp = c(1949, 1950.91666666667, 12), class = 'ts'));`/`(argv[[1]],argv[[2]]); Jan Feb Mar Apr May Jun Jul 1949 NA NA NA NA NA NA 0.9896233 1950 0.9896233 0.9896233 0.9896233 0.9896233 0.9896233 0.9896233 NA Aug Sep Oct Nov Dec 1949 0.9896233 0.9896233 0.9896233 0.9896233 0.9896233 1950 NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep17# #argv <- list(structure(c(17L, 29L, 17L, 20L, 1L, 15L, 0L, 1L), .Names = c('1', '2', '3', '4', '5', '6', '7', '8')), structure(c(24L, 29L, 27L, 20L, 12L, 16L, 28L, 4L), .Names = c('1', '2', '3', '4', '5', '6', '7', '8')));`/`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 0.70833333 1.00000000 0.62962963 1.00000000 0.08333333 0.93750000 0.00000000 8 0.25000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep18# #argv <- list(c(2, 11, 14, 5, 5, 13, 20, 22, 6, 6, 15, 7, 14, 6, 32, 53, 57, 14, 16, 16, 17, 40, 43, 46, 8, 23, 23, 28, 34, 36, 38, 3, 5, 11, 24, 45, 5, 6, 6, 9, 13, 23, 25, 32, 53, 54, 5, 5, 11, 17, 19, 8, 13, 14, 20, 47, 48, 60, 81, 2, 1, 2, 3, 5, 10, 14, 21, 36, 40, 6, 17, 67, 1, 1, 2, 7, 11, 12, 1, 1, 5, 5, 5, 11, 17, 3, 4, 22, 30, 36, 8, 1, 1, 5, 7, 16, 27, 1, 30, 10, 14, 27, 41, 69, 25, 10, 11, 20, 33, 5, 7, 1, 1, 5, 5, 5, 5, 7, 11, 15, 5, 14, 6, 6, 7, 28, 1, 5, 14, 2, 2, 3, 8, 10, 12, 1, 1, 9, 22, 3, 3, 5, 15, 18, 22, 37), structure(c(7.89366449903379, 7.89366449903379, 7.89366449903379, 14.0829622414182, 14.0829622414182, 14.0829622414182, 14.0829622414182, 14.0829622414182, 9.97467561511911, 9.97467561511911, 9.97467561511911, 9.14061221811198, 9.14061221811198, 37.9214773068363, 37.9214773068363, 37.9214773068363, 37.9214773068363, 27.0457930153774, 27.0457930153774, 27.0457930153774, 27.0457930153774, 27.0457930153774, 27.0457930153774, 27.0457930153774, 27.142857142857, 27.142857142857, 27.142857142857, 27.142857142857, 27.142857142857, 27.142857142857, 27.142857142857, 5.51287534554956, 19.4425820919426, 19.4425820919426, 19.4425820919426, 19.4425820919426, 22.0114035979981, 22.0114035979981, 22.0114035979981, 22.0114035979981, 22.0114035979981, 22.0114035979981, 22.0114035979981, 22.0114035979981, 22.0114035979981, 22.0114035979981, 12.0888548389297, 12.0888548389297, 12.0888548389297, 12.0888548389297, 12.0888548389297, 35.9372148648542, 35.9372148648542, 35.9372148648542, 35.9372148648542, 35.9372148648542, 35.9372148648542, 35.9372148648542, 35.9372148648542, 2.39853649771773, 14.5555555555555, 14.5555555555555, 14.5555555555555, 14.5555555555555, 14.5555555555555, 14.5555555555555, 14.5555555555555, 14.5555555555555, 14.5555555555555, 34.0597534472672, 34.0597534472672, 34.0597534472672, 4.94649227492536, 4.94649227492536, 4.94649227492536, 4.94649227492536, 4.94649227492536, 4.94649227492536, 5.86945220571486, 5.86945220571486, 5.86945220571486, 5.86945220571486, 5.86945220571486, 5.86945220571486, 5.86945220571486, 4.2587413846383, 4.2587413846383, 28.3984573891039, 28.3984573891039, 28.3984573891039, 9.29091029891263, 9.29091029891263, 9.29091029891263, 9.29091029891263, 9.29091029891263, 9.29091029891263, 9.29091029891263, 27.2857142857143, 27.2857142857143, 27.2857142857143, 27.2857142857143, 27.2857142857143, 27.2857142857143, 27.2857142857143, 18.193214018835, 20.387398919001, 20.387398919001, 20.387398919001, 20.387398919001, 6.18095346485027, 6.18095346485027, 6.18095346485027, 6.18095346485027, 6.18095346485027, 6.18095346485027, 6.18095346485027, 6.18095346485027, 6.18095346485027, 6.18095346485027, 6.18095346485027, 10.4914673267343, 10.4914673267343, 10.4914673267343, 10.4914673267343, 10.4914673267343, 10.4914673267343, 6.30668950814617, 6.30668950814617, 6.30668950814617, 6.30668950814617, 6.30668950814617, 6.30668950814617, 6.30668950814617, 6.30668950814617, 6.30668950814617, 0.75368270571509, 13.5, 13.5, 13.5, 13.5, 13.5, 13.5, 13.5, 13.5, 13.5, 13.5), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100', '101', '102', '103', '104', '105', '106', '107', '108', '109', '110', '111', '112', '113', '114', '115', '116', '117', '118', '119', '120', '121', '122', '123', '124', '125', '126', '127', '128', '129', '130', '131', '132', '133', '134', '135', '136', '137', '138', '139', '140', '141', '142', '143', '144', '145', '146')));`/`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 0.25336775 1.39352262 1.77357424 0.35503894 0.35503894 0.92310125 1.42015576 8 9 10 11 12 13 14 1.56217134 0.60152332 0.60152332 1.50380830 0.76581304 1.53162607 0.15822168 15 16 17 18 19 20 21 0.84384898 1.39762488 1.50310600 0.51764058 0.59158924 0.59158924 0.62856356 22 23 24 25 26 27 28 1.47897309 1.58989607 1.70081905 0.29473684 0.84736842 0.84736842 1.03157895 29 30 31 32 33 34 35 1.25263158 1.32631579 1.40000000 0.54418063 0.25716749 0.56576847 1.23440394 36 37 38 39 40 41 42 2.31450739 0.22715498 0.27258598 0.27258598 0.40887897 0.59060295 1.04491292 43 44 45 46 47 48 49 1.13577491 1.45379189 2.40784281 2.45327381 0.41360411 0.41360411 0.90992903 50 51 52 53 54 55 56 1.40625396 1.57169560 0.22261046 0.36174200 0.38956831 0.55652615 1.30783646 57 58 59 60 61 62 63 1.33566277 1.66957846 2.25393093 0.83384180 0.06870229 0.13740458 0.20610687 64 65 66 67 68 69 70 0.34351145 0.68702290 0.96183206 1.44274809 2.47328244 2.74809160 0.17616099 71 72 73 74 75 76 77 0.49912281 1.96713109 0.20216346 0.20216346 0.40432692 1.41514423 2.22379808 78 79 80 81 82 83 84 2.42596154 0.17037365 0.17037365 0.85186825 0.85186825 0.85186825 1.87411016 85 86 87 88 89 90 91 2.89635206 0.70443348 0.93924464 0.77468997 1.05639541 1.26767449 0.86105664 92 93 94 95 96 97 98 0.10763208 0.10763208 0.53816040 0.75342456 1.72211328 2.90606616 0.03664921 99 100 101 102 103 104 105 1.09947644 0.36649215 0.51308901 0.98952880 1.50261780 2.52879581 1.37413873 106 107 108 109 110 111 112 0.49049906 0.53954897 0.98099812 1.61864690 0.80893668 1.13251136 0.16178734 113 114 115 116 117 118 119 0.16178734 0.80893668 0.80893668 0.80893668 0.80893668 1.13251136 1.77966070 120 121 122 123 124 125 126 2.42681005 0.47657776 1.33441773 0.57189331 0.57189331 0.66720886 2.66883546 127 128 129 130 131 132 133 0.15856179 0.79280897 2.21986511 0.31712359 0.31712359 0.47568538 1.26849435 134 135 136 137 138 139 140 1.58561794 1.90274152 1.32681829 0.07407407 0.66666667 1.62962963 0.22222222 141 142 143 144 145 146 0.22222222 0.37037037 1.11111111 1.33333333 1.62962963 2.74074074 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep19# #argv <- list(0.5, c(576.899196412178, 48.2726847449981, 4.88037826224117, 1.31852084431627, 1.02614578306738));`/`(argv[[1]],argv[[2]]); [1] 0.0008667025 0.0103578246 0.1024510751 0.3792128142 0.4872602005 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep2# #argv <- list(c(-3L, -2L, -1L, 0L, 1L, 2L, 3L, 4L, 5L, -3L, -2L, -1L, 0L, 1L, 2L, 3L, 4L, 5L, -3L, -2L, -1L, 0L, 1L, 2L, 3L, 4L, 5L, -3L, -2L, -1L, 0L, 1L, 2L, 3L, 4L, 5L, -3L, -2L, -1L, 0L, 1L, 2L, 3L, 4L, 5L, -3L, -2L, -1L, 0L, 1L, 2L, 3L, 4L, 5L, -3L, -2L, -1L, 0L, 1L, 2L, 3L, 4L, 5L, -3L, -2L, -1L, 0L, 1L, 2L, 3L, 4L, 5L, -3L, -2L, -1L, 0L, 1L, 2L, 3L, 4L, 5L), c(-3L, -3L, -3L, -3L, -3L, -3L, -3L, -3L, -3L, -2L, -2L, -2L, -2L, -2L, -2L, -2L, -2L, -2L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L));`/`(argv[[1]],argv[[2]]); [1] 1.0000000 0.6666667 0.3333333 0.0000000 -0.3333333 -0.6666667 [7] -1.0000000 -1.3333333 -1.6666667 1.5000000 1.0000000 0.5000000 [13] 0.0000000 -0.5000000 -1.0000000 -1.5000000 -2.0000000 -2.5000000 [19] 3.0000000 2.0000000 1.0000000 0.0000000 -1.0000000 -2.0000000 [25] -3.0000000 -4.0000000 -5.0000000 -Inf -Inf -Inf [31] NaN Inf Inf Inf Inf Inf [37] -3.0000000 -2.0000000 -1.0000000 0.0000000 1.0000000 2.0000000 [43] 3.0000000 4.0000000 5.0000000 -1.5000000 -1.0000000 -0.5000000 [49] 0.0000000 0.5000000 1.0000000 1.5000000 2.0000000 2.5000000 [55] -1.0000000 -0.6666667 -0.3333333 0.0000000 0.3333333 0.6666667 [61] 1.0000000 1.3333333 1.6666667 -0.7500000 -0.5000000 -0.2500000 [67] 0.0000000 0.2500000 0.5000000 0.7500000 1.0000000 1.2500000 [73] -0.6000000 -0.4000000 -0.2000000 0.0000000 0.2000000 0.4000000 [79] 0.6000000 0.8000000 1.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep20# #argv <- list(structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42')), 6);`/`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 8 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 9 10 11 12 13 14 15 16 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 17 18 19 20 21 22 23 24 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 25 26 27 28 29 30 31 32 0.0000000 0.0000000 0.0000000 0.1666667 0.0000000 0.0000000 0.0000000 0.1666667 33 34 35 36 37 38 39 40 0.0000000 0.1666667 0.1666667 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 41 42 0.0000000 0.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep21# #argv <- list(structure(c(18, 17, 15, 20, 10, 20, 25, 13, 12), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9')), structure(c(18.3712737525013, 13.3333333333333, 18.2953929141735, 18.3712737525013, 13.3333333333333, 18.2953929141735, 18.3712737525013, 13.3333333333333, 18.2953929141735), .Dim = c(9L, 1L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9'), NULL)));`/`(argv[[1]],argv[[2]]); [,1] 1 0.9797905 2 1.2750000 3 0.8198785 4 1.0886561 5 0.7500000 6 1.0931714 7 1.3608202 8 0.9750000 9 0.6559028 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep22# #argv <- list(c(0+6.28318530717959i, 0+12.5663706143592i, 0+18.8495559215388i, 0+25.1327412287183i, 0+31.4159265358979i, 0+37.6991118430775i, 0+43.9822971502571i, 0+50.2654824574367i, 0+56.5486677646163i, 0+62.8318530717959i, 0+69.1150383789754i, 0+75.398223686155i, 0+81.6814089933346i, 0+87.9645943005142i, 0+94.2477796076938i, 0+100.530964914873i), 16);`/`(argv[[1]],argv[[2]]); [1] 0+0.3926991i 0+0.7853982i 0+1.1780972i 0+1.5707963i 0+1.9634954i [6] 0+2.3561945i 0+2.7488936i 0+3.1415927i 0+3.5342917i 0+3.9269908i [11] 0+4.3196899i 0+4.7123890i 0+5.1050881i 0+5.4977871i 0+5.8904862i [16] 0+6.2831853i ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep23# #argv <- list(structure(c(1, 0, -1, 0.5, -0.5, NA, NA, NA, 0), .Dim = c(3L, 3L)), structure(c(1, 1, 1, 0.707106781186548, 0.707106781186548, 0.707106781186548, 0, 0, 0), .Dim = c(3L, 3L)));`/`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] 1 0.7071068 NA [2,] 0 -0.7071068 NA [3,] -1 NA NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep24# #argv <- list(structure(c(32, 53, 10, 3, 11, 50, 10, 30, 10, 25, 7, 5, 3, 15, 7, 8, 36, 66, 16, 4, 9, 34, 7, 64, 5, 29, 7, 5, 2, 14, 7, 8), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32')), 18.5);`/`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 8 1.7297297 2.8648649 0.5405405 0.1621622 0.5945946 2.7027027 0.5405405 1.6216216 9 10 11 12 13 14 15 16 0.5405405 1.3513514 0.3783784 0.2702703 0.1621622 0.8108108 0.3783784 0.4324324 17 18 19 20 21 22 23 24 1.9459459 3.5675676 0.8648649 0.2162162 0.4864865 1.8378378 0.3783784 3.4594595 25 26 27 28 29 30 31 32 0.2702703 1.5675676 0.3783784 0.2702703 0.1081081 0.7567568 0.3783784 0.4324324 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep25# #argv <- list(structure(c(1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 1, 1, 0, 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 1, 0, 0, 1, 0, 1, 1, 1, 0, 1, 1, 0, 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1, 1, 0, 1, 1, 0, 0, 1, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 0, 0), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100')), structure(c(0.570290675249213, 0.61905127646042, 0.531618474288601, 0.790554080720526, 0.767014480135805, 0.550113874748024, 0.17684306547603, 0.582060475541574, 0.82418208155584, 0.508078873703881, 0.235692066937831, 0.434097271866188, 0.494627673369755, 0.72161667900813, 0.573653475332745, 0.56356507508215, 0.69807707842341, 0.78887268067876, 0.566927875165682, 0.661086277504564, 0.469406672743269, 0.365159870153793, 0.474450872868566, 0.63082107675278, 0.131445264348354, 0.640909477003375, 0.503034673578584, 0.565246475123916, 0.403832071114405, 0.577016275416276, 0.543388274580962, 0.239054867021362, 0.573653475332745, 0.514804473870944, 0.674537477838689, 0.0709148628447877, 0.536662674413898, 0.772058680261102, 0.274364267898443, 0.116312663972463, 0.439141471991485, 0.60728147616806, 0.400469271030873, 0.497990473453286, 0.514804473870944, 0.55179527478979, 0.455955472409143, 0.506397473662115, 0.321443469067883, 0.565246475123916, 0.772058680261102, 0.869579882683515, 0.494627673369755, 0.457636872450909, 0.398787870989108, 0.753563279801679, 0.518167273954475, 0.326487669193181, 0.351708669819667, 0.479495072993863, 0.397106470947342, 0.439141471991485, 0.37020407027909, 0.627458276669249, 0.402150671072639, 0.63082107675278, 0.543388274580962, 0.587104675666871, 0.587104675666871, 0.311355068817289, 0.730023679216959, 0.534981274372133, 0.450911272283846, 0.427371671699125, 0.432415871824422, 0.2911782683161, 0.339938869527307, 0.708165478674004, 0.76533308009404, 0.455955472409143, 0.509760273745647, 0.412239071323234, 0.464362472617972, 0.481176473035629, 0.331531869318478, 0.622414076543951, 0.392062270822045, 0.827544881639372, 0.487902073202692, 0.479495072993863, 0.652679277295735, 0.585423275625105, 0.735067879342256, 0.477813672952097, 0.435778671907954, 0.756926079885211, 0.679581677963987, 0.339938869527307, 0.625776876627483, 0.652679277295735), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100')));`/`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 8 1.753492 0.000000 1.881048 1.264936 1.303756 1.817805 0.000000 1.718035 9 10 11 12 13 14 15 16 1.213324 1.968198 0.000000 2.303631 2.021723 1.385777 0.000000 0.000000 17 18 19 20 21 22 23 24 1.432507 1.267632 1.763893 0.000000 0.000000 0.000000 0.000000 0.000000 25 26 27 28 29 30 31 32 0.000000 0.000000 0.000000 1.769140 0.000000 0.000000 0.000000 0.000000 33 34 35 36 37 38 39 40 1.743213 0.000000 1.482497 0.000000 0.000000 1.295238 0.000000 8.597516 41 42 43 44 45 46 47 48 2.277170 1.646683 0.000000 2.008071 1.942485 0.000000 2.193197 0.000000 49 50 51 52 53 54 55 56 0.000000 0.000000 1.295238 1.149981 0.000000 2.185139 0.000000 1.327029 57 58 59 60 61 62 63 64 1.929879 0.000000 2.843262 0.000000 0.000000 2.277170 0.000000 1.593731 65 66 67 68 69 70 71 72 0.000000 1.585236 1.840305 0.000000 0.000000 0.000000 1.369819 1.869224 73 74 75 76 77 78 79 80 0.000000 2.339884 2.312589 0.000000 0.000000 1.412099 1.306621 2.193197 81 82 83 84 85 86 87 88 0.000000 0.000000 2.153490 2.078240 0.000000 0.000000 2.550615 1.208394 89 90 91 92 93 94 95 96 2.049592 0.000000 1.532146 0.000000 1.360419 0.000000 2.294743 1.321133 97 98 99 100 1.471493 2.941705 0.000000 0.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep26# #argv <- list(structure(c(0L, 1L, 1L, 7L, 7L, 2L, 0L, 3L, 9L, 0L, 0L, 0L, 0L, 6L, 0L, 1L, 5L, 8L, 2L, 2L, 0L, 0L, 0L, 9L, 0L, 3L, 0L, 1L, 0L, 2L, 3L, 0L, 0L, 0L, 0L, 0L, 0L, 4L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 2L, 2L, 0L, 0L, 0L, 4L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 2L, 0L, 1L, 0L, 1L, 0L, 0L, 8L, 0L, 0L, 0L, 0L, 0L, 0L, 3L, 4L, 0L, 0L, 0L, 0L, 0L, 0L, 4L, 0L, 4L, 0L, 0L, 4L, 0L, 5L, 0L, 0L, 3L, 3L, 0L, 5L, 2L), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100')), structure(c(1.25194092864295, 1.37418430529572, 1.15498928509075, 1.80414376800547, 1.74512972410413, 1.20135746244181, 0.265563337720594, 1.28144795059362, 1.88844954500738, 1.09597524118942, 0.413098447473938, 0.910502531785213, 1.06225293038865, 1.63131692515155, 1.26037150634314, 1.23507977324257, 1.57230288125021, 1.79992847915537, 1.24351035094276, 1.47956652654811, 0.999023597637219, 0.737675688931295, 1.01166946418751, 1.40369132724639, 0.151750538768014, 1.42898306034697, 1.08332937463913, 1.23929506209267, 0.834627332483493, 1.26880208404333, 1.18449630704142, 0.421529025174129, 1.26037150634314, 1.1128363965898, 1.51328883734888, 1.40164574169432e-07, 1.16763515164104, 1.75777559065442, 0.510050091026136, 0.113812939117154, 0.9231483983355, 1.34467728334505, 0.826196754783302, 1.07068350808884, 1.1128363965898, 1.2055727512919, 0.965301286836455, 1.09175995233932, 0.628078178828811, 1.23929506209267, 1.75777559065442, 2.00226234395996, 1.06225293038865, 0.969516575686551, 0.821981465933206, 1.71140741330337, 1.12126697428999, 0.640724045379098, 0.703953378130531, 1.02431533073779, 0.817766177083111, 0.9231483983355, 0.750321555481582, 1.3952607495462, 0.830412043633397, 1.40369132724639, 1.18449630704142, 1.29409381714391, 1.29409381714391, 0.602786445728238, 1.65239336940203, 1.16341986279095, 0.952655420286168, 0.893641376384831, 0.906287242935117, 0.552202979527091, 0.674446356179862, 1.59759461435079, 1.74091443525404, 0.965301286836455, 1.10019053003951, 0.855703776733971, 0.986377731086933, 1.02853061958789, 0.653369911929384, 1.38261488299591, 0.805120310532824, 1.89688012270757, 1.04539177498827, 1.02431533073779, 1.45849008229763, 1.28987852829381, 1.66503923595232, 1.0201000418877, 0.914717820635308, 1.71983799100356, 1.52593470389916, 0.674446356179862, 1.39104546069611, 1.45849008229763), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100')));`/`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 8 0.0000000 0.7277044 0.8658089 3.8799569 4.0111631 1.6647834 0.0000000 2.3411017 9 10 11 12 13 14 15 16 4.7658144 0.0000000 0.0000000 0.0000000 0.0000000 3.6780100 0.0000000 0.8096643 17 18 19 20 21 22 23 24 3.1800489 4.4446210 1.6083501 1.3517473 0.0000000 0.0000000 0.0000000 6.4116660 25 26 27 28 29 30 31 32 0.0000000 2.0993951 0.0000000 0.8069103 0.0000000 1.5762900 2.5327221 0.0000000 33 34 35 36 37 38 39 40 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 2.2756033 0.0000000 0.0000000 41 42 43 44 45 46 47 48 0.0000000 0.7436729 0.0000000 0.0000000 0.0000000 0.8294813 0.0000000 0.0000000 49 50 51 52 53 54 55 56 0.0000000 0.0000000 1.1378017 0.9988701 0.0000000 0.0000000 0.0000000 2.3372576 57 58 59 60 61 62 63 64 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 1.4334238 65 66 67 68 69 70 71 72 0.0000000 0.7124073 0.0000000 0.7727415 0.0000000 0.0000000 4.8414622 0.0000000 73 74 75 76 77 78 79 80 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 1.8778231 2.2976431 0.0000000 81 82 83 84 85 86 87 88 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 2.8930688 0.0000000 2.1087258 89 90 91 92 93 94 95 96 0.0000000 0.0000000 2.7425624 0.0000000 3.0029322 0.0000000 0.0000000 1.7443503 97 98 99 100 1.9660081 0.0000000 3.5944188 1.3712812 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep27# #argv <- list(998.602763134667, 78L);`/`(argv[[1]],argv[[2]]); [1] 12.8026 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep28# #argv <- list(structure(c(0L, 1L, 1L, 7L, 7L, 2L, 0L, 3L, 9L, 0L, 0L, 0L, 0L, 6L, 0L, 1L, 5L, 8L, 2L, 2L, 0L, 0L, 0L, 9L, 0L, 3L, 0L, 1L, 0L, 2L, 3L, 0L, 0L, 0L, 0L, 0L, 0L, 4L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 2L, 2L, 0L, 0L, 0L, 4L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 2L, 0L, 1L, 0L, 1L, 0L, 0L, 8L, 0L, 0L, 0L, 0L, 0L, 0L, 3L, 4L, 0L, 0L, 0L, 0L, 0L, 0L, 4L, 0L, 4L, 0L, 0L, 4L, 0L, 5L, 0L, 0L, 3L, 3L, 0L, 5L, 2L), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100')), structure(c(1.501181611548, 1.64776358195565, 1.38492694536262, 2.16332775373429, 2.09256404388232, 1.44052700310346, 0.318416746879368, 1.53656346647399, 2.26441876780853, 1.31416323551065, 0.495326021509292, 1.09176300454732, 1.27372682988096, 1.95609117488209, 1.51129071295543, 1.48096340873315, 1.88532746503012, 2.15827320303057, 1.49107251014058, 1.77412734954845, 1.19790856932527, 0.884526425695124, 1.21307222143641, 1.68314543688164, 0.181943877879142, 1.71347274110391, 1.29899958339952, 1.48601795943686, 1.0007810918805, 1.52139981436285, 1.42030880028861, 0.505435122916716, 1.51129071295543, 1.3343814383255, 1.81456375517815, -1.99474544941847e-05, 1.40009059747376, 2.10772769599345, 0.611580687694671, 0.136452921545733, 1.10692665665846, 1.61238172702967, 0.990671990473078, 1.28383593128838, 1.3343814383255, 1.44558155380717, 1.15747216369558, 1.30910868480694, 0.753108107398609, 1.48601795943686, 2.10772769599345, 2.40089163680876, 1.27372682988096, 1.16252671439929, 0.985617439769366, 2.05212763825262, 1.34449053973293, 0.768271759509746, 0.844090020065427, 1.22823587354755, 0.980562889065654, 1.10692665665846, 0.899690077806261, 1.67303633547421, 0.99572654117679, 1.68314543688164, 1.42030880028861, 1.55172711858512, 1.55172711858512, 0.722780803176337, 1.98136392840065, 1.39503604677005, 1.14230851158444, 1.07154480173247, 1.08670845384361, 0.662126194731792, 0.808708165139443, 1.91565476925239, 2.08750949317861, 1.15747216369558, 1.31921778621437, 1.02605384539906, 1.18274491721414, 1.23329042425126, 0.783435411620882, 1.65787268336308, 0.965399236954518, 2.27452786921595, 1.25350862706611, 1.22823587354755, 1.74885459602989, 1.54667256788141, 1.99652758051179, 1.22318132284384, 1.09681755525103, 2.06223673966004, 1.82972740728929, 0.808708165139443, 1.6679817847705, 1.74885459602989), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100')));`/`(argv[[1]],argv[[2]]); 1 2 3 4 5 6 7 8 0.0000000 0.6068832 0.7220597 3.2357556 3.3451784 1.3883808 0.0000000 1.9524088 9 10 11 12 13 14 15 16 3.9745299 0.0000000 0.0000000 0.0000000 0.0000000 3.0673417 0.0000000 0.6752361 17 18 19 20 21 22 23 24 2.6520592 3.7066670 1.3413164 1.1273148 0.0000000 0.0000000 0.0000000 5.3471315 25 26 27 28 29 30 31 32 0.0000000 1.7508303 0.0000000 0.6729394 0.0000000 1.3145788 2.1122167 0.0000000 33 34 35 36 37 38 39 40 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 1.8977784 0.0000000 0.0000000 41 42 43 44 45 46 47 48 0.0000000 0.6202005 0.0000000 0.0000000 0.0000000 0.6917631 0.0000000 0.0000000 49 50 51 52 53 54 55 56 0.0000000 0.0000000 0.9488892 0.8330239 0.0000000 0.0000000 0.0000000 1.9491965 57 58 59 60 61 62 63 64 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 1.1954313 65 66 67 68 69 70 71 72 0.0000000 0.5941257 0.0000000 0.6444432 0.0000000 0.0000000 4.0376227 0.0000000 73 74 75 76 77 78 79 80 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 1.5660442 1.9161590 0.0000000 81 82 83 84 85 86 87 88 0.0000000 0.0000000 0.0000000 0.0000000 0.0000000 2.4127305 0.0000000 1.7586067 89 90 91 92 93 94 95 96 0.0000000 0.0000000 2.2872113 0.0000000 2.5043481 0.0000000 0.0000000 1.4547311 97 98 99 100 1.6395885 0.0000000 2.9976347 1.1436057 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep3# #argv <- list(structure(c(NA, 17.4716236802524, 0.424429400003, -2.45474630431729, -8.6855922903657, -11.7956139807344, -8.08147081196715, -13.3123167980156, -1.24650334752019, 21.281002075072, -5.32311940332657, 0.621869751489083, -19.2022951076469, -0.543162784063959, NA, NA, 15.344649382745, -9.74060313555005, 0.149375174081257, -5.85062482591874, -6.90563567110309, -9.96064651628744, 5.6326723568001, -8.78481137542338, -6.01565736147178, -15.543162784064, 2.34681552556734, -13.2465033475202, -3.82901961529671, 1.5226506664314, NA, -5.9777558474085, 22.7534966524798, 15.5010454558094, 4.13857256877024, -11.6855922903657, 11.6768805966734, -7.38893285382193, 10.8527157375375, -11.3889328538219, 14.1493751740813, -0.388932853821931, 13.0835617235859, -1.98225172690947, 5.96273742790618, -1.50975714950164, -1.38893285382193, 9.90772658272184, 7.3144077096343, -12.9822517269095, 2.02855087840155, -4.7956139807344, 3.14937517408126, -10.3231194033266, -2.25730595283121, 2.56685890630474, 4.27019946976097, 5.14937517408126, 0.0285508784015471, 5.85271573753749, 6.73189144185778, -6.38893285382193, 0.0285508784015471, -3.14728426246251, 15.1493751740813, 13.7869022870421, -7.27891116345324, 9.61106714617807, 4.84191313222647, -3.98225172690947, -6.38893285382193, 13.0285508784015, 5.13857256877024, -8.50975714950164, -0.619778839870337, -3.97144912159845, 23.1493751740813, -2.80641658604541, -1.03726257209382, 2.25939686444995, 4.25939686444995, -4.38893285382193, 6.38022116012966, -4.74060313555005, 2.02855087840155, -15.7956139807344, 8.21518862457662, -12.0264599667828, -2.1364816571515, 5.8635183428485, -14.729800530239, 4.80850749766416, -11.7848113754234, 9.45683721593604, -15.2573059528312, 5.28100207507198, 12.8635183428485, 6.50104545580937, 1.55605630099372, -7.44394369900628, 9.9735400332172, -11.2681085581422, 7.44603461062503, -8.14728426246251, -1.72980053023903, -3.90563567110309, 4.56685890630474, -5.37813024851092, -1.25730595283121, 10.7426940471688, NA, NA, 6.24343998511081, -21.9164382764141, -6.1364816571515, -15.8398222206077, -4.12567905184048, -7.94984391097642, -6.4773493335686, -5.65318447443266), .Tsp = c(1945, 1974.75, 4), class = 'ts'), 9.24492052298191);`/`(argv[[1]],argv[[2]]); Qtr1 Qtr2 Qtr3 Qtr4 1945 NA 1.889861967 0.045909470 -0.265523787 1946 -0.939498860 -1.275902151 -0.874152546 -1.439960113 1947 -0.134831159 2.301912929 -0.575788552 0.067266100 1948 -2.077064379 -0.058752564 NA NA 1949 1.659792461 -1.053616752 0.016157540 -0.632847498 1950 -0.746965391 -1.077418296 0.609272123 -0.950231141 1951 -0.650698656 -1.681265160 0.253849183 -1.432841236 1952 -0.414175504 0.164701326 NA -0.646598944 1953 2.461188995 1.676709434 0.447659075 -1.264001379 1954 1.263059057 -0.799242442 1.173911199 -1.231912468 1955 1.530502630 -0.042069897 1.415216247 -0.214415226 1956 0.644974439 -0.163306666 -0.150237403 1.071694079 1957 0.791181243 -1.404257797 0.219423290 -0.518729606 1958 0.340660059 -1.116626084 -0.244167156 0.277650727 1959 0.461896829 0.556995072 0.003088277 0.633073667 1960 0.728171911 -0.691074935 0.003088277 -0.340433891 1961 1.638670136 1.491294842 -0.787341670 1.039605167 1962 0.523737670 -0.430750239 -0.691074935 1.409265861 1963 0.555826581 -0.920479211 -0.067039932 -0.429581748 1964 2.504010188 -0.303563084 -0.112198106 0.244393325 1965 0.460728338 -0.474739923 0.690132613 -0.512779220 1966 0.219423290 -1.708572177 0.888616468 -1.300872186 1967 -0.231097893 0.634242158 -1.593285793 0.520124266 1968 -1.274733660 1.022922500 -1.650344740 0.571232826 1969 1.391414703 0.703201876 0.168314730 -0.805192828 1970 1.078812956 -1.218843205 0.805418997 -0.881271423 1971 -0.187108210 -0.422462872 0.493985740 -0.581738938 1972 -0.135999650 1.162010427 NA NA 1973 0.675337335 -2.370646478 -0.663767919 -1.713354072 1974 -0.446264415 -0.859914792 -0.700638726 -0.611490868 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep4# #argv <- list(structure(-0.437222043740988, .Names = 'Var2'), 6.28318530717959);`/`(argv[[1]],argv[[2]]); Var2 -0.06958605 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep5#Output.IgnoreWarningContext# #argv <- list(structure(integer(0), .Label = character(0), class = 'factor'));`/`(argv[[1]]); logical(0) Warning message: In Ops.factor(argv[[1]]) : ‘/’ not meaningful for factors ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep6# #argv <- list(structure(c(25.1597633136098, 12.8284023668648), .Dim = 2L, .Dimnames = list(c('1', '2'))), c(13L, 13L));`/`(argv[[1]],argv[[2]]); 1 2 1.9353664 0.9868002 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep7# #argv <- list(1e+05, 3);`/`(argv[[1]],argv[[2]]); [1] 33333.33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep8# #argv <- list(structure(c(1L, 1L, 1L, 1L, 6L, 2L, 4L, 3L, 7L, 2L, 8L, 4L, 2L, 2L, 1L, 3L, 3L, 4L, 3L, 2L, 1L, 2L, 3L, 1L, 1L, 2L, 1L, 3L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 2L, 4L, 1L, 1L, 1L, 1L, 2L, 1L, 5L, 2L, 1L, 3L, 2L, 1L, 1L, 6L, 2L, 1L, 2L, 5L, 2L, 2L, 2L, 4L, 4L, 1L, 1L, 3L, 4L, 2L, 2L, 2L, 1L, 5L, 4L, 1L, 3L, 1L, 1L, 4L, 2L, 3L, 2L, 1L, 8L, 1L, 5L, 1L, 3L, 4L, 4L, 1L, 3L, 1L, 2L, 6L, 1L, 1L, 1L, 1L, 1L, 6L, 2L, 2L, 1L, 1L, 2L, 3L, 1L, 1L, 1L, 1L), .Dim = 126L, .Dimnames = structure(list(fe = c('1.6', '1.667', '1.7', '1.733', '1.75', '1.783', '1.8', '1.817', '1.833', '1.85', '1.867', '1.883', '1.917', '1.933', '1.95', '1.967', '1.983', '2', '2.017', '2.033', '2.067', '2.083', '2.1', '2.133', '2.15', '2.167', '2.183', '2.2', '2.217', '2.233', '2.25', '2.267', '2.283', '2.3', '2.317', '2.333', '2.35', '2.367', '2.383', '2.4', '2.417', '2.483', '2.617', '2.633', '2.8', '2.883', '2.9', '3.067', '3.317', '3.333', '3.367', '3.417', '3.45', '3.5', '3.567', '3.6', '3.683', '3.717', '3.733', '3.75', '3.767', '3.817', '3.833', '3.85', '3.883', '3.917', '3.95', '3.966', '3.967', '4', '4.033', '4.05', '4.067', '4.083', '4.1', '4.117', '4.133', '4.15', '4.167', '4.183', '4.2', '4.233', '4.25', '4.267', '4.283', '4.3', '4.317', '4.333', '4.35', '4.366', '4.367', '4.383', '4.4', '4.417', '4.433', '4.45', '4.467', '4.483', '4.5', '4.517', '4.533', '4.55', '4.567', '4.583', '4.6', '4.617', '4.633', '4.65', '4.667', '4.7', '4.716', '4.733', '4.75', '4.767', '4.783', '4.8', '4.817', '4.833', '4.85', '4.883', '4.9', '4.933', '5', '5.033', '5.067', '5.1')), .Names = 'fe'), class = 'table'), 272L);`/`(argv[[1]],argv[[2]]); fe 1.6 1.667 1.7 1.733 1.75 1.783 0.003676471 0.003676471 0.003676471 0.003676471 0.022058824 0.007352941 1.8 1.817 1.833 1.85 1.867 1.883 0.014705882 0.011029412 0.025735294 0.007352941 0.029411765 0.014705882 1.917 1.933 1.95 1.967 1.983 2 0.007352941 0.007352941 0.003676471 0.011029412 0.011029412 0.014705882 2.017 2.033 2.067 2.083 2.1 2.133 0.011029412 0.007352941 0.003676471 0.007352941 0.011029412 0.003676471 2.15 2.167 2.183 2.2 2.217 2.233 0.003676471 0.007352941 0.003676471 0.011029412 0.003676471 0.007352941 2.25 2.267 2.283 2.3 2.317 2.333 0.007352941 0.003676471 0.003676471 0.003676471 0.003676471 0.003676471 2.35 2.367 2.383 2.4 2.417 2.483 0.003676471 0.003676471 0.003676471 0.007352941 0.007352941 0.003676471 2.617 2.633 2.8 2.883 2.9 3.067 0.003676471 0.003676471 0.003676471 0.003676471 0.003676471 0.003676471 3.317 3.333 3.367 3.417 3.45 3.5 0.003676471 0.007352941 0.003676471 0.003676471 0.003676471 0.007352941 3.567 3.6 3.683 3.717 3.733 3.75 0.007352941 0.014705882 0.003676471 0.003676471 0.003676471 0.003676471 3.767 3.817 3.833 3.85 3.883 3.917 0.007352941 0.003676471 0.018382353 0.007352941 0.003676471 0.011029412 3.95 3.966 3.967 4 4.033 4.05 0.007352941 0.003676471 0.003676471 0.022058824 0.007352941 0.003676471 4.067 4.083 4.1 4.117 4.133 4.15 0.007352941 0.018382353 0.007352941 0.007352941 0.007352941 0.014705882 4.167 4.183 4.2 4.233 4.25 4.267 0.014705882 0.003676471 0.003676471 0.011029412 0.014705882 0.007352941 4.283 4.3 4.317 4.333 4.35 4.366 0.007352941 0.007352941 0.003676471 0.018382353 0.014705882 0.003676471 4.367 4.383 4.4 4.417 4.433 4.45 0.011029412 0.003676471 0.003676471 0.014705882 0.007352941 0.011029412 4.467 4.483 4.5 4.517 4.533 4.55 0.007352941 0.003676471 0.029411765 0.003676471 0.018382353 0.003676471 4.567 4.583 4.6 4.617 4.633 4.65 0.011029412 0.014705882 0.014705882 0.003676471 0.011029412 0.003676471 4.667 4.7 4.716 4.733 4.75 4.767 0.007352941 0.022058824 0.003676471 0.003676471 0.003676471 0.003676471 4.783 4.8 4.817 4.833 4.85 4.883 0.003676471 0.022058824 0.007352941 0.007352941 0.003676471 0.003676471 4.9 4.933 5 5.033 5.067 5.1 0.007352941 0.011029412 0.003676471 0.003676471 0.003676471 0.003676471 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sep.testsep9# #argv <- list(c(-20.7752893729399+0i, -22.2629231778254+0i, 30.2366932497517-0i, -17.7609104766206+0i, -12.009450871146+0i, -20.6744466063748+0i, -16.2509653806178-0i, 14.8872572302678-0i, -2.41214022512376e+00+5e-15i, 30.1945691318138-0i, -14.86107358966-0i, -75.7334659810725-0i, -31.7348183989382+0i, 33.742775143777-0i, 26.1570616797447-0i, 37.7317903854624+0i, -7.20820970337446-0i, 38.6698755921621-0i, -26.4295844393936-0i, 26.3000016960339+0i, -16.3754767271763+0i, -7.29593605495242-0i, 9.19886724090888+0i, -35.3925832738897+0i, 21.0943018303757+0i, 4.90714440628349-0i), 26L);`/`(argv[[1]],argv[[2]]); [1] -0.79904959+0i -0.85626628+0i 1.16294974+0i -0.68311194+0i -0.46190196+0i [6] -0.79517102+0i -0.62503713+0i 0.57258682+0i -0.09277462+0i 1.16132958+0i [11] -0.57157975+0i -2.91282561+0i -1.22056994+0i 1.29779904+0i 1.00604083+0i [16] 1.45122271+0i -0.27723883+0i 1.48730291+0i -1.01652248+0i 1.01153853+0i [21] -0.62982603+0i -0.28061293+0i 0.35380259+0i -1.36125320+0i 0.81131930+0i [26] 0.18873632+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testAlongWith#Output.MayIgnoreErrorContext# #seq(along.with=-1) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testAlongWith#Output.MayIgnoreErrorContext# #seq(along.with=-2.3) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testAlongWith#Output.MayIgnoreErrorContext# #seq(along.with=0) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testAlongWith#Output.MayIgnoreErrorContext# #seq(along.with=1) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testAlongWith#Output.MayIgnoreErrorContext# #seq(along.with=10) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testAlongWith#Output.MayIgnoreErrorContext# #seq(along.with=2.3) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testAlongWith#Output.MayIgnoreErrorContext# #seq(along.with=F) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testAlongWith#Output.MayIgnoreErrorContext# #seq(along.with=T) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testAlongWith#Output.MayIgnoreErrorContext# #seq(along.with=c(1,2)) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testAlongWith#Output.MayIgnoreErrorContext# #seq(along.with=list(2,3,4)) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testEmptyParams# #seq(,,,5) [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testEmptyParams# #seq(,,5) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testEmptyParams# #seq(,5) [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testEmptyParams# #seq.int(,,,5) Error in seq.int(, , , 5) : argument 1 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testEmptyParams# #seq.int(,,5) Error in seq.int(, , 5) : argument 1 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testEmptyParams# #seq.int(,5) Error in seq.int(, 5) : argument 1 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testErrors#Output.MayIgnoreErrorContext# #seq(1, 20, 3, length.out=10) Error in seq.default(1, 20, 3, length.out = 10) : too many arguments ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testErrors#Output.MayIgnoreWarningContext# #seq(1, 20, length.out=c(5,2)) [1] 1.00 5.75 10.50 15.25 20.00 Warning message: In seq.default(1, 20, length.out = c(5, 2)) : first element used of 'length.out' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testErrors#Output.MayIgnoreWarningContext# #seq(1, length.out=c(5,2)) [1] 1 2 3 4 5 Warning message: In seq.default(1, length.out = c(5, 2)) : first element used of 'length.out' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testErrors#Output.MayIgnoreErrorContext# #seq(Inf) Error in seq.default(Inf) : 'from' must be a finite number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testErrors#Output.MayIgnoreErrorContext# #seq(NA_integer_) Error in seq.default(NA_integer_) : 'from' must be a finite number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testErrors#Output.MayIgnoreErrorContext# #seq(NA_real_) Error in seq.default(NA_real_) : 'from' must be a finite number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testErrors#Output.MayIgnoreErrorContext# #seq(NaN) Error in seq.default(NaN) : 'from' must be a finite number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testErrors#Output.MayIgnoreErrorContext# #seq(c(5,2), c(5,2)) Error in seq.default(c(5, 2), c(5, 2)) : 'from' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, -1.1) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, -1L) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, 0) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, 0L) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, 1.1) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, 1L) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, 2.3) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, 2L) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, -1.1) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, -1L) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, 0) Error in seq.default(-0.2, -1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, 0L) Error in seq.default(-0.2, -1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, 1.1) Error in seq.default(-0.2, -1.1, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, 1L) Error in seq.default(-0.2, -1.1, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, 2.3) Error in seq.default(-0.2, -1.1, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, 2L) Error in seq.default(-0.2, -1.1, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, -1.1) [1] -0.2 -1.3 -2.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, -1L) [1] -0.2 -1.2 -2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, 0) Error in seq.default(-0.2, -2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, 0L) Error in seq.default(-0.2, -2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, 1.1) Error in seq.default(-0.2, -2.999999999, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, 1L) Error in seq.default(-0.2, -2.999999999, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, 2.3) Error in seq.default(-0.2, -2.999999999, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, 2L) Error in seq.default(-0.2, -2.999999999, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, -1.1) [1] -0.2 -1.3 -2.4 -3.5 -4.6 -5.7 -6.8 -7.9 -9.0 -10.1 -11.2 -12.3 [13] -13.4 -14.5 -15.6 -16.7 -17.8 -18.9 -20.0 -21.1 -22.2 -23.3 -24.4 -25.5 [25] -26.6 -27.7 -28.8 -29.9 -31.0 -32.1 -33.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, -1L) [1] -0.2 -1.2 -2.2 -3.2 -4.2 -5.2 -6.2 -7.2 -8.2 -9.2 -10.2 -11.2 [13] -12.2 -13.2 -14.2 -15.2 -16.2 -17.2 -18.2 -19.2 -20.2 -21.2 -22.2 -23.2 [25] -24.2 -25.2 -26.2 -27.2 -28.2 -29.2 -30.2 -31.2 -32.2 -33.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, 0) Error in seq.default(-0.2, -33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, 0L) Error in seq.default(-0.2, -33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, 1.1) Error in seq.default(-0.2, -33.3, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, 1L) Error in seq.default(-0.2, -33.3, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, 2.3) Error in seq.default(-0.2, -33.3, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, 2L) Error in seq.default(-0.2, -33.3, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, -1.1) [1] -0.2 -1.3 -2.4 -3.5 -4.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, -1L) [1] -0.2 -1.2 -2.2 -3.2 -4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, 0) Error in seq.default(-0.2, -5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, 0L) Error in seq.default(-0.2, -5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, 1.1) Error in seq.default(-0.2, -5, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, 1L) Error in seq.default(-0.2, -5, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, 2.3) Error in seq.default(-0.2, -5, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, 2L) Error in seq.default(-0.2, -5, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, -1.1) Error in seq.default(-0.2, 0.2, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, -1L) Error in seq.default(-0.2, 0.2, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, 0) Error in seq.default(-0.2, 0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, 0L) Error in seq.default(-0.2, 0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, 1.1) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, 1L) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, 2.3) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, 2L) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, -1.1) Error in seq.default(-0.2, 1.1, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, -1L) Error in seq.default(-0.2, 1.1, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, 0) Error in seq.default(-0.2, 1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, 0L) Error in seq.default(-0.2, 1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, 1.1) [1] -0.2 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, 1L) [1] -0.2 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, 2.3) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, 2L) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, -1.1) Error in seq.default(-0.2, 2.999999999, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, -1L) Error in seq.default(-0.2, 2.999999999, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, 0) Error in seq.default(-0.2, 2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, 0L) Error in seq.default(-0.2, 2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, 1.1) [1] -0.2 0.9 2.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, 1L) [1] -0.2 0.8 1.8 2.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, 2.3) [1] -0.2 2.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, 2L) [1] -0.2 1.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, -1.1) Error in seq.default(-0.2, 33.3, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, -1L) Error in seq.default(-0.2, 33.3, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, 0) Error in seq.default(-0.2, 33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, 0L) Error in seq.default(-0.2, 33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, 1.1) [1] -0.2 0.9 2.0 3.1 4.2 5.3 6.4 7.5 8.6 9.7 10.8 11.9 13.0 14.1 15.2 [16] 16.3 17.4 18.5 19.6 20.7 21.8 22.9 24.0 25.1 26.2 27.3 28.4 29.5 30.6 31.7 [31] 32.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, 1L) [1] -0.2 0.8 1.8 2.8 3.8 4.8 5.8 6.8 7.8 8.8 9.8 10.8 11.8 12.8 13.8 [16] 14.8 15.8 16.8 17.8 18.8 19.8 20.8 21.8 22.8 23.8 24.8 25.8 26.8 27.8 28.8 [31] 29.8 30.8 31.8 32.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, 2.3) [1] -0.2 2.1 4.4 6.7 9.0 11.3 13.6 15.9 18.2 20.5 22.8 25.1 27.4 29.7 32.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, 2L) [1] -0.2 1.8 3.8 5.8 7.8 9.8 11.8 13.8 15.8 17.8 19.8 21.8 23.8 25.8 27.8 [16] 29.8 31.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, -1.1) Error in seq.default(-0.2, 5, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, -1L) Error in seq.default(-0.2, 5, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, 0) Error in seq.default(-0.2, 5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, 0L) Error in seq.default(-0.2, 5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, 1.1) [1] -0.2 0.9 2.0 3.1 4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, 1L) [1] -0.2 0.8 1.8 2.8 3.8 4.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, 2.3) [1] -0.2 2.1 4.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, 2L) [1] -0.2 1.8 3.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, -1.1) Error in seq.default(-1.1, -0.2, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, -1L) Error in seq.default(-1.1, -0.2, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, 0) Error in seq.default(-1.1, -0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, 0L) Error in seq.default(-1.1, -0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, 1.1) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, 1L) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, 2.3) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, 2L) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, -1.1) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, -1L) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, 0) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, 0L) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, 1.1) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, 1L) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, 2.3) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, 2L) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, -1.1) [1] -1.1 -2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, -1L) [1] -1.1 -2.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, 0) Error in seq.default(-1.1, -2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, 0L) Error in seq.default(-1.1, -2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, 1.1) Error in seq.default(-1.1, -2.999999999, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, 1L) Error in seq.default(-1.1, -2.999999999, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, 2.3) Error in seq.default(-1.1, -2.999999999, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, 2L) Error in seq.default(-1.1, -2.999999999, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, -1.1) [1] -1.1 -2.2 -3.3 -4.4 -5.5 -6.6 -7.7 -8.8 -9.9 -11.0 -12.1 -13.2 [13] -14.3 -15.4 -16.5 -17.6 -18.7 -19.8 -20.9 -22.0 -23.1 -24.2 -25.3 -26.4 [25] -27.5 -28.6 -29.7 -30.8 -31.9 -33.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, -1L) [1] -1.1 -2.1 -3.1 -4.1 -5.1 -6.1 -7.1 -8.1 -9.1 -10.1 -11.1 -12.1 [13] -13.1 -14.1 -15.1 -16.1 -17.1 -18.1 -19.1 -20.1 -21.1 -22.1 -23.1 -24.1 [25] -25.1 -26.1 -27.1 -28.1 -29.1 -30.1 -31.1 -32.1 -33.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, 0) Error in seq.default(-1.1, -33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, 0L) Error in seq.default(-1.1, -33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, 1.1) Error in seq.default(-1.1, -33.3, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, 1L) Error in seq.default(-1.1, -33.3, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, 2.3) Error in seq.default(-1.1, -33.3, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, 2L) Error in seq.default(-1.1, -33.3, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, -1.1) [1] -1.1 -2.2 -3.3 -4.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, -1L) [1] -1.1 -2.1 -3.1 -4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, 0) Error in seq.default(-1.1, -5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, 0L) Error in seq.default(-1.1, -5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, 1.1) Error in seq.default(-1.1, -5, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, 1L) Error in seq.default(-1.1, -5, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, 2.3) Error in seq.default(-1.1, -5, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, 2L) Error in seq.default(-1.1, -5, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, -1.1) Error in seq.default(-1.1, 0.2, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, -1L) Error in seq.default(-1.1, 0.2, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, 0) Error in seq.default(-1.1, 0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, 0L) Error in seq.default(-1.1, 0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, 1.1) [1] -1.1 0.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, 1L) [1] -1.1 -0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, 2.3) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, 2L) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, -1.1) Error in seq.default(-1.1, 1.1, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, -1L) Error in seq.default(-1.1, 1.1, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, 0) Error in seq.default(-1.1, 1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, 0L) Error in seq.default(-1.1, 1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, 1.1) [1] -1.1 0.0 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, 1L) [1] -1.1 -0.1 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, 2.3) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, 2L) [1] -1.1 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, -1.1) Error in seq.default(-1.1, 2.999999999, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, -1L) Error in seq.default(-1.1, 2.999999999, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, 0) Error in seq.default(-1.1, 2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, 0L) Error in seq.default(-1.1, 2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, 1.1) [1] -1.1 0.0 1.1 2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, 1L) [1] -1.1 -0.1 0.9 1.9 2.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, 2.3) [1] -1.1 1.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, 2L) [1] -1.1 0.9 2.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, -1.1) Error in seq.default(-1.1, 33.3, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, -1L) Error in seq.default(-1.1, 33.3, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, 0) Error in seq.default(-1.1, 33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, 0L) Error in seq.default(-1.1, 33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, 1.1) [1] -1.1 0.0 1.1 2.2 3.3 4.4 5.5 6.6 7.7 8.8 9.9 11.0 12.1 13.2 14.3 [16] 15.4 16.5 17.6 18.7 19.8 20.9 22.0 23.1 24.2 25.3 26.4 27.5 28.6 29.7 30.8 [31] 31.9 33.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, 1L) [1] -1.1 -0.1 0.9 1.9 2.9 3.9 4.9 5.9 6.9 7.9 8.9 9.9 10.9 11.9 12.9 [16] 13.9 14.9 15.9 16.9 17.9 18.9 19.9 20.9 21.9 22.9 23.9 24.9 25.9 26.9 27.9 [31] 28.9 29.9 30.9 31.9 32.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, 2.3) [1] -1.1 1.2 3.5 5.8 8.1 10.4 12.7 15.0 17.3 19.6 21.9 24.2 26.5 28.8 31.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, 2L) [1] -1.1 0.9 2.9 4.9 6.9 8.9 10.9 12.9 14.9 16.9 18.9 20.9 22.9 24.9 26.9 [16] 28.9 30.9 32.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, -1.1) Error in seq.default(-1.1, 5, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, -1L) Error in seq.default(-1.1, 5, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, 0) Error in seq.default(-1.1, 5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, 0L) Error in seq.default(-1.1, 5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, 1.1) [1] -1.1 0.0 1.1 2.2 3.3 4.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, 1L) [1] -1.1 -0.1 0.9 1.9 2.9 3.9 4.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, 2.3) [1] -1.1 1.2 3.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, 2L) [1] -1.1 0.9 2.9 4.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, -1L, -1L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, -1L, 0L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, -1L, 1L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, -1L, 2L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, -30L, -1L) [1] -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 [20] -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, -30L, 0L) Error in seq.default(-1L, -30L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, -30L, 1L) Error in seq.default(-1L, -30L, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, -30L, 2L) Error in seq.default(-1L, -30L, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 0L, -1L) Error in seq.default(-1L, 0L, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 0L, 0L) Error in seq.default(-1L, 0L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 0L, 1L) [1] -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 0L, 2L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 1L, -1L) Error in seq.default(-1L, 1L, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 1L, 0L) Error in seq.default(-1L, 1L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 1L, 1L) [1] -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 1L, 2L) [1] -1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 30L, -1L) Error in seq.default(-1L, 30L, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 30L, 0L) Error in seq.default(-1L, 30L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 30L, 1L) [1] -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 [26] 24 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-1L, 30L, 2L) [1] -1 1 3 5 7 9 11 13 15 17 19 21 23 25 27 29 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, -1.1) Error in seq.default(-2.999999999, -0.2, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, -1L) Error in seq.default(-2.999999999, -0.2, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, 0) Error in seq.default(-2.999999999, -0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, 0L) Error in seq.default(-2.999999999, -0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, 1.1) [1] -3.0 -1.9 -0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, 1L) [1] -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, 2.3) [1] -3.0 -0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, 2L) [1] -3 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, -1.1) Error in seq.default(-2.999999999, -1.1, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, -1L) Error in seq.default(-2.999999999, -1.1, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, 0) Error in seq.default(-2.999999999, -1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, 0L) Error in seq.default(-2.999999999, -1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, 1.1) [1] -3.0 -1.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, 1L) [1] -3 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, 2.3) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, 2L) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, -1.1) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, -1L) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, 0) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, 0L) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, 1.1) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, 1L) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, 2.3) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, 2L) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, -1.1) [1] -3.0 -4.1 -5.2 -6.3 -7.4 -8.5 -9.6 -10.7 -11.8 -12.9 -14.0 -15.1 [13] -16.2 -17.3 -18.4 -19.5 -20.6 -21.7 -22.8 -23.9 -25.0 -26.1 -27.2 -28.3 [25] -29.4 -30.5 -31.6 -32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, -1L) [1] -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 [20] -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, 0) Error in seq.default(-2.999999999, -33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, 0L) Error in seq.default(-2.999999999, -33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, 1.1) Error in seq.default(-2.999999999, -33.3, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, 1L) Error in seq.default(-2.999999999, -33.3, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, 2.3) Error in seq.default(-2.999999999, -33.3, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, 2L) Error in seq.default(-2.999999999, -33.3, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, -1.1) [1] -3.0 -4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, -1L) [1] -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, 0) Error in seq.default(-2.999999999, -5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, 0L) Error in seq.default(-2.999999999, -5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, 1.1) Error in seq.default(-2.999999999, -5, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, 1L) Error in seq.default(-2.999999999, -5, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, 2.3) Error in seq.default(-2.999999999, -5, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, 2L) Error in seq.default(-2.999999999, -5, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, -1.1) Error in seq.default(-2.999999999, 0.2, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, -1L) Error in seq.default(-2.999999999, 0.2, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, 0) Error in seq.default(-2.999999999, 0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, 0L) Error in seq.default(-2.999999999, 0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, 1.1) [1] -3.0 -1.9 -0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, 1L) [1] -3e+00 -2e+00 -1e+00 1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, 2.3) [1] -3.0 -0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, 2L) [1] -3 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, -1.1) Error in seq.default(-2.999999999, 1.1, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, -1L) Error in seq.default(-2.999999999, 1.1, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, 0) Error in seq.default(-2.999999999, 1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, 0L) Error in seq.default(-2.999999999, 1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, 1.1) [1] -3.0 -1.9 -0.8 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, 1L) [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, 2.3) [1] -3.0 -0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, 2L) [1] -3 -1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, -1.1) Error in seq.default(-2.999999999, 2.999999999, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, -1L) Error in seq.default(-2.999999999, 2.999999999, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, 0) Error in seq.default(-2.999999999, 2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, 0L) Error in seq.default(-2.999999999, 2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, 1.1) [1] -3.0 -1.9 -0.8 0.3 1.4 2.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, 1L) [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 2e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, 2.3) [1] -3.0 -0.7 1.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, 2L) [1] -3 -1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, -1.1) Error in seq.default(-2.999999999, 33.3, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, -1L) Error in seq.default(-2.999999999, 33.3, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, 0) Error in seq.default(-2.999999999, 33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, 0L) Error in seq.default(-2.999999999, 33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, 1.1) [1] -3.0 -1.9 -0.8 0.3 1.4 2.5 3.6 4.7 5.8 6.9 8.0 9.1 10.2 11.3 12.4 [16] 13.5 14.6 15.7 16.8 17.9 19.0 20.1 21.2 22.3 23.4 24.5 25.6 26.7 27.8 28.9 [31] 30.0 31.1 32.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, 1L) [1] -3.0e+00 -2.0e+00 -1.0e+00 1.0e-09 1.0e+00 2.0e+00 3.0e+00 4.0e+00 [9] 5.0e+00 6.0e+00 7.0e+00 8.0e+00 9.0e+00 1.0e+01 1.1e+01 1.2e+01 [17] 1.3e+01 1.4e+01 1.5e+01 1.6e+01 1.7e+01 1.8e+01 1.9e+01 2.0e+01 [25] 2.1e+01 2.2e+01 2.3e+01 2.4e+01 2.5e+01 2.6e+01 2.7e+01 2.8e+01 [33] 2.9e+01 3.0e+01 3.1e+01 3.2e+01 3.3e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, 2.3) [1] -3.0 -0.7 1.6 3.9 6.2 8.5 10.8 13.1 15.4 17.7 20.0 22.3 24.6 26.9 29.2 [16] 31.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, 2L) [1] -3 -1 1 3 5 7 9 11 13 15 17 19 21 23 25 27 29 31 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, -1.1) Error in seq.default(-2.999999999, 5, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, -1L) Error in seq.default(-2.999999999, 5, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, 0) Error in seq.default(-2.999999999, 5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, 0L) Error in seq.default(-2.999999999, 5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, 1.1) [1] -3.0 -1.9 -0.8 0.3 1.4 2.5 3.6 4.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, 1L) [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 2e+00 3e+00 4e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, 2.3) [1] -3.0 -0.7 1.6 3.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, 2L) [1] -3 -1 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, -1L, -1L) Error in seq.default(-30L, -1L, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, -1L, 0L) Error in seq.default(-30L, -1L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, -1L, 1L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, -1L, 2L) [1] -30 -28 -26 -24 -22 -20 -18 -16 -14 -12 -10 -8 -6 -4 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, -30L, -1L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, -30L, 0L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, -30L, 1L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, -30L, 2L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 0L, -1L) Error in seq.default(-30L, 0L, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 0L, 0L) Error in seq.default(-30L, 0L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 0L, 1L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 0L, 2L) [1] -30 -28 -26 -24 -22 -20 -18 -16 -14 -12 -10 -8 -6 -4 -2 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 1L, -1L) Error in seq.default(-30L, 1L, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 1L, 0L) Error in seq.default(-30L, 1L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 1L, 1L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 1L, 2L) [1] -30 -28 -26 -24 -22 -20 -18 -16 -14 -12 -10 -8 -6 -4 -2 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 30L, -1L) Error in seq.default(-30L, 30L, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 30L, 0L) Error in seq.default(-30L, 30L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 30L, 1L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 [39] 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 [58] 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-30L, 30L, 2L) [1] -30 -28 -26 -24 -22 -20 -18 -16 -14 -12 -10 -8 -6 -4 -2 0 2 4 6 [20] 8 10 12 14 16 18 20 22 24 26 28 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, -1.1) Error in seq.default(-33.3, -0.2, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, -1L) Error in seq.default(-33.3, -0.2, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, 0) Error in seq.default(-33.3, -0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, 0L) Error in seq.default(-33.3, -0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, 1.1) [1] -33.3 -32.2 -31.1 -30.0 -28.9 -27.8 -26.7 -25.6 -24.5 -23.4 -22.3 -21.2 [13] -20.1 -19.0 -17.9 -16.8 -15.7 -14.6 -13.5 -12.4 -11.3 -10.2 -9.1 -8.0 [25] -6.9 -5.8 -4.7 -3.6 -2.5 -1.4 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, 1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, 2.3) [1] -33.3 -31.0 -28.7 -26.4 -24.1 -21.8 -19.5 -17.2 -14.9 -12.6 -10.3 -8.0 [13] -5.7 -3.4 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, 2L) [1] -33.3 -31.3 -29.3 -27.3 -25.3 -23.3 -21.3 -19.3 -17.3 -15.3 -13.3 -11.3 [13] -9.3 -7.3 -5.3 -3.3 -1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, -1.1) Error in seq.default(-33.3, -1.1, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, -1L) Error in seq.default(-33.3, -1.1, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, 0) Error in seq.default(-33.3, -1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, 0L) Error in seq.default(-33.3, -1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, 1.1) [1] -33.3 -32.2 -31.1 -30.0 -28.9 -27.8 -26.7 -25.6 -24.5 -23.4 -22.3 -21.2 [13] -20.1 -19.0 -17.9 -16.8 -15.7 -14.6 -13.5 -12.4 -11.3 -10.2 -9.1 -8.0 [25] -6.9 -5.8 -4.7 -3.6 -2.5 -1.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, 1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, 2.3) [1] -33.3 -31.0 -28.7 -26.4 -24.1 -21.8 -19.5 -17.2 -14.9 -12.6 -10.3 -8.0 [13] -5.7 -3.4 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, 2L) [1] -33.3 -31.3 -29.3 -27.3 -25.3 -23.3 -21.3 -19.3 -17.3 -15.3 -13.3 -11.3 [13] -9.3 -7.3 -5.3 -3.3 -1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, -1.1) Error in seq.default(-33.3, -2.999999999, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, -1L) Error in seq.default(-33.3, -2.999999999, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, 0) Error in seq.default(-33.3, -2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, 0L) Error in seq.default(-33.3, -2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, 1.1) [1] -33.3 -32.2 -31.1 -30.0 -28.9 -27.8 -26.7 -25.6 -24.5 -23.4 -22.3 -21.2 [13] -20.1 -19.0 -17.9 -16.8 -15.7 -14.6 -13.5 -12.4 -11.3 -10.2 -9.1 -8.0 [25] -6.9 -5.8 -4.7 -3.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, 1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, 2.3) [1] -33.3 -31.0 -28.7 -26.4 -24.1 -21.8 -19.5 -17.2 -14.9 -12.6 -10.3 -8.0 [13] -5.7 -3.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, 2L) [1] -33.3 -31.3 -29.3 -27.3 -25.3 -23.3 -21.3 -19.3 -17.3 -15.3 -13.3 -11.3 [13] -9.3 -7.3 -5.3 -3.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, -1.1) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, -1L) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, 0) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, 0L) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, 1.1) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, 1L) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, 2.3) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, 2L) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, -1.1) Error in seq.default(-33.3, -5, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, -1L) Error in seq.default(-33.3, -5, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, 0) Error in seq.default(-33.3, -5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, 0L) Error in seq.default(-33.3, -5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, 1.1) [1] -33.3 -32.2 -31.1 -30.0 -28.9 -27.8 -26.7 -25.6 -24.5 -23.4 -22.3 -21.2 [13] -20.1 -19.0 -17.9 -16.8 -15.7 -14.6 -13.5 -12.4 -11.3 -10.2 -9.1 -8.0 [25] -6.9 -5.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, 1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, 2.3) [1] -33.3 -31.0 -28.7 -26.4 -24.1 -21.8 -19.5 -17.2 -14.9 -12.6 -10.3 -8.0 [13] -5.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, 2L) [1] -33.3 -31.3 -29.3 -27.3 -25.3 -23.3 -21.3 -19.3 -17.3 -15.3 -13.3 -11.3 [13] -9.3 -7.3 -5.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, -1.1) Error in seq.default(-33.3, 0.2, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, -1L) Error in seq.default(-33.3, 0.2, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, 0) Error in seq.default(-33.3, 0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, 0L) Error in seq.default(-33.3, 0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, 1.1) [1] -33.3 -32.2 -31.1 -30.0 -28.9 -27.8 -26.7 -25.6 -24.5 -23.4 -22.3 -21.2 [13] -20.1 -19.0 -17.9 -16.8 -15.7 -14.6 -13.5 -12.4 -11.3 -10.2 -9.1 -8.0 [25] -6.9 -5.8 -4.7 -3.6 -2.5 -1.4 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, 1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, 2.3) [1] -33.3 -31.0 -28.7 -26.4 -24.1 -21.8 -19.5 -17.2 -14.9 -12.6 -10.3 -8.0 [13] -5.7 -3.4 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, 2L) [1] -33.3 -31.3 -29.3 -27.3 -25.3 -23.3 -21.3 -19.3 -17.3 -15.3 -13.3 -11.3 [13] -9.3 -7.3 -5.3 -3.3 -1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, -1.1) Error in seq.default(-33.3, 1.1, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, -1L) Error in seq.default(-33.3, 1.1, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, 0) Error in seq.default(-33.3, 1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, 0L) Error in seq.default(-33.3, 1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, 1.1) [1] -33.3 -32.2 -31.1 -30.0 -28.9 -27.8 -26.7 -25.6 -24.5 -23.4 -22.3 -21.2 [13] -20.1 -19.0 -17.9 -16.8 -15.7 -14.6 -13.5 -12.4 -11.3 -10.2 -9.1 -8.0 [25] -6.9 -5.8 -4.7 -3.6 -2.5 -1.4 -0.3 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, 1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, 2.3) [1] -33.3 -31.0 -28.7 -26.4 -24.1 -21.8 -19.5 -17.2 -14.9 -12.6 -10.3 -8.0 [13] -5.7 -3.4 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, 2L) [1] -33.3 -31.3 -29.3 -27.3 -25.3 -23.3 -21.3 -19.3 -17.3 -15.3 -13.3 -11.3 [13] -9.3 -7.3 -5.3 -3.3 -1.3 0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, -1.1) Error in seq.default(-33.3, 2.999999999, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, -1L) Error in seq.default(-33.3, 2.999999999, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, 0) Error in seq.default(-33.3, 2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, 0L) Error in seq.default(-33.3, 2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, 1.1) [1] -33.3 -32.2 -31.1 -30.0 -28.9 -27.8 -26.7 -25.6 -24.5 -23.4 -22.3 -21.2 [13] -20.1 -19.0 -17.9 -16.8 -15.7 -14.6 -13.5 -12.4 -11.3 -10.2 -9.1 -8.0 [25] -6.9 -5.8 -4.7 -3.6 -2.5 -1.4 -0.3 0.8 1.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, 1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, 2.3) [1] -33.3 -31.0 -28.7 -26.4 -24.1 -21.8 -19.5 -17.2 -14.9 -12.6 -10.3 -8.0 [13] -5.7 -3.4 -1.1 1.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, 2L) [1] -33.3 -31.3 -29.3 -27.3 -25.3 -23.3 -21.3 -19.3 -17.3 -15.3 -13.3 -11.3 [13] -9.3 -7.3 -5.3 -3.3 -1.3 0.7 2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, -1.1) Error in seq.default(-33.3, 33.3, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, -1L) Error in seq.default(-33.3, 33.3, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, 0) Error in seq.default(-33.3, 33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, 0L) Error in seq.default(-33.3, 33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, 1.1) [1] -33.3 -32.2 -31.1 -30.0 -28.9 -27.8 -26.7 -25.6 -24.5 -23.4 -22.3 -21.2 [13] -20.1 -19.0 -17.9 -16.8 -15.7 -14.6 -13.5 -12.4 -11.3 -10.2 -9.1 -8.0 [25] -6.9 -5.8 -4.7 -3.6 -2.5 -1.4 -0.3 0.8 1.9 3.0 4.1 5.2 [37] 6.3 7.4 8.5 9.6 10.7 11.8 12.9 14.0 15.1 16.2 17.3 18.4 [49] 19.5 20.6 21.7 22.8 23.9 25.0 26.1 27.2 28.3 29.4 30.5 31.6 [61] 32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, 1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 3.7 4.7 5.7 6.7 7.7 8.7 9.7 10.7 11.7 12.7 13.7 [49] 14.7 15.7 16.7 17.7 18.7 19.7 20.7 21.7 22.7 23.7 24.7 25.7 [61] 26.7 27.7 28.7 29.7 30.7 31.7 32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, 2.3) [1] -33.3 -31.0 -28.7 -26.4 -24.1 -21.8 -19.5 -17.2 -14.9 -12.6 -10.3 -8.0 [13] -5.7 -3.4 -1.1 1.2 3.5 5.8 8.1 10.4 12.7 15.0 17.3 19.6 [25] 21.9 24.2 26.5 28.8 31.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, 2L) [1] -33.3 -31.3 -29.3 -27.3 -25.3 -23.3 -21.3 -19.3 -17.3 -15.3 -13.3 -11.3 [13] -9.3 -7.3 -5.3 -3.3 -1.3 0.7 2.7 4.7 6.7 8.7 10.7 12.7 [25] 14.7 16.7 18.7 20.7 22.7 24.7 26.7 28.7 30.7 32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, -1.1) Error in seq.default(-33.3, 5, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, -1L) Error in seq.default(-33.3, 5, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, 0) Error in seq.default(-33.3, 5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, 0L) Error in seq.default(-33.3, 5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, 1.1) [1] -33.3 -32.2 -31.1 -30.0 -28.9 -27.8 -26.7 -25.6 -24.5 -23.4 -22.3 -21.2 [13] -20.1 -19.0 -17.9 -16.8 -15.7 -14.6 -13.5 -12.4 -11.3 -10.2 -9.1 -8.0 [25] -6.9 -5.8 -4.7 -3.6 -2.5 -1.4 -0.3 0.8 1.9 3.0 4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, 1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 3.7 4.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, 2.3) [1] -33.3 -31.0 -28.7 -26.4 -24.1 -21.8 -19.5 -17.2 -14.9 -12.6 -10.3 -8.0 [13] -5.7 -3.4 -1.1 1.2 3.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, 2L) [1] -33.3 -31.3 -29.3 -27.3 -25.3 -23.3 -21.3 -19.3 -17.3 -15.3 -13.3 -11.3 [13] -9.3 -7.3 -5.3 -3.3 -1.3 0.7 2.7 4.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, -1.1) Error in seq.default(-5, -0.2, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, -1L) Error in seq.default(-5, -0.2, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, 0) Error in seq.default(-5, -0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, 0L) Error in seq.default(-5, -0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, 1.1) [1] -5.0 -3.9 -2.8 -1.7 -0.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, 1L) [1] -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, 2.3) [1] -5.0 -2.7 -0.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, 2L) [1] -5 -3 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, -1.1) Error in seq.default(-5, -1.1, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, -1L) Error in seq.default(-5, -1.1, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, 0) Error in seq.default(-5, -1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, 0L) Error in seq.default(-5, -1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, 1.1) [1] -5.0 -3.9 -2.8 -1.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, 1L) [1] -5 -4 -3 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, 2.3) [1] -5.0 -2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, 2L) [1] -5 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, -1.1) Error in seq.default(-5, -2.999999999, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, -1L) Error in seq.default(-5, -2.999999999, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, 0) Error in seq.default(-5, -2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, 0L) Error in seq.default(-5, -2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, 1.1) [1] -5.0 -3.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, 1L) [1] -5 -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, 2.3) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, 2L) [1] -5 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, -1.1) [1] -5.0 -6.1 -7.2 -8.3 -9.4 -10.5 -11.6 -12.7 -13.8 -14.9 -16.0 -17.1 [13] -18.2 -19.3 -20.4 -21.5 -22.6 -23.7 -24.8 -25.9 -27.0 -28.1 -29.2 -30.3 [25] -31.4 -32.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, -1L) [1] -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 [20] -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, 0) Error in seq.default(-5, -33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, 0L) Error in seq.default(-5, -33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, 1.1) Error in seq.default(-5, -33.3, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, 1L) Error in seq.default(-5, -33.3, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, 2.3) Error in seq.default(-5, -33.3, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, 2L) Error in seq.default(-5, -33.3, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, -1.1) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, -1L) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, 0) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, 0L) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, 1.1) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, 1L) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, 2.3) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, 2L) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, -1.1) Error in seq.default(-5, 0.2, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, -1L) Error in seq.default(-5, 0.2, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, 0) Error in seq.default(-5, 0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, 0L) Error in seq.default(-5, 0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, 1.1) [1] -5.0 -3.9 -2.8 -1.7 -0.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, 1L) [1] -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, 2.3) [1] -5.0 -2.7 -0.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, 2L) [1] -5 -3 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, -1.1) Error in seq.default(-5, 1.1, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, -1L) Error in seq.default(-5, 1.1, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, 0) Error in seq.default(-5, 1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, 0L) Error in seq.default(-5, 1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, 1.1) [1] -5.0 -3.9 -2.8 -1.7 -0.6 0.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, 1L) [1] -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, 2.3) [1] -5.0 -2.7 -0.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, 2L) [1] -5 -3 -1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, -1.1) Error in seq.default(-5, 2.999999999, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, -1L) Error in seq.default(-5, 2.999999999, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, 0) Error in seq.default(-5, 2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, 0L) Error in seq.default(-5, 2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, 1.1) [1] -5.0 -3.9 -2.8 -1.7 -0.6 0.5 1.6 2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, 1L) [1] -5 -4 -3 -2 -1 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, 2.3) [1] -5.0 -2.7 -0.4 1.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, 2L) [1] -5 -3 -1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, -1.1) Error in seq.default(-5, 33.3, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, -1L) Error in seq.default(-5, 33.3, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, 0) Error in seq.default(-5, 33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, 0L) Error in seq.default(-5, 33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, 1.1) [1] -5.0 -3.9 -2.8 -1.7 -0.6 0.5 1.6 2.7 3.8 4.9 6.0 7.1 8.2 9.3 10.4 [16] 11.5 12.6 13.7 14.8 15.9 17.0 18.1 19.2 20.3 21.4 22.5 23.6 24.7 25.8 26.9 [31] 28.0 29.1 30.2 31.3 32.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, 1L) [1] -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 [26] 20 21 22 23 24 25 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, 2.3) [1] -5.0 -2.7 -0.4 1.9 4.2 6.5 8.8 11.1 13.4 15.7 18.0 20.3 22.6 24.9 27.2 [16] 29.5 31.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, 2L) [1] -5 -3 -1 1 3 5 7 9 11 13 15 17 19 21 23 25 27 29 31 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, -1.1) Error in seq.default(-5, 5, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, -1L) Error in seq.default(-5, 5, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, 0) Error in seq.default(-5, 5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, 0L) Error in seq.default(-5, 5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, 1.1) [1] -5.0 -3.9 -2.8 -1.7 -0.6 0.5 1.6 2.7 3.8 4.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, 1L) [1] -5 -4 -3 -2 -1 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, 2.3) [1] -5.0 -2.7 -0.4 1.9 4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, 2L) [1] -5 -3 -1 1 3 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, -1.1) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, -1L) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, 0) Error in seq.default(0.2, -0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, 0L) Error in seq.default(0.2, -0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, 1.1) Error in seq.default(0.2, -0.2, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, 1L) Error in seq.default(0.2, -0.2, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, 2.3) Error in seq.default(0.2, -0.2, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, 2L) Error in seq.default(0.2, -0.2, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, -1.1) [1] 0.2 -0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, -1L) [1] 0.2 -0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, 0) Error in seq.default(0.2, -1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, 0L) Error in seq.default(0.2, -1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, 1.1) Error in seq.default(0.2, -1.1, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, 1L) Error in seq.default(0.2, -1.1, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, 2.3) Error in seq.default(0.2, -1.1, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, 2L) Error in seq.default(0.2, -1.1, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, -1.1) [1] 0.2 -0.9 -2.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, -1L) [1] 0.2 -0.8 -1.8 -2.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, 0) Error in seq.default(0.2, -2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, 0L) Error in seq.default(0.2, -2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, 1.1) Error in seq.default(0.2, -2.999999999, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, 1L) Error in seq.default(0.2, -2.999999999, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, 2.3) Error in seq.default(0.2, -2.999999999, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, 2L) Error in seq.default(0.2, -2.999999999, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, -1.1) [1] 0.2 -0.9 -2.0 -3.1 -4.2 -5.3 -6.4 -7.5 -8.6 -9.7 -10.8 -11.9 [13] -13.0 -14.1 -15.2 -16.3 -17.4 -18.5 -19.6 -20.7 -21.8 -22.9 -24.0 -25.1 [25] -26.2 -27.3 -28.4 -29.5 -30.6 -31.7 -32.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, -1L) [1] 0.2 -0.8 -1.8 -2.8 -3.8 -4.8 -5.8 -6.8 -7.8 -8.8 -9.8 -10.8 [13] -11.8 -12.8 -13.8 -14.8 -15.8 -16.8 -17.8 -18.8 -19.8 -20.8 -21.8 -22.8 [25] -23.8 -24.8 -25.8 -26.8 -27.8 -28.8 -29.8 -30.8 -31.8 -32.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, 0) Error in seq.default(0.2, -33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, 0L) Error in seq.default(0.2, -33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, 1.1) Error in seq.default(0.2, -33.3, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, 1L) Error in seq.default(0.2, -33.3, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, 2.3) Error in seq.default(0.2, -33.3, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, 2L) Error in seq.default(0.2, -33.3, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, -1.1) [1] 0.2 -0.9 -2.0 -3.1 -4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, -1L) [1] 0.2 -0.8 -1.8 -2.8 -3.8 -4.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, 0) Error in seq.default(0.2, -5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, 0L) Error in seq.default(0.2, -5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, 1.1) Error in seq.default(0.2, -5, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, 1L) Error in seq.default(0.2, -5, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, 2.3) Error in seq.default(0.2, -5, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, 2L) Error in seq.default(0.2, -5, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, -1.1) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, -1L) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, 0) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, 0L) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, 1.1) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, 1L) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, 2.3) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, 2L) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, -1.1) Error in seq.default(0.2, 1.1, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, -1L) Error in seq.default(0.2, 1.1, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, 0) Error in seq.default(0.2, 1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, 0L) Error in seq.default(0.2, 1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, 1.1) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, 1L) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, 2.3) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, 2L) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, -1.1) Error in seq.default(0.2, 2.999999999, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, -1L) Error in seq.default(0.2, 2.999999999, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, 0) Error in seq.default(0.2, 2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, 0L) Error in seq.default(0.2, 2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, 1.1) [1] 0.2 1.3 2.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, 1L) [1] 0.2 1.2 2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, 2.3) [1] 0.2 2.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, 2L) [1] 0.2 2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, -1.1) Error in seq.default(0.2, 33.3, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, -1L) Error in seq.default(0.2, 33.3, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, 0) Error in seq.default(0.2, 33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, 0L) Error in seq.default(0.2, 33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, 1.1) [1] 0.2 1.3 2.4 3.5 4.6 5.7 6.8 7.9 9.0 10.1 11.2 12.3 13.4 14.5 15.6 [16] 16.7 17.8 18.9 20.0 21.1 22.2 23.3 24.4 25.5 26.6 27.7 28.8 29.9 31.0 32.1 [31] 33.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, 1L) [1] 0.2 1.2 2.2 3.2 4.2 5.2 6.2 7.2 8.2 9.2 10.2 11.2 12.2 13.2 14.2 [16] 15.2 16.2 17.2 18.2 19.2 20.2 21.2 22.2 23.2 24.2 25.2 26.2 27.2 28.2 29.2 [31] 30.2 31.2 32.2 33.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, 2.3) [1] 0.2 2.5 4.8 7.1 9.4 11.7 14.0 16.3 18.6 20.9 23.2 25.5 27.8 30.1 32.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, 2L) [1] 0.2 2.2 4.2 6.2 8.2 10.2 12.2 14.2 16.2 18.2 20.2 22.2 24.2 26.2 28.2 [16] 30.2 32.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, -1.1) Error in seq.default(0.2, 5, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, -1L) Error in seq.default(0.2, 5, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, 0) Error in seq.default(0.2, 5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, 0L) Error in seq.default(0.2, 5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, 1.1) [1] 0.2 1.3 2.4 3.5 4.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, 1L) [1] 0.2 1.2 2.2 3.2 4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, 2.3) [1] 0.2 2.5 4.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, 2L) [1] 0.2 2.2 4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, -1L, -1L) [1] 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, -1L, 0L) Error in seq.default(0L, -1L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, -1L, 1L) Error in seq.default(0L, -1L, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, -1L, 2L) Error in seq.default(0L, -1L, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, -30L, -1L) [1] 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 [20] -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, -30L, 0L) Error in seq.default(0L, -30L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, -30L, 1L) Error in seq.default(0L, -30L, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, -30L, 2L) Error in seq.default(0L, -30L, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 0L, -1L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 0L, 0L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 0L, 1L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 0L, 2L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 1L, -1L) Error in seq.default(0L, 1L, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 1L, 0L) Error in seq.default(0L, 1L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 1L, 1L) [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 1L, 2L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 30L, -1L) Error in seq.default(0L, 30L, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 30L, 0L) Error in seq.default(0L, 30L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 30L, 1L) [1] 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 [26] 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(0L, 30L, 2L) [1] 0 2 4 6 8 10 12 14 16 18 20 22 24 26 28 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, -1.1) [1] 1.1 0.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, -1L) [1] 1.1 0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, 0) Error in seq.default(1.1, -0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, 0L) Error in seq.default(1.1, -0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, 1.1) Error in seq.default(1.1, -0.2, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, 1L) Error in seq.default(1.1, -0.2, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, 2.3) Error in seq.default(1.1, -0.2, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, 2L) Error in seq.default(1.1, -0.2, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, -1.1) [1] 1.1 0.0 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, -1L) [1] 1.1 0.1 -0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, 0) Error in seq.default(1.1, -1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, 0L) Error in seq.default(1.1, -1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, 1.1) Error in seq.default(1.1, -1.1, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, 1L) Error in seq.default(1.1, -1.1, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, 2.3) Error in seq.default(1.1, -1.1, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, 2L) Error in seq.default(1.1, -1.1, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, -1.1) [1] 1.1 0.0 -1.1 -2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, -1L) [1] 1.1 0.1 -0.9 -1.9 -2.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, 0) Error in seq.default(1.1, -2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, 0L) Error in seq.default(1.1, -2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, 1.1) Error in seq.default(1.1, -2.999999999, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, 1L) Error in seq.default(1.1, -2.999999999, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, 2.3) Error in seq.default(1.1, -2.999999999, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, 2L) Error in seq.default(1.1, -2.999999999, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, -1.1) [1] 1.1 0.0 -1.1 -2.2 -3.3 -4.4 -5.5 -6.6 -7.7 -8.8 -9.9 -11.0 [13] -12.1 -13.2 -14.3 -15.4 -16.5 -17.6 -18.7 -19.8 -20.9 -22.0 -23.1 -24.2 [25] -25.3 -26.4 -27.5 -28.6 -29.7 -30.8 -31.9 -33.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, -1L) [1] 1.1 0.1 -0.9 -1.9 -2.9 -3.9 -4.9 -5.9 -6.9 -7.9 -8.9 -9.9 [13] -10.9 -11.9 -12.9 -13.9 -14.9 -15.9 -16.9 -17.9 -18.9 -19.9 -20.9 -21.9 [25] -22.9 -23.9 -24.9 -25.9 -26.9 -27.9 -28.9 -29.9 -30.9 -31.9 -32.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, 0) Error in seq.default(1.1, -33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, 0L) Error in seq.default(1.1, -33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, 1.1) Error in seq.default(1.1, -33.3, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, 1L) Error in seq.default(1.1, -33.3, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, 2.3) Error in seq.default(1.1, -33.3, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, 2L) Error in seq.default(1.1, -33.3, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, -1.1) [1] 1.1 0.0 -1.1 -2.2 -3.3 -4.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, -1L) [1] 1.1 0.1 -0.9 -1.9 -2.9 -3.9 -4.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, 0) Error in seq.default(1.1, -5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, 0L) Error in seq.default(1.1, -5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, 1.1) Error in seq.default(1.1, -5, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, 1L) Error in seq.default(1.1, -5, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, 2.3) Error in seq.default(1.1, -5, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, 2L) Error in seq.default(1.1, -5, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, -1.1) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, -1L) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, 0) Error in seq.default(1.1, 0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, 0L) Error in seq.default(1.1, 0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, 1.1) Error in seq.default(1.1, 0.2, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, 1L) Error in seq.default(1.1, 0.2, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, 2.3) Error in seq.default(1.1, 0.2, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, 2L) Error in seq.default(1.1, 0.2, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, -1.1) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, -1L) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, 0) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, 0L) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, 1.1) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, 1L) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, 2.3) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, 2L) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, -1.1) Error in seq.default(1.1, 2.999999999, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, -1L) Error in seq.default(1.1, 2.999999999, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, 0) Error in seq.default(1.1, 2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, 0L) Error in seq.default(1.1, 2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, 1.1) [1] 1.1 2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, 1L) [1] 1.1 2.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, 2.3) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, 2L) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, -1.1) Error in seq.default(1.1, 33.3, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, -1L) Error in seq.default(1.1, 33.3, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, 0) Error in seq.default(1.1, 33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, 0L) Error in seq.default(1.1, 33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, 1.1) [1] 1.1 2.2 3.3 4.4 5.5 6.6 7.7 8.8 9.9 11.0 12.1 13.2 14.3 15.4 16.5 [16] 17.6 18.7 19.8 20.9 22.0 23.1 24.2 25.3 26.4 27.5 28.6 29.7 30.8 31.9 33.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, 1L) [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 11.1 12.1 13.1 14.1 15.1 [16] 16.1 17.1 18.1 19.1 20.1 21.1 22.1 23.1 24.1 25.1 26.1 27.1 28.1 29.1 30.1 [31] 31.1 32.1 33.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, 2.3) [1] 1.1 3.4 5.7 8.0 10.3 12.6 14.9 17.2 19.5 21.8 24.1 26.4 28.7 31.0 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, 2L) [1] 1.1 3.1 5.1 7.1 9.1 11.1 13.1 15.1 17.1 19.1 21.1 23.1 25.1 27.1 29.1 [16] 31.1 33.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, -1.1) Error in seq.default(1.1, 5, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, -1L) Error in seq.default(1.1, 5, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, 0) Error in seq.default(1.1, 5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, 0L) Error in seq.default(1.1, 5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, 1.1) [1] 1.1 2.2 3.3 4.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, 1L) [1] 1.1 2.1 3.1 4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, 2.3) [1] 1.1 3.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, 2L) [1] 1.1 3.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, -1L, -1L) [1] 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, -1L, 0L) Error in seq.default(1L, -1L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, -1L, 1L) Error in seq.default(1L, -1L, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, -1L, 2L) Error in seq.default(1L, -1L, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, -30L, -1L) [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 [20] -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, -30L, 0L) Error in seq.default(1L, -30L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, -30L, 1L) Error in seq.default(1L, -30L, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, -30L, 2L) Error in seq.default(1L, -30L, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 0L, -1L) [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 0L, 0L) Error in seq.default(1L, 0L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 0L, 1L) Error in seq.default(1L, 0L, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 0L, 2L) Error in seq.default(1L, 0L, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 1L, -1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 1L, 0L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 1L, 1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 1L, 2L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 30L, -1L) Error in seq.default(1L, 30L, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 30L, 0L) Error in seq.default(1L, 30L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 30L, 1L) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(1L, 30L, 2L) [1] 1 3 5 7 9 11 13 15 17 19 21 23 25 27 29 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric# #seq(2.3, 7.6, 0.1) [1] 2.3 2.4 2.5 2.6 2.7 2.8 2.9 3.0 3.1 3.2 3.3 3.4 3.5 3.6 3.7 3.8 3.9 4.0 4.1 [20] 4.2 4.3 4.4 4.5 4.6 4.7 4.8 4.9 5.0 5.1 5.2 5.3 5.4 5.5 5.6 5.7 5.8 5.9 6.0 [39] 6.1 6.2 6.3 6.4 6.5 6.6 6.7 6.8 6.9 7.0 7.1 7.2 7.3 7.4 7.5 7.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, -1.1) [1] 3.0 1.9 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, -1L) [1] 3e+00 2e+00 1e+00 -1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, 0) Error in seq.default(2.999999999, -0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, 0L) Error in seq.default(2.999999999, -0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, 1.1) Error in seq.default(2.999999999, -0.2, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, 1L) Error in seq.default(2.999999999, -0.2, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, 2.3) Error in seq.default(2.999999999, -0.2, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, 2L) Error in seq.default(2.999999999, -0.2, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, -1.1) [1] 3.0 1.9 0.8 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, -1L) [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, 0) Error in seq.default(2.999999999, -1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, 0L) Error in seq.default(2.999999999, -1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, 1.1) Error in seq.default(2.999999999, -1.1, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, 1L) Error in seq.default(2.999999999, -1.1, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, 2.3) Error in seq.default(2.999999999, -1.1, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, 2L) Error in seq.default(2.999999999, -1.1, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, -1.1) [1] 3.0 1.9 0.8 -0.3 -1.4 -2.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, -1L) [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 -2e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, 0) Error in seq.default(2.999999999, -2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, 0L) Error in seq.default(2.999999999, -2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, 1.1) Error in seq.default(2.999999999, -2.999999999, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, 1L) Error in seq.default(2.999999999, -2.999999999, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, 2.3) Error in seq.default(2.999999999, -2.999999999, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, 2L) Error in seq.default(2.999999999, -2.999999999, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, -1.1) [1] 3.0 1.9 0.8 -0.3 -1.4 -2.5 -3.6 -4.7 -5.8 -6.9 -8.0 -9.1 [13] -10.2 -11.3 -12.4 -13.5 -14.6 -15.7 -16.8 -17.9 -19.0 -20.1 -21.2 -22.3 [25] -23.4 -24.5 -25.6 -26.7 -27.8 -28.9 -30.0 -31.1 -32.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, -1L) [1] 3.0e+00 2.0e+00 1.0e+00 -1.0e-09 -1.0e+00 -2.0e+00 -3.0e+00 -4.0e+00 [9] -5.0e+00 -6.0e+00 -7.0e+00 -8.0e+00 -9.0e+00 -1.0e+01 -1.1e+01 -1.2e+01 [17] -1.3e+01 -1.4e+01 -1.5e+01 -1.6e+01 -1.7e+01 -1.8e+01 -1.9e+01 -2.0e+01 [25] -2.1e+01 -2.2e+01 -2.3e+01 -2.4e+01 -2.5e+01 -2.6e+01 -2.7e+01 -2.8e+01 [33] -2.9e+01 -3.0e+01 -3.1e+01 -3.2e+01 -3.3e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, 0) Error in seq.default(2.999999999, -33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, 0L) Error in seq.default(2.999999999, -33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, 1.1) Error in seq.default(2.999999999, -33.3, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, 1L) Error in seq.default(2.999999999, -33.3, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, 2.3) Error in seq.default(2.999999999, -33.3, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, 2L) Error in seq.default(2.999999999, -33.3, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, -1.1) [1] 3.0 1.9 0.8 -0.3 -1.4 -2.5 -3.6 -4.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, -1L) [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 -2e+00 -3e+00 -4e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, 0) Error in seq.default(2.999999999, -5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, 0L) Error in seq.default(2.999999999, -5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, 1.1) Error in seq.default(2.999999999, -5, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, 1L) Error in seq.default(2.999999999, -5, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, 2.3) Error in seq.default(2.999999999, -5, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, 2L) Error in seq.default(2.999999999, -5, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, -1.1) [1] 3.0 1.9 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, -1L) [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, 0) Error in seq.default(2.999999999, 0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, 0L) Error in seq.default(2.999999999, 0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, 1.1) Error in seq.default(2.999999999, 0.2, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, 1L) Error in seq.default(2.999999999, 0.2, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, 2.3) Error in seq.default(2.999999999, 0.2, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, 2L) Error in seq.default(2.999999999, 0.2, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, -1.1) [1] 3.0 1.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, -1L) [1] 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, 0) Error in seq.default(2.999999999, 1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, 0L) Error in seq.default(2.999999999, 1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, 1.1) Error in seq.default(2.999999999, 1.1, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, 1L) Error in seq.default(2.999999999, 1.1, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, 2.3) Error in seq.default(2.999999999, 1.1, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, 2L) Error in seq.default(2.999999999, 1.1, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, -1.1) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, -1L) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, 0) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, 0L) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, 1.1) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, 1L) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, 2.3) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, 2L) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, -1.1) Error in seq.default(2.999999999, 33.3, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, -1L) Error in seq.default(2.999999999, 33.3, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, 0) Error in seq.default(2.999999999, 33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, 0L) Error in seq.default(2.999999999, 33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, 1.1) [1] 3.0 4.1 5.2 6.3 7.4 8.5 9.6 10.7 11.8 12.9 14.0 15.1 16.2 17.3 18.4 [16] 19.5 20.6 21.7 22.8 23.9 25.0 26.1 27.2 28.3 29.4 30.5 31.6 32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, 1L) [1] 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 [26] 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, 2.3) [1] 3.0 5.3 7.6 9.9 12.2 14.5 16.8 19.1 21.4 23.7 26.0 28.3 30.6 32.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, 2L) [1] 3 5 7 9 11 13 15 17 19 21 23 25 27 29 31 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, -1.1) Error in seq.default(2.999999999, 5, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, -1L) Error in seq.default(2.999999999, 5, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, 0) Error in seq.default(2.999999999, 5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, 0L) Error in seq.default(2.999999999, 5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, 1.1) [1] 3.0 4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, 1L) [1] 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, 2.3) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, 2L) [1] 3 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, -1L, -1L) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, -1L, 0L) Error in seq.default(30L, -1L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, -1L, 1L) Error in seq.default(30L, -1L, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, -1L, 2L) Error in seq.default(30L, -1L, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, -30L, -1L) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 [20] 11 10 9 8 7 6 5 4 3 2 1 0 -1 -2 -3 -4 -5 -6 -7 [39] -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 [58] -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, -30L, 0L) Error in seq.default(30L, -30L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, -30L, 1L) Error in seq.default(30L, -30L, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, -30L, 2L) Error in seq.default(30L, -30L, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 0L, -1L) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 0L, 0L) Error in seq.default(30L, 0L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 0L, 1L) Error in seq.default(30L, 0L, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 0L, 2L) Error in seq.default(30L, 0L, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 1L, -1L) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 1L, 0L) Error in seq.default(30L, 1L, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 1L, 1L) Error in seq.default(30L, 1L, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 1L, 2L) Error in seq.default(30L, 1L, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 30L, -1L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 30L, 0L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 30L, 1L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(30L, 30L, 2L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, -1.1) [1] 33.3 32.2 31.1 30.0 28.9 27.8 26.7 25.6 24.5 23.4 22.3 21.2 20.1 19.0 17.9 [16] 16.8 15.7 14.6 13.5 12.4 11.3 10.2 9.1 8.0 6.9 5.8 4.7 3.6 2.5 1.4 [31] 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, -1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, 0) Error in seq.default(33.3, -0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, 0L) Error in seq.default(33.3, -0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, 1.1) Error in seq.default(33.3, -0.2, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, 1L) Error in seq.default(33.3, -0.2, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, 2.3) Error in seq.default(33.3, -0.2, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, 2L) Error in seq.default(33.3, -0.2, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, -1.1) [1] 33.3 32.2 31.1 30.0 28.9 27.8 26.7 25.6 24.5 23.4 22.3 21.2 20.1 19.0 17.9 [16] 16.8 15.7 14.6 13.5 12.4 11.3 10.2 9.1 8.0 6.9 5.8 4.7 3.6 2.5 1.4 [31] 0.3 -0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, -1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, 0) Error in seq.default(33.3, -1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, 0L) Error in seq.default(33.3, -1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, 1.1) Error in seq.default(33.3, -1.1, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, 1L) Error in seq.default(33.3, -1.1, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, 2.3) Error in seq.default(33.3, -1.1, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, 2L) Error in seq.default(33.3, -1.1, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, -1.1) [1] 33.3 32.2 31.1 30.0 28.9 27.8 26.7 25.6 24.5 23.4 22.3 21.2 20.1 19.0 17.9 [16] 16.8 15.7 14.6 13.5 12.4 11.3 10.2 9.1 8.0 6.9 5.8 4.7 3.6 2.5 1.4 [31] 0.3 -0.8 -1.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, -1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 -1.7 -2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, 0) Error in seq.default(33.3, -2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, 0L) Error in seq.default(33.3, -2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, 1.1) Error in seq.default(33.3, -2.999999999, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, 1L) Error in seq.default(33.3, -2.999999999, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, 2.3) Error in seq.default(33.3, -2.999999999, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, 2L) Error in seq.default(33.3, -2.999999999, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, -1.1) [1] 33.3 32.2 31.1 30.0 28.9 27.8 26.7 25.6 24.5 23.4 22.3 21.2 [13] 20.1 19.0 17.9 16.8 15.7 14.6 13.5 12.4 11.3 10.2 9.1 8.0 [25] 6.9 5.8 4.7 3.6 2.5 1.4 0.3 -0.8 -1.9 -3.0 -4.1 -5.2 [37] -6.3 -7.4 -8.5 -9.6 -10.7 -11.8 -12.9 -14.0 -15.1 -16.2 -17.3 -18.4 [49] -19.5 -20.6 -21.7 -22.8 -23.9 -25.0 -26.1 -27.2 -28.3 -29.4 -30.5 -31.6 [61] -32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, -1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 [13] 21.3 20.3 19.3 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 [25] 9.3 8.3 7.3 6.3 5.3 4.3 3.3 2.3 1.3 0.3 -0.7 -1.7 [37] -2.7 -3.7 -4.7 -5.7 -6.7 -7.7 -8.7 -9.7 -10.7 -11.7 -12.7 -13.7 [49] -14.7 -15.7 -16.7 -17.7 -18.7 -19.7 -20.7 -21.7 -22.7 -23.7 -24.7 -25.7 [61] -26.7 -27.7 -28.7 -29.7 -30.7 -31.7 -32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, 0) Error in seq.default(33.3, -33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, 0L) Error in seq.default(33.3, -33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, 1.1) Error in seq.default(33.3, -33.3, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, 1L) Error in seq.default(33.3, -33.3, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, 2.3) Error in seq.default(33.3, -33.3, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, 2L) Error in seq.default(33.3, -33.3, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, -1.1) [1] 33.3 32.2 31.1 30.0 28.9 27.8 26.7 25.6 24.5 23.4 22.3 21.2 20.1 19.0 17.9 [16] 16.8 15.7 14.6 13.5 12.4 11.3 10.2 9.1 8.0 6.9 5.8 4.7 3.6 2.5 1.4 [31] 0.3 -0.8 -1.9 -3.0 -4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, -1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 -1.7 -2.7 -3.7 -4.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, 0) Error in seq.default(33.3, -5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, 0L) Error in seq.default(33.3, -5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, 1.1) Error in seq.default(33.3, -5, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, 1L) Error in seq.default(33.3, -5, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, 2.3) Error in seq.default(33.3, -5, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, 2L) Error in seq.default(33.3, -5, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, -1.1) [1] 33.3 32.2 31.1 30.0 28.9 27.8 26.7 25.6 24.5 23.4 22.3 21.2 20.1 19.0 17.9 [16] 16.8 15.7 14.6 13.5 12.4 11.3 10.2 9.1 8.0 6.9 5.8 4.7 3.6 2.5 1.4 [31] 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, -1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, 0) Error in seq.default(33.3, 0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, 0L) Error in seq.default(33.3, 0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, 1.1) Error in seq.default(33.3, 0.2, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, 1L) Error in seq.default(33.3, 0.2, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, 2.3) Error in seq.default(33.3, 0.2, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, 2L) Error in seq.default(33.3, 0.2, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, -1.1) [1] 33.3 32.2 31.1 30.0 28.9 27.8 26.7 25.6 24.5 23.4 22.3 21.2 20.1 19.0 17.9 [16] 16.8 15.7 14.6 13.5 12.4 11.3 10.2 9.1 8.0 6.9 5.8 4.7 3.6 2.5 1.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, -1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, 0) Error in seq.default(33.3, 1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, 0L) Error in seq.default(33.3, 1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, 1.1) Error in seq.default(33.3, 1.1, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, 1L) Error in seq.default(33.3, 1.1, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, 2.3) Error in seq.default(33.3, 1.1, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, 2L) Error in seq.default(33.3, 1.1, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, -1.1) [1] 33.3 32.2 31.1 30.0 28.9 27.8 26.7 25.6 24.5 23.4 22.3 21.2 20.1 19.0 17.9 [16] 16.8 15.7 14.6 13.5 12.4 11.3 10.2 9.1 8.0 6.9 5.8 4.7 3.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, -1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, 0) Error in seq.default(33.3, 2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, 0L) Error in seq.default(33.3, 2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, 1.1) Error in seq.default(33.3, 2.999999999, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, 1L) Error in seq.default(33.3, 2.999999999, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, 2.3) Error in seq.default(33.3, 2.999999999, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, 2L) Error in seq.default(33.3, 2.999999999, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, -1.1) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, -1L) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, 0) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, 0L) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, 1.1) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, 1L) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, 2.3) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, 2L) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, -1.1) [1] 33.3 32.2 31.1 30.0 28.9 27.8 26.7 25.6 24.5 23.4 22.3 21.2 20.1 19.0 17.9 [16] 16.8 15.7 14.6 13.5 12.4 11.3 10.2 9.1 8.0 6.9 5.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, -1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, 0) Error in seq.default(33.3, 5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, 0L) Error in seq.default(33.3, 5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, 1.1) Error in seq.default(33.3, 5, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, 1L) Error in seq.default(33.3, 5, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, 2.3) Error in seq.default(33.3, 5, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, 2L) Error in seq.default(33.3, 5, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, -1.1) [1] 5.0 3.9 2.8 1.7 0.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, -1L) [1] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, 0) Error in seq.default(5, -0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, 0L) Error in seq.default(5, -0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, 1.1) Error in seq.default(5, -0.2, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, 1L) Error in seq.default(5, -0.2, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, 2.3) Error in seq.default(5, -0.2, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, 2L) Error in seq.default(5, -0.2, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, -1.1) [1] 5.0 3.9 2.8 1.7 0.6 -0.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, -1L) [1] 5 4 3 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, 0) Error in seq.default(5, -1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, 0L) Error in seq.default(5, -1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, 1.1) Error in seq.default(5, -1.1, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, 1L) Error in seq.default(5, -1.1, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, 2.3) Error in seq.default(5, -1.1, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, 2L) Error in seq.default(5, -1.1, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, -1.1) [1] 5.0 3.9 2.8 1.7 0.6 -0.5 -1.6 -2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, -1L) [1] 5 4 3 2 1 0 -1 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, 0) Error in seq.default(5, -2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, 0L) Error in seq.default(5, -2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, 1.1) Error in seq.default(5, -2.999999999, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, 1L) Error in seq.default(5, -2.999999999, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, 2.3) Error in seq.default(5, -2.999999999, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, 2L) Error in seq.default(5, -2.999999999, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, -1.1) [1] 5.0 3.9 2.8 1.7 0.6 -0.5 -1.6 -2.7 -3.8 -4.9 -6.0 -7.1 [13] -8.2 -9.3 -10.4 -11.5 -12.6 -13.7 -14.8 -15.9 -17.0 -18.1 -19.2 -20.3 [25] -21.4 -22.5 -23.6 -24.7 -25.8 -26.9 -28.0 -29.1 -30.2 -31.3 -32.4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, -1L) [1] 5 4 3 2 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 [20] -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 [39] -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, 0) Error in seq.default(5, -33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, 0L) Error in seq.default(5, -33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, 1.1) Error in seq.default(5, -33.3, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, 1L) Error in seq.default(5, -33.3, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, 2.3) Error in seq.default(5, -33.3, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, 2L) Error in seq.default(5, -33.3, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -5, -1.1) [1] 5.0 3.9 2.8 1.7 0.6 -0.5 -1.6 -2.7 -3.8 -4.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -5, -1L) [1] 5 4 3 2 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -5, 0) Error in seq.default(5, -5, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -5, 0L) Error in seq.default(5, -5, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -5, 1.1) Error in seq.default(5, -5, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -5, 1L) Error in seq.default(5, -5, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -5, 2.3) Error in seq.default(5, -5, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, -5, 2L) Error in seq.default(5, -5, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, -1.1) [1] 5.0 3.9 2.8 1.7 0.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, -1L) [1] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, 0) Error in seq.default(5, 0.2, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, 0L) Error in seq.default(5, 0.2, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, 1.1) Error in seq.default(5, 0.2, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, 1L) Error in seq.default(5, 0.2, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, 2.3) Error in seq.default(5, 0.2, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, 2L) Error in seq.default(5, 0.2, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, -1.1) [1] 5.0 3.9 2.8 1.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, -1L) [1] 5 4 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, 0) Error in seq.default(5, 1.1, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, 0L) Error in seq.default(5, 1.1, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, 1.1) Error in seq.default(5, 1.1, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, 1L) Error in seq.default(5, 1.1, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, 2.3) Error in seq.default(5, 1.1, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, 2L) Error in seq.default(5, 1.1, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, -1.1) [1] 5.0 3.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, -1L) [1] 5 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, 0) Error in seq.default(5, 2.999999999, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, 0L) Error in seq.default(5, 2.999999999, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, 1.1) Error in seq.default(5, 2.999999999, 1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, 1L) Error in seq.default(5, 2.999999999, 1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, 2.3) Error in seq.default(5, 2.999999999, 2.3) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, 2L) Error in seq.default(5, 2.999999999, 2L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, -1.1) Error in seq.default(5, 33.3, -1.1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, -1L) Error in seq.default(5, 33.3, -1L) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, 0) Error in seq.default(5, 33.3, 0) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, 0L) Error in seq.default(5, 33.3, 0L) : invalid '(to - from)/by' ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, 1.1) [1] 5.0 6.1 7.2 8.3 9.4 10.5 11.6 12.7 13.8 14.9 16.0 17.1 18.2 19.3 20.4 [16] 21.5 22.6 23.7 24.8 25.9 27.0 28.1 29.2 30.3 31.4 32.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, 1L) [1] 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 [26] 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, 2.3) [1] 5.0 7.3 9.6 11.9 14.2 16.5 18.8 21.1 23.4 25.7 28.0 30.3 32.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, 2L) [1] 5 7 9 11 13 15 17 19 21 23 25 27 29 31 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 5, -1.1) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 5, -1L) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 5, 0) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 5, 0L) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 5, 1.1) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 5, 1L) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 5, 2.3) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToByNumeric#Output.IgnoreErrorMessage# #seq(5, 5, 2L) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, length.out=-1.1) Error in seq.default(-0.2, -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, length.out=-2.999999999) Error in seq.default(-0.2, -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, length.out=-33.3) Error in seq.default(-0.2, -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, length.out=-5) Error in seq.default(-0.2, -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, length.out=1.1) [1] -0.2 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, length.out=2.999999999) [1] -0.2 -0.2 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, length.out=33.3) [1] -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 [16] -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 -0.2 [31] -0.2 -0.2 -0.2 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -0.2, length.out=5) [1] -0.2 -0.2 -0.2 -0.2 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, length.out=-1.1) Error in seq.default(-0.2, -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, length.out=-2.999999999) Error in seq.default(-0.2, -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, length.out=-33.3) Error in seq.default(-0.2, -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, length.out=-5) Error in seq.default(-0.2, -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, length.out=1.1) [1] -0.2 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, length.out=2.999999999) [1] -0.20 -0.65 -1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, length.out=33.3) [1] -0.2000000 -0.2272727 -0.2545455 -0.2818182 -0.3090909 -0.3363636 [7] -0.3636364 -0.3909091 -0.4181818 -0.4454545 -0.4727273 -0.5000000 [13] -0.5272727 -0.5545455 -0.5818182 -0.6090909 -0.6363636 -0.6636364 [19] -0.6909091 -0.7181818 -0.7454545 -0.7727273 -0.8000000 -0.8272727 [25] -0.8545455 -0.8818182 -0.9090909 -0.9363636 -0.9636364 -0.9909091 [31] -1.0181818 -1.0454545 -1.0727273 -1.1000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -1.1, length.out=5) [1] -0.200 -0.425 -0.650 -0.875 -1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, length.out=-1.1) Error in seq.default(-0.2, -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, length.out=-2.999999999) Error in seq.default(-0.2, -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, length.out=-33.3) Error in seq.default(-0.2, -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, length.out=-5) Error in seq.default(-0.2, -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, length.out=1.1) [1] -0.2 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, length.out=2.999999999) [1] -0.2 -1.6 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, length.out=33.3) [1] -0.2000000 -0.2848485 -0.3696970 -0.4545455 -0.5393939 -0.6242424 [7] -0.7090909 -0.7939394 -0.8787879 -0.9636364 -1.0484848 -1.1333333 [13] -1.2181818 -1.3030303 -1.3878788 -1.4727273 -1.5575758 -1.6424242 [19] -1.7272727 -1.8121212 -1.8969697 -1.9818182 -2.0666667 -2.1515152 [25] -2.2363636 -2.3212121 -2.4060606 -2.4909091 -2.5757576 -2.6606061 [31] -2.7454545 -2.8303030 -2.9151515 -3.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -2.999999999, length.out=5) [1] -0.2 -0.9 -1.6 -2.3 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, length.out=-1.1) Error in seq.default(-0.2, -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, length.out=-2.999999999) Error in seq.default(-0.2, -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, length.out=-33.3) Error in seq.default(-0.2, -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, length.out=-5) Error in seq.default(-0.2, -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, length.out=1.1) [1] -0.2 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, length.out=2.999999999) [1] -0.20 -16.75 -33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, length.out=33.3) [1] -0.200000 -1.203030 -2.206061 -3.209091 -4.212121 -5.215152 [7] -6.218182 -7.221212 -8.224242 -9.227273 -10.230303 -11.233333 [13] -12.236364 -13.239394 -14.242424 -15.245455 -16.248485 -17.251515 [19] -18.254545 -19.257576 -20.260606 -21.263636 -22.266667 -23.269697 [25] -24.272727 -25.275758 -26.278788 -27.281818 -28.284848 -29.287879 [31] -30.290909 -31.293939 -32.296970 -33.300000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -33.3, length.out=5) [1] -0.200 -8.475 -16.750 -25.025 -33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, length.out=-1.1) Error in seq.default(-0.2, -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, length.out=-2.999999999) Error in seq.default(-0.2, -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, length.out=-33.3) Error in seq.default(-0.2, -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, length.out=-5) Error in seq.default(-0.2, -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, length.out=1.1) [1] -0.2 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, length.out=2.999999999) [1] -0.2 -2.6 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, length.out=33.3) [1] -0.2000000 -0.3454545 -0.4909091 -0.6363636 -0.7818182 -0.9272727 [7] -1.0727273 -1.2181818 -1.3636364 -1.5090909 -1.6545455 -1.8000000 [13] -1.9454545 -2.0909091 -2.2363636 -2.3818182 -2.5272727 -2.6727273 [19] -2.8181818 -2.9636364 -3.1090909 -3.2545455 -3.4000000 -3.5454545 [25] -3.6909091 -3.8363636 -3.9818182 -4.1272727 -4.2727273 -4.4181818 [31] -4.5636364 -4.7090909 -4.8545455 -5.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, -5, length.out=5) [1] -0.2 -1.4 -2.6 -3.8 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, length.out=-1.1) Error in seq.default(-0.2, 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, length.out=-2.999999999) Error in seq.default(-0.2, 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, length.out=-33.3) Error in seq.default(-0.2, 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, length.out=-5) Error in seq.default(-0.2, 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, length.out=1.1) [1] -0.2 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, length.out=2.999999999) [1] -0.2 0.0 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, length.out=33.3) [1] -0.200000000 -0.187878788 -0.175757576 -0.163636364 -0.151515152 [6] -0.139393939 -0.127272727 -0.115151515 -0.103030303 -0.090909091 [11] -0.078787879 -0.066666667 -0.054545455 -0.042424242 -0.030303030 [16] -0.018181818 -0.006060606 0.006060606 0.018181818 0.030303030 [21] 0.042424242 0.054545455 0.066666667 0.078787879 0.090909091 [26] 0.103030303 0.115151515 0.127272727 0.139393939 0.151515152 [31] 0.163636364 0.175757576 0.187878788 0.200000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 0.2, length.out=5) [1] -0.2 -0.1 0.0 0.1 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, length.out=-1.1) Error in seq.default(-0.2, 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, length.out=-2.999999999) Error in seq.default(-0.2, 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, length.out=-33.3) Error in seq.default(-0.2, 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, length.out=-5) Error in seq.default(-0.2, 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, length.out=1.1) [1] -0.2 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, length.out=2.999999999) [1] -0.20 0.45 1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, length.out=33.3) [1] -0.200000000 -0.160606061 -0.121212121 -0.081818182 -0.042424242 [6] -0.003030303 0.036363636 0.075757576 0.115151515 0.154545455 [11] 0.193939394 0.233333333 0.272727273 0.312121212 0.351515152 [16] 0.390909091 0.430303030 0.469696970 0.509090909 0.548484848 [21] 0.587878788 0.627272727 0.666666667 0.706060606 0.745454545 [26] 0.784848485 0.824242424 0.863636364 0.903030303 0.942424242 [31] 0.981818182 1.021212121 1.060606061 1.100000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 1.1, length.out=5) [1] -0.200 0.125 0.450 0.775 1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, length.out=-1.1) Error in seq.default(-0.2, 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, length.out=-2.999999999) Error in seq.default(-0.2, 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, length.out=-33.3) Error in seq.default(-0.2, 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, length.out=-5) Error in seq.default(-0.2, 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, length.out=1.1) [1] -0.2 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, length.out=2.999999999) [1] -0.2 1.4 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, length.out=33.3) [1] -0.200000000 -0.103030303 -0.006060606 0.090909091 0.187878788 [6] 0.284848485 0.381818182 0.478787879 0.575757576 0.672727272 [11] 0.769696969 0.866666666 0.963636363 1.060606060 1.157575757 [16] 1.254545454 1.351515151 1.448484848 1.545454545 1.642424242 [21] 1.739393939 1.836363636 1.933333333 2.030303030 2.127272727 [26] 2.224242423 2.321212120 2.418181817 2.515151514 2.612121211 [31] 2.709090908 2.806060605 2.903030302 2.999999999 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 2.999999999, length.out=5) [1] -0.2 0.6 1.4 2.2 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, length.out=-1.1) Error in seq.default(-0.2, 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, length.out=-2.999999999) Error in seq.default(-0.2, 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, length.out=-33.3) Error in seq.default(-0.2, 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, length.out=-5) Error in seq.default(-0.2, 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, length.out=1.1) [1] -0.2 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, length.out=2.999999999) [1] -0.20 16.55 33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, length.out=33.3) [1] -0.2000000 0.8151515 1.8303030 2.8454545 3.8606061 4.8757576 [7] 5.8909091 6.9060606 7.9212121 8.9363636 9.9515152 10.9666667 [13] 11.9818182 12.9969697 14.0121212 15.0272727 16.0424242 17.0575758 [19] 18.0727273 19.0878788 20.1030303 21.1181818 22.1333333 23.1484848 [25] 24.1636364 25.1787879 26.1939394 27.2090909 28.2242424 29.2393939 [31] 30.2545455 31.2696970 32.2848485 33.3000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 33.3, length.out=5) [1] -0.200 8.175 16.550 24.925 33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, length.out=-1.1) Error in seq.default(-0.2, 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, length.out=-2.999999999) Error in seq.default(-0.2, 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, length.out=-33.3) Error in seq.default(-0.2, 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, length.out=-5) Error in seq.default(-0.2, 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, length.out=1.1) [1] -0.2 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, length.out=2.999999999) [1] -0.2 2.4 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, length.out=33.3) [1] -0.20000000 -0.04242424 0.11515152 0.27272727 0.43030303 0.58787879 [7] 0.74545455 0.90303030 1.06060606 1.21818182 1.37575758 1.53333333 [13] 1.69090909 1.84848485 2.00606061 2.16363636 2.32121212 2.47878788 [19] 2.63636364 2.79393939 2.95151515 3.10909091 3.26666667 3.42424242 [25] 3.58181818 3.73939394 3.89696970 4.05454545 4.21212121 4.36969697 [31] 4.52727273 4.68484848 4.84242424 5.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, 5, length.out=5) [1] -0.2 1.1 2.4 3.7 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, length.out=-1.1) Error in seq.default(-0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, length.out=-2.999999999) Error in seq.default(-0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, length.out=-33.3) Error in seq.default(-0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, length.out=-5) Error in seq.default(-0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, length.out=1.1) [1] -0.2 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, length.out=2.999999999) [1] -0.2 0.8 1.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, length.out=33.3) [1] -0.2 0.8 1.8 2.8 3.8 4.8 5.8 6.8 7.8 8.8 9.8 10.8 11.8 12.8 13.8 [16] 14.8 15.8 16.8 17.8 18.8 19.8 20.8 21.8 22.8 23.8 24.8 25.8 26.8 27.8 28.8 [31] 29.8 30.8 31.8 32.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-0.2, length.out=5) [1] -0.2 0.8 1.8 2.8 3.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, length.out=-1.1) Error in seq.default(-1.1, -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, length.out=-2.999999999) Error in seq.default(-1.1, -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, length.out=-33.3) Error in seq.default(-1.1, -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, length.out=-5) Error in seq.default(-1.1, -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, length.out=1.1) [1] -1.1 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, length.out=2.999999999) [1] -1.10 -0.65 -0.20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, length.out=33.3) [1] -1.1000000 -1.0727273 -1.0454545 -1.0181818 -0.9909091 -0.9636364 [7] -0.9363636 -0.9090909 -0.8818182 -0.8545455 -0.8272727 -0.8000000 [13] -0.7727273 -0.7454545 -0.7181818 -0.6909091 -0.6636364 -0.6363636 [19] -0.6090909 -0.5818182 -0.5545455 -0.5272727 -0.5000000 -0.4727273 [25] -0.4454545 -0.4181818 -0.3909091 -0.3636364 -0.3363636 -0.3090909 [31] -0.2818182 -0.2545455 -0.2272727 -0.2000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -0.2, length.out=5) [1] -1.100 -0.875 -0.650 -0.425 -0.200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, length.out=-1.1) Error in seq.default(-1.1, -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, length.out=-2.999999999) Error in seq.default(-1.1, -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, length.out=-33.3) Error in seq.default(-1.1, -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, length.out=-5) Error in seq.default(-1.1, -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, length.out=1.1) [1] -1.1 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, length.out=2.999999999) [1] -1.1 -1.1 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, length.out=33.3) [1] -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 [16] -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 -1.1 [31] -1.1 -1.1 -1.1 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -1.1, length.out=5) [1] -1.1 -1.1 -1.1 -1.1 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, length.out=-1.1) Error in seq.default(-1.1, -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, length.out=-2.999999999) Error in seq.default(-1.1, -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, length.out=-33.3) Error in seq.default(-1.1, -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, length.out=-5) Error in seq.default(-1.1, -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, length.out=1.1) [1] -1.1 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, length.out=2.999999999) [1] -1.10 -2.05 -3.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, length.out=33.3) [1] -1.100000 -1.157576 -1.215152 -1.272727 -1.330303 -1.387879 -1.445455 [8] -1.503030 -1.560606 -1.618182 -1.675758 -1.733333 -1.790909 -1.848485 [15] -1.906061 -1.963636 -2.021212 -2.078788 -2.136364 -2.193939 -2.251515 [22] -2.309091 -2.366667 -2.424242 -2.481818 -2.539394 -2.596970 -2.654545 [29] -2.712121 -2.769697 -2.827273 -2.884848 -2.942424 -3.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -2.999999999, length.out=5) [1] -1.100 -1.575 -2.050 -2.525 -3.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, length.out=-1.1) Error in seq.default(-1.1, -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, length.out=-2.999999999) Error in seq.default(-1.1, -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, length.out=-33.3) Error in seq.default(-1.1, -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, length.out=-5) Error in seq.default(-1.1, -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, length.out=1.1) [1] -1.1 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, length.out=2.999999999) [1] -1.1 -17.2 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, length.out=33.3) [1] -1.100000 -2.075758 -3.051515 -4.027273 -5.003030 -5.978788 [7] -6.954545 -7.930303 -8.906061 -9.881818 -10.857576 -11.833333 [13] -12.809091 -13.784848 -14.760606 -15.736364 -16.712121 -17.687879 [19] -18.663636 -19.639394 -20.615152 -21.590909 -22.566667 -23.542424 [25] -24.518182 -25.493939 -26.469697 -27.445455 -28.421212 -29.396970 [31] -30.372727 -31.348485 -32.324242 -33.300000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -33.3, length.out=5) [1] -1.10 -9.15 -17.20 -25.25 -33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, length.out=-1.1) Error in seq.default(-1.1, -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, length.out=-2.999999999) Error in seq.default(-1.1, -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, length.out=-33.3) Error in seq.default(-1.1, -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, length.out=-5) Error in seq.default(-1.1, -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, length.out=1.1) [1] -1.1 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, length.out=2.999999999) [1] -1.10 -3.05 -5.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, length.out=33.3) [1] -1.100000 -1.218182 -1.336364 -1.454545 -1.572727 -1.690909 -1.809091 [8] -1.927273 -2.045455 -2.163636 -2.281818 -2.400000 -2.518182 -2.636364 [15] -2.754545 -2.872727 -2.990909 -3.109091 -3.227273 -3.345455 -3.463636 [22] -3.581818 -3.700000 -3.818182 -3.936364 -4.054545 -4.172727 -4.290909 [29] -4.409091 -4.527273 -4.645455 -4.763636 -4.881818 -5.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, -5, length.out=5) [1] -1.100 -2.075 -3.050 -4.025 -5.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, length.out=-1.1) Error in seq.default(-1.1, 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, length.out=-2.999999999) Error in seq.default(-1.1, 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, length.out=-33.3) Error in seq.default(-1.1, 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, length.out=-5) Error in seq.default(-1.1, 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, length.out=1.1) [1] -1.1 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, length.out=2.999999999) [1] -1.10 -0.45 0.20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, length.out=33.3) [1] -1.100000000 -1.060606061 -1.021212121 -0.981818182 -0.942424242 [6] -0.903030303 -0.863636364 -0.824242424 -0.784848485 -0.745454545 [11] -0.706060606 -0.666666667 -0.627272727 -0.587878788 -0.548484848 [16] -0.509090909 -0.469696970 -0.430303030 -0.390909091 -0.351515152 [21] -0.312121212 -0.272727273 -0.233333333 -0.193939394 -0.154545455 [26] -0.115151515 -0.075757576 -0.036363636 0.003030303 0.042424242 [31] 0.081818182 0.121212121 0.160606061 0.200000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 0.2, length.out=5) [1] -1.100 -0.775 -0.450 -0.125 0.200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, length.out=-1.1) Error in seq.default(-1.1, 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, length.out=-2.999999999) Error in seq.default(-1.1, 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, length.out=-33.3) Error in seq.default(-1.1, 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, length.out=-5) Error in seq.default(-1.1, 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, length.out=1.1) [1] -1.1 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, length.out=2.999999999) [1] -1.1 0.0 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, length.out=33.3) [1] -1.10000000 -1.03333333 -0.96666667 -0.90000000 -0.83333333 -0.76666667 [7] -0.70000000 -0.63333333 -0.56666667 -0.50000000 -0.43333333 -0.36666667 [13] -0.30000000 -0.23333333 -0.16666667 -0.10000000 -0.03333333 0.03333333 [19] 0.10000000 0.16666667 0.23333333 0.30000000 0.36666667 0.43333333 [25] 0.50000000 0.56666667 0.63333333 0.70000000 0.76666667 0.83333333 [31] 0.90000000 0.96666667 1.03333333 1.10000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 1.1, length.out=5) [1] -1.10 -0.55 0.00 0.55 1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, length.out=-1.1) Error in seq.default(-1.1, 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, length.out=-2.999999999) Error in seq.default(-1.1, 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, length.out=-33.3) Error in seq.default(-1.1, 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, length.out=-5) Error in seq.default(-1.1, 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, length.out=1.1) [1] -1.1 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, length.out=2.999999999) [1] -1.10 0.95 3.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, length.out=33.3) [1] -1.10000000 -0.97575758 -0.85151515 -0.72727273 -0.60303030 -0.47878788 [7] -0.35454545 -0.23030303 -0.10606061 0.01818182 0.14242424 0.26666667 [13] 0.39090909 0.51515151 0.63939394 0.76363636 0.88787879 1.01212121 [19] 1.13636364 1.26060606 1.38484848 1.50909091 1.63333333 1.75757576 [25] 1.88181818 2.00606061 2.13030303 2.25454545 2.37878788 2.50303030 [31] 2.62727273 2.75151515 2.87575757 3.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 2.999999999, length.out=5) [1] -1.100 -0.075 0.950 1.975 3.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, length.out=-1.1) Error in seq.default(-1.1, 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, length.out=-2.999999999) Error in seq.default(-1.1, 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, length.out=-33.3) Error in seq.default(-1.1, 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, length.out=-5) Error in seq.default(-1.1, 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, length.out=1.1) [1] -1.1 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, length.out=2.999999999) [1] -1.1 16.1 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, length.out=33.3) [1] -1.10000000 -0.05757576 0.98484848 2.02727273 3.06969697 4.11212121 [7] 5.15454545 6.19696970 7.23939394 8.28181818 9.32424242 10.36666667 [13] 11.40909091 12.45151515 13.49393939 14.53636364 15.57878788 16.62121212 [19] 17.66363636 18.70606061 19.74848485 20.79090909 21.83333333 22.87575758 [25] 23.91818182 24.96060606 26.00303030 27.04545455 28.08787879 29.13030303 [31] 30.17272727 31.21515152 32.25757576 33.30000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 33.3, length.out=5) [1] -1.1 7.5 16.1 24.7 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, length.out=-1.1) Error in seq.default(-1.1, 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, length.out=-2.999999999) Error in seq.default(-1.1, 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, length.out=-33.3) Error in seq.default(-1.1, 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, length.out=-5) Error in seq.default(-1.1, 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, length.out=1.1) [1] -1.1 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, length.out=2.999999999) [1] -1.10 1.95 5.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, length.out=33.3) [1] -1.100000000 -0.915151515 -0.730303030 -0.545454545 -0.360606061 [6] -0.175757576 0.009090909 0.193939394 0.378787879 0.563636364 [11] 0.748484848 0.933333333 1.118181818 1.303030303 1.487878788 [16] 1.672727273 1.857575758 2.042424242 2.227272727 2.412121212 [21] 2.596969697 2.781818182 2.966666667 3.151515152 3.336363636 [26] 3.521212121 3.706060606 3.890909091 4.075757576 4.260606061 [31] 4.445454545 4.630303030 4.815151515 5.000000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, 5, length.out=5) [1] -1.100 0.425 1.950 3.475 5.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, length.out=-1.1) Error in seq.default(-1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, length.out=-2.999999999) Error in seq.default(-1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, length.out=-33.3) Error in seq.default(-1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, length.out=-5) Error in seq.default(-1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, length.out=1.1) [1] -1.1 -0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, length.out=2.999999999) [1] -1.1 -0.1 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, length.out=33.3) [1] -1.1 -0.1 0.9 1.9 2.9 3.9 4.9 5.9 6.9 7.9 8.9 9.9 10.9 11.9 12.9 [16] 13.9 14.9 15.9 16.9 17.9 18.9 19.9 20.9 21.9 22.9 23.9 24.9 25.9 26.9 27.9 [31] 28.9 29.9 30.9 31.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1.1, length.out=5) [1] -1.1 -0.1 0.9 1.9 2.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, -1L, length.out=-1L) Error in seq.default(-1L, -1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, -1L, length.out=-30L) Error in seq.default(-1L, -1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, -1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, -1L, length.out=1L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, -1L, length.out=30L) [1] -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 -1 [26] -1 -1 -1 -1 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, -30L, length.out=-1L) Error in seq.default(-1L, -30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, -30L, length.out=-30L) Error in seq.default(-1L, -30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, -30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, -30L, length.out=1L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, -30L, length.out=30L) [1] -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 [20] -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 0L, length.out=-1L) Error in seq.default(-1L, 0L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 0L, length.out=-30L) Error in seq.default(-1L, 0L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 0L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 0L, length.out=1L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 0L, length.out=30L) [1] -1.00000000 -0.96551724 -0.93103448 -0.89655172 -0.86206897 -0.82758621 [7] -0.79310345 -0.75862069 -0.72413793 -0.68965517 -0.65517241 -0.62068966 [13] -0.58620690 -0.55172414 -0.51724138 -0.48275862 -0.44827586 -0.41379310 [19] -0.37931034 -0.34482759 -0.31034483 -0.27586207 -0.24137931 -0.20689655 [25] -0.17241379 -0.13793103 -0.10344828 -0.06896552 -0.03448276 0.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 1L, length.out=-1L) Error in seq.default(-1L, 1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 1L, length.out=-30L) Error in seq.default(-1L, 1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 1L, length.out=1L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 1L, length.out=30L) [1] -1.00000000 -0.93103448 -0.86206897 -0.79310345 -0.72413793 -0.65517241 [7] -0.58620690 -0.51724138 -0.44827586 -0.37931034 -0.31034483 -0.24137931 [13] -0.17241379 -0.10344828 -0.03448276 0.03448276 0.10344828 0.17241379 [19] 0.24137931 0.31034483 0.37931034 0.44827586 0.51724138 0.58620690 [25] 0.65517241 0.72413793 0.79310345 0.86206897 0.93103448 1.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 30L, length.out=-1L) Error in seq.default(-1L, 30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 30L, length.out=-30L) Error in seq.default(-1L, 30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 30L, length.out=1L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, 30L, length.out=30L) [1] -1.00000000 0.06896552 1.13793103 2.20689655 3.27586207 4.34482759 [7] 5.41379310 6.48275862 7.55172414 8.62068966 9.68965517 10.75862069 [13] 11.82758621 12.89655172 13.96551724 15.03448276 16.10344828 17.17241379 [19] 18.24137931 19.31034483 20.37931034 21.44827586 22.51724138 23.58620690 [25] 24.65517241 25.72413793 26.79310345 27.86206897 28.93103448 30.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, length.out=-1L) Error in seq.default(-1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, length.out=-30L) Error in seq.default(-1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, length.out=1L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-1L, length.out=30L) [1] -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 [26] 24 25 26 27 28 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, length.out=-1.1) Error in seq.default(-2.999999999, -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, length.out=-2.999999999) Error in seq.default(-2.999999999, -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, length.out=-33.3) Error in seq.default(-2.999999999, -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, length.out=-5) Error in seq.default(-2.999999999, -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, length.out=1.1) [1] -3.0 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, length.out=2.999999999) [1] -3.0 -1.6 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, length.out=33.3) [1] -3.0000000 -2.9151515 -2.8303030 -2.7454545 -2.6606061 -2.5757576 [7] -2.4909091 -2.4060606 -2.3212121 -2.2363636 -2.1515152 -2.0666667 [13] -1.9818182 -1.8969697 -1.8121212 -1.7272727 -1.6424242 -1.5575758 [19] -1.4727273 -1.3878788 -1.3030303 -1.2181818 -1.1333333 -1.0484848 [25] -0.9636364 -0.8787879 -0.7939394 -0.7090909 -0.6242424 -0.5393939 [31] -0.4545455 -0.3696970 -0.2848485 -0.2000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -0.2, length.out=5) [1] -3.0 -2.3 -1.6 -0.9 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, length.out=-1.1) Error in seq.default(-2.999999999, -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, length.out=-2.999999999) Error in seq.default(-2.999999999, -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, length.out=-33.3) Error in seq.default(-2.999999999, -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, length.out=-5) Error in seq.default(-2.999999999, -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, length.out=1.1) [1] -3.0 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, length.out=2.999999999) [1] -3.00 -2.05 -1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, length.out=33.3) [1] -3.000000 -2.942424 -2.884848 -2.827273 -2.769697 -2.712121 -2.654545 [8] -2.596970 -2.539394 -2.481818 -2.424242 -2.366667 -2.309091 -2.251515 [15] -2.193939 -2.136364 -2.078788 -2.021212 -1.963636 -1.906061 -1.848485 [22] -1.790909 -1.733333 -1.675758 -1.618182 -1.560606 -1.503030 -1.445455 [29] -1.387879 -1.330303 -1.272727 -1.215152 -1.157576 -1.100000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -1.1, length.out=5) [1] -3.000 -2.525 -2.050 -1.575 -1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, length.out=-1.1) Error in seq.default(-2.999999999, -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, length.out=-2.999999999) Error in seq.default(-2.999999999, -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, length.out=-33.3) Error in seq.default(-2.999999999, -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, length.out=-5) Error in seq.default(-2.999999999, -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, length.out=1.1) [1] -3 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, length.out=2.999999999) [1] -3 -3 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, length.out=33.3) [1] -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 -3 [26] -3 -3 -3 -3 -3 -3 -3 -3 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -2.999999999, length.out=5) [1] -3 -3 -3 -3 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, length.out=-1.1) Error in seq.default(-2.999999999, -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, length.out=-2.999999999) Error in seq.default(-2.999999999, -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, length.out=-33.3) Error in seq.default(-2.999999999, -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, length.out=-5) Error in seq.default(-2.999999999, -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, length.out=1.1) [1] -3.0 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, length.out=2.999999999) [1] -3.00 -18.15 -33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, length.out=33.3) [1] -3.000000 -3.918182 -4.836364 -5.754545 -6.672727 -7.590909 [7] -8.509091 -9.427273 -10.345455 -11.263636 -12.181818 -13.100000 [13] -14.018182 -14.936364 -15.854545 -16.772727 -17.690909 -18.609091 [19] -19.527273 -20.445455 -21.363636 -22.281818 -23.200000 -24.118182 [25] -25.036364 -25.954545 -26.872727 -27.790909 -28.709091 -29.627273 [31] -30.545455 -31.463636 -32.381818 -33.300000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -33.3, length.out=5) [1] -3.000 -10.575 -18.150 -25.725 -33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, length.out=-1.1) Error in seq.default(-2.999999999, -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, length.out=-2.999999999) Error in seq.default(-2.999999999, -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, length.out=-33.3) Error in seq.default(-2.999999999, -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, length.out=-5) Error in seq.default(-2.999999999, -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, length.out=1.1) [1] -3 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, length.out=2.999999999) [1] -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, length.out=33.3) [1] -3.000000 -3.060606 -3.121212 -3.181818 -3.242424 -3.303030 -3.363636 [8] -3.424242 -3.484848 -3.545455 -3.606061 -3.666667 -3.727273 -3.787879 [15] -3.848485 -3.909091 -3.969697 -4.030303 -4.090909 -4.151515 -4.212121 [22] -4.272727 -4.333333 -4.393939 -4.454545 -4.515152 -4.575758 -4.636364 [29] -4.696970 -4.757576 -4.818182 -4.878788 -4.939394 -5.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, -5, length.out=5) [1] -3.0 -3.5 -4.0 -4.5 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, length.out=-1.1) Error in seq.default(-2.999999999, 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, length.out=-2.999999999) Error in seq.default(-2.999999999, 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, length.out=-33.3) Error in seq.default(-2.999999999, 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, length.out=-5) Error in seq.default(-2.999999999, 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, length.out=1.1) [1] -3.0 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, length.out=2.999999999) [1] -3.0 -1.4 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, length.out=33.3) [1] -2.999999999 -2.903030302 -2.806060605 -2.709090908 -2.612121211 [6] -2.515151514 -2.418181817 -2.321212120 -2.224242423 -2.127272727 [11] -2.030303030 -1.933333333 -1.836363636 -1.739393939 -1.642424242 [16] -1.545454545 -1.448484848 -1.351515151 -1.254545454 -1.157575757 [21] -1.060606060 -0.963636363 -0.866666666 -0.769696969 -0.672727272 [26] -0.575757576 -0.478787879 -0.381818182 -0.284848485 -0.187878788 [31] -0.090909091 0.006060606 0.103030303 0.200000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 0.2, length.out=5) [1] -3.0 -2.2 -1.4 -0.6 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, length.out=-1.1) Error in seq.default(-2.999999999, 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, length.out=-2.999999999) Error in seq.default(-2.999999999, 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, length.out=-33.3) Error in seq.default(-2.999999999, 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, length.out=-5) Error in seq.default(-2.999999999, 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, length.out=1.1) [1] -3.0 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, length.out=2.999999999) [1] -3.00 -0.95 1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, length.out=33.3) [1] -3.00000000 -2.87575757 -2.75151515 -2.62727273 -2.50303030 -2.37878788 [7] -2.25454545 -2.13030303 -2.00606061 -1.88181818 -1.75757576 -1.63333333 [13] -1.50909091 -1.38484848 -1.26060606 -1.13636364 -1.01212121 -0.88787879 [19] -0.76363636 -0.63939394 -0.51515151 -0.39090909 -0.26666667 -0.14242424 [25] -0.01818182 0.10606061 0.23030303 0.35454545 0.47878788 0.60303030 [31] 0.72727273 0.85151515 0.97575758 1.10000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 1.1, length.out=5) [1] -3.000 -1.975 -0.950 0.075 1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, length.out=-1.1) Error in seq.default(-2.999999999, 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, length.out=-2.999999999) Error in seq.default(-2.999999999, 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, length.out=-33.3) Error in seq.default(-2.999999999, 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, length.out=-5) Error in seq.default(-2.999999999, 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, length.out=1.1) [1] -3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, length.out=2.999999999) [1] -3 0 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, length.out=33.3) [1] -3.00000000 -2.81818182 -2.63636364 -2.45454545 -2.27272727 -2.09090909 [7] -1.90909091 -1.72727273 -1.54545454 -1.36363636 -1.18181818 -1.00000000 [13] -0.81818182 -0.63636364 -0.45454545 -0.27272727 -0.09090909 0.09090909 [19] 0.27272727 0.45454545 0.63636364 0.81818182 1.00000000 1.18181818 [25] 1.36363636 1.54545454 1.72727273 1.90909091 2.09090909 2.27272727 [31] 2.45454545 2.63636364 2.81818182 3.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 2.999999999, length.out=5) [1] -3.0 -1.5 0.0 1.5 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, length.out=-1.1) Error in seq.default(-2.999999999, 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, length.out=-2.999999999) Error in seq.default(-2.999999999, 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, length.out=-33.3) Error in seq.default(-2.999999999, 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, length.out=-5) Error in seq.default(-2.999999999, 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, length.out=1.1) [1] -3.0 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, length.out=2.999999999) [1] -3.00 15.15 33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, length.out=33.3) [1] -3.0 -1.9 -0.8 0.3 1.4 2.5 3.6 4.7 5.8 6.9 8.0 9.1 10.2 11.3 12.4 [16] 13.5 14.6 15.7 16.8 17.9 19.0 20.1 21.2 22.3 23.4 24.5 25.6 26.7 27.8 28.9 [31] 30.0 31.1 32.2 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 33.3, length.out=5) [1] -3.000 6.075 15.150 24.225 33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, length.out=-1.1) Error in seq.default(-2.999999999, 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, length.out=-2.999999999) Error in seq.default(-2.999999999, 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, length.out=-33.3) Error in seq.default(-2.999999999, 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, length.out=-5) Error in seq.default(-2.999999999, 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, length.out=1.1) [1] -3 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, length.out=2.999999999) [1] -3 1 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, length.out=33.3) [1] -3.00000000 -2.75757576 -2.51515151 -2.27272727 -2.03030303 -1.78787879 [7] -1.54545454 -1.30303030 -1.06060606 -0.81818182 -0.57575758 -0.33333333 [13] -0.09090909 0.15151515 0.39393939 0.63636364 0.87878788 1.12121212 [19] 1.36363636 1.60606061 1.84848485 2.09090909 2.33333333 2.57575758 [25] 2.81818182 3.06060606 3.30303030 3.54545455 3.78787879 4.03030303 [31] 4.27272727 4.51515152 4.75757576 5.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, 5, length.out=5) [1] -3 -1 1 3 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, length.out=-1.1) Error in seq.default(-2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, length.out=-2.999999999) Error in seq.default(-2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, length.out=-33.3) Error in seq.default(-2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, length.out=-5) Error in seq.default(-2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, length.out=1.1) [1] -3 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, length.out=2.999999999) [1] -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, length.out=33.3) [1] -3.0e+00 -2.0e+00 -1.0e+00 1.0e-09 1.0e+00 2.0e+00 3.0e+00 4.0e+00 [9] 5.0e+00 6.0e+00 7.0e+00 8.0e+00 9.0e+00 1.0e+01 1.1e+01 1.2e+01 [17] 1.3e+01 1.4e+01 1.5e+01 1.6e+01 1.7e+01 1.8e+01 1.9e+01 2.0e+01 [25] 2.1e+01 2.2e+01 2.3e+01 2.4e+01 2.5e+01 2.6e+01 2.7e+01 2.8e+01 [33] 2.9e+01 3.0e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-2.999999999, length.out=5) [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, -1L, length.out=-1L) Error in seq.default(-30L, -1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, -1L, length.out=-30L) Error in seq.default(-30L, -1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, -1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, -1L, length.out=1L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, -1L, length.out=30L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, -30L, length.out=-1L) Error in seq.default(-30L, -30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, -30L, length.out=-30L) Error in seq.default(-30L, -30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, -30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, -30L, length.out=1L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, -30L, length.out=30L) [1] -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 [20] -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 0L, length.out=-1L) Error in seq.default(-30L, 0L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 0L, length.out=-30L) Error in seq.default(-30L, 0L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 0L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 0L, length.out=1L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 0L, length.out=30L) [1] -30.000000 -28.965517 -27.931034 -26.896552 -25.862069 -24.827586 [7] -23.793103 -22.758621 -21.724138 -20.689655 -19.655172 -18.620690 [13] -17.586207 -16.551724 -15.517241 -14.482759 -13.448276 -12.413793 [19] -11.379310 -10.344828 -9.310345 -8.275862 -7.241379 -6.206897 [25] -5.172414 -4.137931 -3.103448 -2.068966 -1.034483 0.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 1L, length.out=-1L) Error in seq.default(-30L, 1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 1L, length.out=-30L) Error in seq.default(-30L, 1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 1L, length.out=1L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 1L, length.out=30L) [1] -30.00000000 -28.93103448 -27.86206897 -26.79310345 -25.72413793 [6] -24.65517241 -23.58620690 -22.51724138 -21.44827586 -20.37931034 [11] -19.31034483 -18.24137931 -17.17241379 -16.10344828 -15.03448276 [16] -13.96551724 -12.89655172 -11.82758621 -10.75862069 -9.68965517 [21] -8.62068966 -7.55172414 -6.48275862 -5.41379310 -4.34482759 [26] -3.27586207 -2.20689655 -1.13793103 -0.06896552 1.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 30L, length.out=-1L) Error in seq.default(-30L, 30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 30L, length.out=-30L) Error in seq.default(-30L, 30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 30L, length.out=1L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, 30L, length.out=30L) [1] -30.000000 -27.931034 -25.862069 -23.793103 -21.724138 -19.655172 [7] -17.586207 -15.517241 -13.448276 -11.379310 -9.310345 -7.241379 [13] -5.172414 -3.103448 -1.034483 1.034483 3.103448 5.172414 [19] 7.241379 9.310345 11.379310 13.448276 15.517241 17.586207 [25] 19.655172 21.724138 23.793103 25.862069 27.931034 30.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, length.out=-1L) Error in seq.default(-30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, length.out=-30L) Error in seq.default(-30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, length.out=1L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-30L, length.out=30L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, length.out=-1.1) Error in seq.default(-33.3, -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, length.out=-2.999999999) Error in seq.default(-33.3, -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, length.out=-33.3) Error in seq.default(-33.3, -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, length.out=-5) Error in seq.default(-33.3, -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, length.out=1.1) [1] -33.3 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, length.out=2.999999999) [1] -33.30 -16.75 -0.20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, length.out=33.3) [1] -33.300000 -32.296970 -31.293939 -30.290909 -29.287879 -28.284848 [7] -27.281818 -26.278788 -25.275758 -24.272727 -23.269697 -22.266667 [13] -21.263636 -20.260606 -19.257576 -18.254545 -17.251515 -16.248485 [19] -15.245455 -14.242424 -13.239394 -12.236364 -11.233333 -10.230303 [25] -9.227273 -8.224242 -7.221212 -6.218182 -5.215152 -4.212121 [31] -3.209091 -2.206061 -1.203030 -0.200000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -0.2, length.out=5) [1] -33.300 -25.025 -16.750 -8.475 -0.200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, length.out=-1.1) Error in seq.default(-33.3, -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, length.out=-2.999999999) Error in seq.default(-33.3, -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, length.out=-33.3) Error in seq.default(-33.3, -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, length.out=-5) Error in seq.default(-33.3, -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, length.out=1.1) [1] -33.3 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, length.out=2.999999999) [1] -33.3 -17.2 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, length.out=33.3) [1] -33.300000 -32.324242 -31.348485 -30.372727 -29.396970 -28.421212 [7] -27.445455 -26.469697 -25.493939 -24.518182 -23.542424 -22.566667 [13] -21.590909 -20.615152 -19.639394 -18.663636 -17.687879 -16.712121 [19] -15.736364 -14.760606 -13.784848 -12.809091 -11.833333 -10.857576 [25] -9.881818 -8.906061 -7.930303 -6.954545 -5.978788 -5.003030 [31] -4.027273 -3.051515 -2.075758 -1.100000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -1.1, length.out=5) [1] -33.30 -25.25 -17.20 -9.15 -1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, length.out=-1.1) Error in seq.default(-33.3, -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, length.out=-2.999999999) Error in seq.default(-33.3, -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, length.out=-33.3) Error in seq.default(-33.3, -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, length.out=-5) Error in seq.default(-33.3, -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, length.out=1.1) [1] -33.3 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, length.out=2.999999999) [1] -33.30 -18.15 -3.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, length.out=33.3) [1] -33.300000 -32.381818 -31.463636 -30.545455 -29.627273 -28.709091 [7] -27.790909 -26.872727 -25.954545 -25.036364 -24.118182 -23.200000 [13] -22.281818 -21.363636 -20.445455 -19.527273 -18.609091 -17.690909 [19] -16.772727 -15.854545 -14.936364 -14.018182 -13.100000 -12.181818 [25] -11.263636 -10.345455 -9.427273 -8.509091 -7.590909 -6.672727 [31] -5.754545 -4.836364 -3.918182 -3.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -2.999999999, length.out=5) [1] -33.300 -25.725 -18.150 -10.575 -3.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, length.out=-1.1) Error in seq.default(-33.3, -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, length.out=-2.999999999) Error in seq.default(-33.3, -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, length.out=-33.3) Error in seq.default(-33.3, -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, length.out=-5) Error in seq.default(-33.3, -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, length.out=1.1) [1] -33.3 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, length.out=2.999999999) [1] -33.3 -33.3 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, length.out=33.3) [1] -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 [13] -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 [25] -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -33.3, length.out=5) [1] -33.3 -33.3 -33.3 -33.3 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, length.out=-1.1) Error in seq.default(-33.3, -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, length.out=-2.999999999) Error in seq.default(-33.3, -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, length.out=-33.3) Error in seq.default(-33.3, -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, length.out=-5) Error in seq.default(-33.3, -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, length.out=1.1) [1] -33.3 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, length.out=2.999999999) [1] -33.30 -19.15 -5.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, length.out=33.3) [1] -33.300000 -32.442424 -31.584848 -30.727273 -29.869697 -29.012121 [7] -28.154545 -27.296970 -26.439394 -25.581818 -24.724242 -23.866667 [13] -23.009091 -22.151515 -21.293939 -20.436364 -19.578788 -18.721212 [19] -17.863636 -17.006061 -16.148485 -15.290909 -14.433333 -13.575758 [25] -12.718182 -11.860606 -11.003030 -10.145455 -9.287879 -8.430303 [31] -7.572727 -6.715152 -5.857576 -5.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, -5, length.out=5) [1] -33.300 -26.225 -19.150 -12.075 -5.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, length.out=-1.1) Error in seq.default(-33.3, 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, length.out=-2.999999999) Error in seq.default(-33.3, 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, length.out=-33.3) Error in seq.default(-33.3, 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, length.out=-5) Error in seq.default(-33.3, 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, length.out=1.1) [1] -33.3 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, length.out=2.999999999) [1] -33.30 -16.55 0.20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, length.out=33.3) [1] -33.3000000 -32.2848485 -31.2696970 -30.2545455 -29.2393939 -28.2242424 [7] -27.2090909 -26.1939394 -25.1787879 -24.1636364 -23.1484848 -22.1333333 [13] -21.1181818 -20.1030303 -19.0878788 -18.0727273 -17.0575758 -16.0424242 [19] -15.0272727 -14.0121212 -12.9969697 -11.9818182 -10.9666667 -9.9515152 [25] -8.9363636 -7.9212121 -6.9060606 -5.8909091 -4.8757576 -3.8606061 [31] -2.8454545 -1.8303030 -0.8151515 0.2000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 0.2, length.out=5) [1] -33.300 -24.925 -16.550 -8.175 0.200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, length.out=-1.1) Error in seq.default(-33.3, 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, length.out=-2.999999999) Error in seq.default(-33.3, 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, length.out=-33.3) Error in seq.default(-33.3, 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, length.out=-5) Error in seq.default(-33.3, 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, length.out=1.1) [1] -33.3 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, length.out=2.999999999) [1] -33.3 -16.1 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, length.out=33.3) [1] -33.30000000 -32.25757576 -31.21515152 -30.17272727 -29.13030303 [6] -28.08787879 -27.04545455 -26.00303030 -24.96060606 -23.91818182 [11] -22.87575758 -21.83333333 -20.79090909 -19.74848485 -18.70606061 [16] -17.66363636 -16.62121212 -15.57878788 -14.53636364 -13.49393939 [21] -12.45151515 -11.40909091 -10.36666667 -9.32424242 -8.28181818 [26] -7.23939394 -6.19696970 -5.15454545 -4.11212121 -3.06969697 [31] -2.02727273 -0.98484848 0.05757576 1.10000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 1.1, length.out=5) [1] -33.3 -24.7 -16.1 -7.5 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, length.out=-1.1) Error in seq.default(-33.3, 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, length.out=-2.999999999) Error in seq.default(-33.3, 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, length.out=-33.3) Error in seq.default(-33.3, 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, length.out=-5) Error in seq.default(-33.3, 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, length.out=1.1) [1] -33.3 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, length.out=2.999999999) [1] -33.30 -15.15 3.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, length.out=33.3) [1] -33.3 -32.2 -31.1 -30.0 -28.9 -27.8 -26.7 -25.6 -24.5 -23.4 -22.3 -21.2 [13] -20.1 -19.0 -17.9 -16.8 -15.7 -14.6 -13.5 -12.4 -11.3 -10.2 -9.1 -8.0 [25] -6.9 -5.8 -4.7 -3.6 -2.5 -1.4 -0.3 0.8 1.9 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 2.999999999, length.out=5) [1] -33.300 -24.225 -15.150 -6.075 3.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, length.out=-1.1) Error in seq.default(-33.3, 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, length.out=-2.999999999) Error in seq.default(-33.3, 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, length.out=-33.3) Error in seq.default(-33.3, 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, length.out=-5) Error in seq.default(-33.3, 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, length.out=1.1) [1] -33.3 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, length.out=2.999999999) [1] -33.3 0.0 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, length.out=33.3) [1] -33.300000 -31.281818 -29.263636 -27.245455 -25.227273 -23.209091 [7] -21.190909 -19.172727 -17.154545 -15.136364 -13.118182 -11.100000 [13] -9.081818 -7.063636 -5.045455 -3.027273 -1.009091 1.009091 [19] 3.027273 5.045455 7.063636 9.081818 11.100000 13.118182 [25] 15.136364 17.154545 19.172727 21.190909 23.209091 25.227273 [31] 27.245455 29.263636 31.281818 33.300000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 33.3, length.out=5) [1] -33.30 -16.65 0.00 16.65 33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, length.out=-1.1) Error in seq.default(-33.3, 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, length.out=-2.999999999) Error in seq.default(-33.3, 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, length.out=-33.3) Error in seq.default(-33.3, 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, length.out=-5) Error in seq.default(-33.3, 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, length.out=1.1) [1] -33.3 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, length.out=2.999999999) [1] -33.30 -14.15 5.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, length.out=33.3) [1] -33.3000000 -32.1393939 -30.9787879 -29.8181818 -28.6575758 -27.4969697 [7] -26.3363636 -25.1757576 -24.0151515 -22.8545455 -21.6939394 -20.5333333 [13] -19.3727273 -18.2121212 -17.0515152 -15.8909091 -14.7303030 -13.5696970 [19] -12.4090909 -11.2484848 -10.0878788 -8.9272727 -7.7666667 -6.6060606 [25] -5.4454545 -4.2848485 -3.1242424 -1.9636364 -0.8030303 0.3575758 [31] 1.5181818 2.6787879 3.8393939 5.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, 5, length.out=5) [1] -33.300 -23.725 -14.150 -4.575 5.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, length.out=-1.1) Error in seq.default(-33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, length.out=-2.999999999) Error in seq.default(-33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, length.out=-33.3) Error in seq.default(-33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, length.out=-5) Error in seq.default(-33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, length.out=1.1) [1] -33.3 -32.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, length.out=2.999999999) [1] -33.3 -32.3 -31.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, length.out=33.3) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-33.3, length.out=5) [1] -33.3 -32.3 -31.3 -30.3 -29.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, length.out=-1.1) Error in seq.default(-5, -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, length.out=-2.999999999) Error in seq.default(-5, -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, length.out=-33.3) Error in seq.default(-5, -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, length.out=-5) Error in seq.default(-5, -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, length.out=1.1) [1] -5.0 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, length.out=2.999999999) [1] -5.0 -2.6 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, length.out=33.3) [1] -5.0000000 -4.8545455 -4.7090909 -4.5636364 -4.4181818 -4.2727273 [7] -4.1272727 -3.9818182 -3.8363636 -3.6909091 -3.5454545 -3.4000000 [13] -3.2545455 -3.1090909 -2.9636364 -2.8181818 -2.6727273 -2.5272727 [19] -2.3818182 -2.2363636 -2.0909091 -1.9454545 -1.8000000 -1.6545455 [25] -1.5090909 -1.3636364 -1.2181818 -1.0727273 -0.9272727 -0.7818182 [31] -0.6363636 -0.4909091 -0.3454545 -0.2000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -0.2, length.out=5) [1] -5.0 -3.8 -2.6 -1.4 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, length.out=-1.1) Error in seq.default(-5, -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, length.out=-2.999999999) Error in seq.default(-5, -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, length.out=-33.3) Error in seq.default(-5, -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, length.out=-5) Error in seq.default(-5, -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, length.out=1.1) [1] -5.0 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, length.out=2.999999999) [1] -5.00 -3.05 -1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, length.out=33.3) [1] -5.000000 -4.881818 -4.763636 -4.645455 -4.527273 -4.409091 -4.290909 [8] -4.172727 -4.054545 -3.936364 -3.818182 -3.700000 -3.581818 -3.463636 [15] -3.345455 -3.227273 -3.109091 -2.990909 -2.872727 -2.754545 -2.636364 [22] -2.518182 -2.400000 -2.281818 -2.163636 -2.045455 -1.927273 -1.809091 [29] -1.690909 -1.572727 -1.454545 -1.336364 -1.218182 -1.100000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -1.1, length.out=5) [1] -5.000 -4.025 -3.050 -2.075 -1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, length.out=-1.1) Error in seq.default(-5, -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, length.out=-2.999999999) Error in seq.default(-5, -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, length.out=-33.3) Error in seq.default(-5, -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, length.out=-5) Error in seq.default(-5, -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, length.out=1.1) [1] -5 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, length.out=2.999999999) [1] -5 -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, length.out=33.3) [1] -5.000000 -4.939394 -4.878788 -4.818182 -4.757576 -4.696970 -4.636364 [8] -4.575758 -4.515152 -4.454545 -4.393939 -4.333333 -4.272727 -4.212121 [15] -4.151515 -4.090909 -4.030303 -3.969697 -3.909091 -3.848485 -3.787879 [22] -3.727273 -3.666667 -3.606061 -3.545455 -3.484848 -3.424242 -3.363636 [29] -3.303030 -3.242424 -3.181818 -3.121212 -3.060606 -3.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -2.999999999, length.out=5) [1] -5.0 -4.5 -4.0 -3.5 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, length.out=-1.1) Error in seq.default(-5, -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, length.out=-2.999999999) Error in seq.default(-5, -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, length.out=-33.3) Error in seq.default(-5, -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, length.out=-5) Error in seq.default(-5, -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, length.out=1.1) [1] -5.0 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, length.out=2.999999999) [1] -5.00 -19.15 -33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, length.out=33.3) [1] -5.000000 -5.857576 -6.715152 -7.572727 -8.430303 -9.287879 [7] -10.145455 -11.003030 -11.860606 -12.718182 -13.575758 -14.433333 [13] -15.290909 -16.148485 -17.006061 -17.863636 -18.721212 -19.578788 [19] -20.436364 -21.293939 -22.151515 -23.009091 -23.866667 -24.724242 [25] -25.581818 -26.439394 -27.296970 -28.154545 -29.012121 -29.869697 [31] -30.727273 -31.584848 -32.442424 -33.300000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -33.3, length.out=5) [1] -5.000 -12.075 -19.150 -26.225 -33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, length.out=-1.1) Error in seq.default(-5, -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, length.out=-2.999999999) Error in seq.default(-5, -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, length.out=-33.3) Error in seq.default(-5, -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, length.out=-5) Error in seq.default(-5, -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, length.out=1.1) [1] -5 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, length.out=2.999999999) [1] -5 -5 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, length.out=33.3) [1] -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 -5 [26] -5 -5 -5 -5 -5 -5 -5 -5 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, -5, length.out=5) [1] -5 -5 -5 -5 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, length.out=-1.1) Error in seq.default(-5, 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, length.out=-2.999999999) Error in seq.default(-5, 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, length.out=-33.3) Error in seq.default(-5, 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, length.out=-5) Error in seq.default(-5, 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, length.out=1.1) [1] -5.0 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, length.out=2.999999999) [1] -5.0 -2.4 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, length.out=33.3) [1] -5.00000000 -4.84242424 -4.68484848 -4.52727273 -4.36969697 -4.21212121 [7] -4.05454545 -3.89696970 -3.73939394 -3.58181818 -3.42424242 -3.26666667 [13] -3.10909091 -2.95151515 -2.79393939 -2.63636364 -2.47878788 -2.32121212 [19] -2.16363636 -2.00606061 -1.84848485 -1.69090909 -1.53333333 -1.37575758 [25] -1.21818182 -1.06060606 -0.90303030 -0.74545455 -0.58787879 -0.43030303 [31] -0.27272727 -0.11515152 0.04242424 0.20000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 0.2, length.out=5) [1] -5.0 -3.7 -2.4 -1.1 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, length.out=-1.1) Error in seq.default(-5, 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, length.out=-2.999999999) Error in seq.default(-5, 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, length.out=-33.3) Error in seq.default(-5, 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, length.out=-5) Error in seq.default(-5, 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, length.out=1.1) [1] -5.0 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, length.out=2.999999999) [1] -5.00 -1.95 1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, length.out=33.3) [1] -5.000000000 -4.815151515 -4.630303030 -4.445454545 -4.260606061 [6] -4.075757576 -3.890909091 -3.706060606 -3.521212121 -3.336363636 [11] -3.151515152 -2.966666667 -2.781818182 -2.596969697 -2.412121212 [16] -2.227272727 -2.042424242 -1.857575758 -1.672727273 -1.487878788 [21] -1.303030303 -1.118181818 -0.933333333 -0.748484848 -0.563636364 [26] -0.378787879 -0.193939394 -0.009090909 0.175757576 0.360606061 [31] 0.545454545 0.730303030 0.915151515 1.100000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 1.1, length.out=5) [1] -5.000 -3.475 -1.950 -0.425 1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, length.out=-1.1) Error in seq.default(-5, 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, length.out=-2.999999999) Error in seq.default(-5, 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, length.out=-33.3) Error in seq.default(-5, 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, length.out=-5) Error in seq.default(-5, 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, length.out=1.1) [1] -5 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, length.out=2.999999999) [1] -5 -1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, length.out=33.3) [1] -5.00000000 -4.75757576 -4.51515152 -4.27272727 -4.03030303 -3.78787879 [7] -3.54545455 -3.30303030 -3.06060606 -2.81818182 -2.57575758 -2.33333333 [13] -2.09090909 -1.84848485 -1.60606061 -1.36363636 -1.12121212 -0.87878788 [19] -0.63636364 -0.39393939 -0.15151515 0.09090909 0.33333333 0.57575758 [25] 0.81818182 1.06060606 1.30303030 1.54545454 1.78787879 2.03030303 [31] 2.27272727 2.51515151 2.75757576 3.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 2.999999999, length.out=5) [1] -5 -3 -1 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, length.out=-1.1) Error in seq.default(-5, 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, length.out=-2.999999999) Error in seq.default(-5, 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, length.out=-33.3) Error in seq.default(-5, 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, length.out=-5) Error in seq.default(-5, 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, length.out=1.1) [1] -5.0 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, length.out=2.999999999) [1] -5.00 14.15 33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, length.out=33.3) [1] -5.0000000 -3.8393939 -2.6787879 -1.5181818 -0.3575758 0.8030303 [7] 1.9636364 3.1242424 4.2848485 5.4454545 6.6060606 7.7666667 [13] 8.9272727 10.0878788 11.2484848 12.4090909 13.5696970 14.7303030 [19] 15.8909091 17.0515152 18.2121212 19.3727273 20.5333333 21.6939394 [25] 22.8545455 24.0151515 25.1757576 26.3363636 27.4969697 28.6575758 [31] 29.8181818 30.9787879 32.1393939 33.3000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 33.3, length.out=5) [1] -5.000 4.575 14.150 23.725 33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, length.out=-1.1) Error in seq.default(-5, 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, length.out=-2.999999999) Error in seq.default(-5, 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, length.out=-33.3) Error in seq.default(-5, 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, length.out=-5) Error in seq.default(-5, 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, length.out=1.1) [1] -5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, length.out=2.999999999) [1] -5 0 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, length.out=33.3) [1] -5.0000000 -4.6969697 -4.3939394 -4.0909091 -3.7878788 -3.4848485 [7] -3.1818182 -2.8787879 -2.5757576 -2.2727273 -1.9696970 -1.6666667 [13] -1.3636364 -1.0606061 -0.7575758 -0.4545455 -0.1515152 0.1515152 [19] 0.4545455 0.7575758 1.0606061 1.3636364 1.6666667 1.9696970 [25] 2.2727273 2.5757576 2.8787879 3.1818182 3.4848485 3.7878788 [31] 4.0909091 4.3939394 4.6969697 5.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, 5, length.out=5) [1] -5.0 -2.5 0.0 2.5 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, length.out=-1.1) Error in seq.default(-5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, length.out=-2.999999999) Error in seq.default(-5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, length.out=-33.3) Error in seq.default(-5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, length.out=-5) Error in seq.default(-5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, length.out=1.1) [1] -5 -4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, length.out=2.999999999) [1] -5 -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, length.out=33.3) [1] -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 [26] 20 21 22 23 24 25 26 27 28 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(-5, length.out=5) [1] -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, length.out=-1.1) Error in seq.default(0.2, -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, length.out=-2.999999999) Error in seq.default(0.2, -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, length.out=-33.3) Error in seq.default(0.2, -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, length.out=-5) Error in seq.default(0.2, -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, length.out=1.1) [1] 0.2 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, length.out=2.999999999) [1] 0.2 0.0 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, length.out=33.3) [1] 0.200000000 0.187878788 0.175757576 0.163636364 0.151515152 [6] 0.139393939 0.127272727 0.115151515 0.103030303 0.090909091 [11] 0.078787879 0.066666667 0.054545455 0.042424242 0.030303030 [16] 0.018181818 0.006060606 -0.006060606 -0.018181818 -0.030303030 [21] -0.042424242 -0.054545455 -0.066666667 -0.078787879 -0.090909091 [26] -0.103030303 -0.115151515 -0.127272727 -0.139393939 -0.151515152 [31] -0.163636364 -0.175757576 -0.187878788 -0.200000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -0.2, length.out=5) [1] 0.2 0.1 0.0 -0.1 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, length.out=-1.1) Error in seq.default(0.2, -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, length.out=-2.999999999) Error in seq.default(0.2, -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, length.out=-33.3) Error in seq.default(0.2, -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, length.out=-5) Error in seq.default(0.2, -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, length.out=1.1) [1] 0.2 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, length.out=2.999999999) [1] 0.20 -0.45 -1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, length.out=33.3) [1] 0.200000000 0.160606061 0.121212121 0.081818182 0.042424242 [6] 0.003030303 -0.036363636 -0.075757576 -0.115151515 -0.154545455 [11] -0.193939394 -0.233333333 -0.272727273 -0.312121212 -0.351515152 [16] -0.390909091 -0.430303030 -0.469696970 -0.509090909 -0.548484848 [21] -0.587878788 -0.627272727 -0.666666667 -0.706060606 -0.745454545 [26] -0.784848485 -0.824242424 -0.863636364 -0.903030303 -0.942424242 [31] -0.981818182 -1.021212121 -1.060606061 -1.100000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -1.1, length.out=5) [1] 0.200 -0.125 -0.450 -0.775 -1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, length.out=-1.1) Error in seq.default(0.2, -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, length.out=-2.999999999) Error in seq.default(0.2, -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, length.out=-33.3) Error in seq.default(0.2, -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, length.out=-5) Error in seq.default(0.2, -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, length.out=1.1) [1] 0.2 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, length.out=2.999999999) [1] 0.2 -1.4 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, length.out=33.3) [1] 0.200000000 0.103030303 0.006060606 -0.090909091 -0.187878788 [6] -0.284848485 -0.381818182 -0.478787879 -0.575757576 -0.672727272 [11] -0.769696969 -0.866666666 -0.963636363 -1.060606060 -1.157575757 [16] -1.254545454 -1.351515151 -1.448484848 -1.545454545 -1.642424242 [21] -1.739393939 -1.836363636 -1.933333333 -2.030303030 -2.127272727 [26] -2.224242423 -2.321212120 -2.418181817 -2.515151514 -2.612121211 [31] -2.709090908 -2.806060605 -2.903030302 -2.999999999 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -2.999999999, length.out=5) [1] 0.2 -0.6 -1.4 -2.2 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, length.out=-1.1) Error in seq.default(0.2, -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, length.out=-2.999999999) Error in seq.default(0.2, -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, length.out=-33.3) Error in seq.default(0.2, -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, length.out=-5) Error in seq.default(0.2, -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, length.out=1.1) [1] 0.2 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, length.out=2.999999999) [1] 0.20 -16.55 -33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, length.out=33.3) [1] 0.2000000 -0.8151515 -1.8303030 -2.8454545 -3.8606061 -4.8757576 [7] -5.8909091 -6.9060606 -7.9212121 -8.9363636 -9.9515152 -10.9666667 [13] -11.9818182 -12.9969697 -14.0121212 -15.0272727 -16.0424242 -17.0575758 [19] -18.0727273 -19.0878788 -20.1030303 -21.1181818 -22.1333333 -23.1484848 [25] -24.1636364 -25.1787879 -26.1939394 -27.2090909 -28.2242424 -29.2393939 [31] -30.2545455 -31.2696970 -32.2848485 -33.3000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -33.3, length.out=5) [1] 0.200 -8.175 -16.550 -24.925 -33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, length.out=-1.1) Error in seq.default(0.2, -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, length.out=-2.999999999) Error in seq.default(0.2, -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, length.out=-33.3) Error in seq.default(0.2, -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, length.out=-5) Error in seq.default(0.2, -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, length.out=1.1) [1] 0.2 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, length.out=2.999999999) [1] 0.2 -2.4 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, length.out=33.3) [1] 0.20000000 0.04242424 -0.11515152 -0.27272727 -0.43030303 -0.58787879 [7] -0.74545455 -0.90303030 -1.06060606 -1.21818182 -1.37575758 -1.53333333 [13] -1.69090909 -1.84848485 -2.00606061 -2.16363636 -2.32121212 -2.47878788 [19] -2.63636364 -2.79393939 -2.95151515 -3.10909091 -3.26666667 -3.42424242 [25] -3.58181818 -3.73939394 -3.89696970 -4.05454545 -4.21212121 -4.36969697 [31] -4.52727273 -4.68484848 -4.84242424 -5.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, -5, length.out=5) [1] 0.2 -1.1 -2.4 -3.7 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, length.out=-1.1) Error in seq.default(0.2, 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, length.out=-2.999999999) Error in seq.default(0.2, 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, length.out=-33.3) Error in seq.default(0.2, 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, length.out=-5) Error in seq.default(0.2, 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, length.out=1.1) [1] 0.2 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, length.out=2.999999999) [1] 0.2 0.2 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, length.out=33.3) [1] 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 [20] 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 0.2, length.out=5) [1] 0.2 0.2 0.2 0.2 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, length.out=-1.1) Error in seq.default(0.2, 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, length.out=-2.999999999) Error in seq.default(0.2, 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, length.out=-33.3) Error in seq.default(0.2, 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, length.out=-5) Error in seq.default(0.2, 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, length.out=1.1) [1] 0.2 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, length.out=2.999999999) [1] 0.20 0.65 1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, length.out=33.3) [1] 0.2000000 0.2272727 0.2545455 0.2818182 0.3090909 0.3363636 0.3636364 [8] 0.3909091 0.4181818 0.4454545 0.4727273 0.5000000 0.5272727 0.5545455 [15] 0.5818182 0.6090909 0.6363636 0.6636364 0.6909091 0.7181818 0.7454545 [22] 0.7727273 0.8000000 0.8272727 0.8545455 0.8818182 0.9090909 0.9363636 [29] 0.9636364 0.9909091 1.0181818 1.0454545 1.0727273 1.1000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 1.1, length.out=5) [1] 0.200 0.425 0.650 0.875 1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, length.out=-1.1) Error in seq.default(0.2, 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, length.out=-2.999999999) Error in seq.default(0.2, 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, length.out=-33.3) Error in seq.default(0.2, 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, length.out=-5) Error in seq.default(0.2, 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, length.out=1.1) [1] 0.2 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, length.out=2.999999999) [1] 0.2 1.6 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, length.out=33.3) [1] 0.2000000 0.2848485 0.3696970 0.4545455 0.5393939 0.6242424 0.7090909 [8] 0.7939394 0.8787879 0.9636364 1.0484848 1.1333333 1.2181818 1.3030303 [15] 1.3878788 1.4727273 1.5575758 1.6424242 1.7272727 1.8121212 1.8969697 [22] 1.9818182 2.0666667 2.1515152 2.2363636 2.3212121 2.4060606 2.4909091 [29] 2.5757576 2.6606061 2.7454545 2.8303030 2.9151515 3.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 2.999999999, length.out=5) [1] 0.2 0.9 1.6 2.3 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, length.out=-1.1) Error in seq.default(0.2, 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, length.out=-2.999999999) Error in seq.default(0.2, 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, length.out=-33.3) Error in seq.default(0.2, 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, length.out=-5) Error in seq.default(0.2, 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, length.out=1.1) [1] 0.2 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, length.out=2.999999999) [1] 0.20 16.75 33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, length.out=33.3) [1] 0.200000 1.203030 2.206061 3.209091 4.212121 5.215152 6.218182 [8] 7.221212 8.224242 9.227273 10.230303 11.233333 12.236364 13.239394 [15] 14.242424 15.245455 16.248485 17.251515 18.254545 19.257576 20.260606 [22] 21.263636 22.266667 23.269697 24.272727 25.275758 26.278788 27.281818 [29] 28.284848 29.287879 30.290909 31.293939 32.296970 33.300000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 33.3, length.out=5) [1] 0.200 8.475 16.750 25.025 33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, length.out=-1.1) Error in seq.default(0.2, 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, length.out=-2.999999999) Error in seq.default(0.2, 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, length.out=-33.3) Error in seq.default(0.2, 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, length.out=-5) Error in seq.default(0.2, 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, length.out=1.1) [1] 0.2 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, length.out=2.999999999) [1] 0.2 2.6 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, length.out=33.3) [1] 0.2000000 0.3454545 0.4909091 0.6363636 0.7818182 0.9272727 1.0727273 [8] 1.2181818 1.3636364 1.5090909 1.6545455 1.8000000 1.9454545 2.0909091 [15] 2.2363636 2.3818182 2.5272727 2.6727273 2.8181818 2.9636364 3.1090909 [22] 3.2545455 3.4000000 3.5454545 3.6909091 3.8363636 3.9818182 4.1272727 [29] 4.2727273 4.4181818 4.5636364 4.7090909 4.8545455 5.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, 5, length.out=5) [1] 0.2 1.4 2.6 3.8 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, length.out=-1.1) Error in seq.default(0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, length.out=-2.999999999) Error in seq.default(0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, length.out=-33.3) Error in seq.default(0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, length.out=-5) Error in seq.default(0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, length.out=1.1) [1] 0.2 1.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, length.out=2.999999999) [1] 0.2 1.2 2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, length.out=33.3) [1] 0.2 1.2 2.2 3.2 4.2 5.2 6.2 7.2 8.2 9.2 10.2 11.2 12.2 13.2 14.2 [16] 15.2 16.2 17.2 18.2 19.2 20.2 21.2 22.2 23.2 24.2 25.2 26.2 27.2 28.2 29.2 [31] 30.2 31.2 32.2 33.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0.2, length.out=5) [1] 0.2 1.2 2.2 3.2 4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, -1L, length.out=-1L) Error in seq.default(0L, -1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, -1L, length.out=-30L) Error in seq.default(0L, -1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, -1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, -1L, length.out=1L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, -1L, length.out=30L) [1] 0.00000000 -0.03448276 -0.06896552 -0.10344828 -0.13793103 -0.17241379 [7] -0.20689655 -0.24137931 -0.27586207 -0.31034483 -0.34482759 -0.37931034 [13] -0.41379310 -0.44827586 -0.48275862 -0.51724138 -0.55172414 -0.58620690 [19] -0.62068966 -0.65517241 -0.68965517 -0.72413793 -0.75862069 -0.79310345 [25] -0.82758621 -0.86206897 -0.89655172 -0.93103448 -0.96551724 -1.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, -30L, length.out=-1L) Error in seq.default(0L, -30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, -30L, length.out=-30L) Error in seq.default(0L, -30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, -30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, -30L, length.out=1L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, -30L, length.out=30L) [1] 0.000000 -1.034483 -2.068966 -3.103448 -4.137931 -5.172414 [7] -6.206897 -7.241379 -8.275862 -9.310345 -10.344828 -11.379310 [13] -12.413793 -13.448276 -14.482759 -15.517241 -16.551724 -17.586207 [19] -18.620690 -19.655172 -20.689655 -21.724138 -22.758621 -23.793103 [25] -24.827586 -25.862069 -26.896552 -27.931034 -28.965517 -30.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 0L, length.out=-1L) Error in seq.default(0L, 0L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 0L, length.out=-30L) Error in seq.default(0L, 0L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 0L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 0L, length.out=1L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 0L, length.out=30L) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 1L, length.out=-1L) Error in seq.default(0L, 1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 1L, length.out=-30L) Error in seq.default(0L, 1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 1L, length.out=1L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 1L, length.out=30L) [1] 0.00000000 0.03448276 0.06896552 0.10344828 0.13793103 0.17241379 [7] 0.20689655 0.24137931 0.27586207 0.31034483 0.34482759 0.37931034 [13] 0.41379310 0.44827586 0.48275862 0.51724138 0.55172414 0.58620690 [19] 0.62068966 0.65517241 0.68965517 0.72413793 0.75862069 0.79310345 [25] 0.82758621 0.86206897 0.89655172 0.93103448 0.96551724 1.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 30L, length.out=-1L) Error in seq.default(0L, 30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 30L, length.out=-30L) Error in seq.default(0L, 30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 30L, length.out=1L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, 30L, length.out=30L) [1] 0.000000 1.034483 2.068966 3.103448 4.137931 5.172414 6.206897 [8] 7.241379 8.275862 9.310345 10.344828 11.379310 12.413793 13.448276 [15] 14.482759 15.517241 16.551724 17.586207 18.620690 19.655172 20.689655 [22] 21.724138 22.758621 23.793103 24.827586 25.862069 26.896552 27.931034 [29] 28.965517 30.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, length.out=-1L) Error in seq.default(0L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, length.out=-30L) Error in seq.default(0L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, length.out=1L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(0L, length.out=30L) [1] 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 [26] 25 26 27 28 29 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, length.out=-1.1) Error in seq.default(1.1, -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, length.out=-2.999999999) Error in seq.default(1.1, -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, length.out=-33.3) Error in seq.default(1.1, -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, length.out=-5) Error in seq.default(1.1, -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, length.out=1.1) [1] 1.1 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, length.out=2.999999999) [1] 1.10 0.45 -0.20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, length.out=33.3) [1] 1.100000000 1.060606061 1.021212121 0.981818182 0.942424242 [6] 0.903030303 0.863636364 0.824242424 0.784848485 0.745454545 [11] 0.706060606 0.666666667 0.627272727 0.587878788 0.548484848 [16] 0.509090909 0.469696970 0.430303030 0.390909091 0.351515152 [21] 0.312121212 0.272727273 0.233333333 0.193939394 0.154545455 [26] 0.115151515 0.075757576 0.036363636 -0.003030303 -0.042424242 [31] -0.081818182 -0.121212121 -0.160606061 -0.200000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -0.2, length.out=5) [1] 1.100 0.775 0.450 0.125 -0.200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, length.out=-1.1) Error in seq.default(1.1, -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, length.out=-2.999999999) Error in seq.default(1.1, -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, length.out=-33.3) Error in seq.default(1.1, -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, length.out=-5) Error in seq.default(1.1, -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, length.out=1.1) [1] 1.1 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, length.out=2.999999999) [1] 1.1 0.0 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, length.out=33.3) [1] 1.10000000 1.03333333 0.96666667 0.90000000 0.83333333 0.76666667 [7] 0.70000000 0.63333333 0.56666667 0.50000000 0.43333333 0.36666667 [13] 0.30000000 0.23333333 0.16666667 0.10000000 0.03333333 -0.03333333 [19] -0.10000000 -0.16666667 -0.23333333 -0.30000000 -0.36666667 -0.43333333 [25] -0.50000000 -0.56666667 -0.63333333 -0.70000000 -0.76666667 -0.83333333 [31] -0.90000000 -0.96666667 -1.03333333 -1.10000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -1.1, length.out=5) [1] 1.10 0.55 0.00 -0.55 -1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, length.out=-1.1) Error in seq.default(1.1, -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, length.out=-2.999999999) Error in seq.default(1.1, -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, length.out=-33.3) Error in seq.default(1.1, -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, length.out=-5) Error in seq.default(1.1, -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, length.out=1.1) [1] 1.1 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, length.out=2.999999999) [1] 1.10 -0.95 -3.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, length.out=33.3) [1] 1.10000000 0.97575758 0.85151515 0.72727273 0.60303030 0.47878788 [7] 0.35454545 0.23030303 0.10606061 -0.01818182 -0.14242424 -0.26666667 [13] -0.39090909 -0.51515151 -0.63939394 -0.76363636 -0.88787879 -1.01212121 [19] -1.13636364 -1.26060606 -1.38484848 -1.50909091 -1.63333333 -1.75757576 [25] -1.88181818 -2.00606061 -2.13030303 -2.25454545 -2.37878788 -2.50303030 [31] -2.62727273 -2.75151515 -2.87575757 -3.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -2.999999999, length.out=5) [1] 1.100 0.075 -0.950 -1.975 -3.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, length.out=-1.1) Error in seq.default(1.1, -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, length.out=-2.999999999) Error in seq.default(1.1, -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, length.out=-33.3) Error in seq.default(1.1, -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, length.out=-5) Error in seq.default(1.1, -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, length.out=1.1) [1] 1.1 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, length.out=2.999999999) [1] 1.1 -16.1 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, length.out=33.3) [1] 1.10000000 0.05757576 -0.98484848 -2.02727273 -3.06969697 [6] -4.11212121 -5.15454545 -6.19696970 -7.23939394 -8.28181818 [11] -9.32424242 -10.36666667 -11.40909091 -12.45151515 -13.49393939 [16] -14.53636364 -15.57878788 -16.62121212 -17.66363636 -18.70606061 [21] -19.74848485 -20.79090909 -21.83333333 -22.87575758 -23.91818182 [26] -24.96060606 -26.00303030 -27.04545455 -28.08787879 -29.13030303 [31] -30.17272727 -31.21515152 -32.25757576 -33.30000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -33.3, length.out=5) [1] 1.1 -7.5 -16.1 -24.7 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, length.out=-1.1) Error in seq.default(1.1, -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, length.out=-2.999999999) Error in seq.default(1.1, -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, length.out=-33.3) Error in seq.default(1.1, -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, length.out=-5) Error in seq.default(1.1, -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, length.out=1.1) [1] 1.1 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, length.out=2.999999999) [1] 1.10 -1.95 -5.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, length.out=33.3) [1] 1.100000000 0.915151515 0.730303030 0.545454545 0.360606061 [6] 0.175757576 -0.009090909 -0.193939394 -0.378787879 -0.563636364 [11] -0.748484848 -0.933333333 -1.118181818 -1.303030303 -1.487878788 [16] -1.672727273 -1.857575758 -2.042424242 -2.227272727 -2.412121212 [21] -2.596969697 -2.781818182 -2.966666667 -3.151515152 -3.336363636 [26] -3.521212121 -3.706060606 -3.890909091 -4.075757576 -4.260606061 [31] -4.445454545 -4.630303030 -4.815151515 -5.000000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, -5, length.out=5) [1] 1.100 -0.425 -1.950 -3.475 -5.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, length.out=-1.1) Error in seq.default(1.1, 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, length.out=-2.999999999) Error in seq.default(1.1, 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, length.out=-33.3) Error in seq.default(1.1, 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, length.out=-5) Error in seq.default(1.1, 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, length.out=1.1) [1] 1.1 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, length.out=2.999999999) [1] 1.10 0.65 0.20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, length.out=33.3) [1] 1.1000000 1.0727273 1.0454545 1.0181818 0.9909091 0.9636364 0.9363636 [8] 0.9090909 0.8818182 0.8545455 0.8272727 0.8000000 0.7727273 0.7454545 [15] 0.7181818 0.6909091 0.6636364 0.6363636 0.6090909 0.5818182 0.5545455 [22] 0.5272727 0.5000000 0.4727273 0.4454545 0.4181818 0.3909091 0.3636364 [29] 0.3363636 0.3090909 0.2818182 0.2545455 0.2272727 0.2000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 0.2, length.out=5) [1] 1.100 0.875 0.650 0.425 0.200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, length.out=-1.1) Error in seq.default(1.1, 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, length.out=-2.999999999) Error in seq.default(1.1, 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, length.out=-33.3) Error in seq.default(1.1, 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, length.out=-5) Error in seq.default(1.1, 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, length.out=1.1) [1] 1.1 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, length.out=2.999999999) [1] 1.1 1.1 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, length.out=33.3) [1] 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 [20] 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 1.1, length.out=5) [1] 1.1 1.1 1.1 1.1 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, length.out=-1.1) Error in seq.default(1.1, 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, length.out=-2.999999999) Error in seq.default(1.1, 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, length.out=-33.3) Error in seq.default(1.1, 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, length.out=-5) Error in seq.default(1.1, 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, length.out=1.1) [1] 1.1 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, length.out=2.999999999) [1] 1.10 2.05 3.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, length.out=33.3) [1] 1.100000 1.157576 1.215152 1.272727 1.330303 1.387879 1.445455 1.503030 [9] 1.560606 1.618182 1.675758 1.733333 1.790909 1.848485 1.906061 1.963636 [17] 2.021212 2.078788 2.136364 2.193939 2.251515 2.309091 2.366667 2.424242 [25] 2.481818 2.539394 2.596970 2.654545 2.712121 2.769697 2.827273 2.884848 [33] 2.942424 3.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 2.999999999, length.out=5) [1] 1.100 1.575 2.050 2.525 3.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, length.out=-1.1) Error in seq.default(1.1, 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, length.out=-2.999999999) Error in seq.default(1.1, 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, length.out=-33.3) Error in seq.default(1.1, 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, length.out=-5) Error in seq.default(1.1, 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, length.out=1.1) [1] 1.1 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, length.out=2.999999999) [1] 1.1 17.2 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, length.out=33.3) [1] 1.100000 2.075758 3.051515 4.027273 5.003030 5.978788 6.954545 [8] 7.930303 8.906061 9.881818 10.857576 11.833333 12.809091 13.784848 [15] 14.760606 15.736364 16.712121 17.687879 18.663636 19.639394 20.615152 [22] 21.590909 22.566667 23.542424 24.518182 25.493939 26.469697 27.445455 [29] 28.421212 29.396970 30.372727 31.348485 32.324242 33.300000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 33.3, length.out=5) [1] 1.10 9.15 17.20 25.25 33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, length.out=-1.1) Error in seq.default(1.1, 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, length.out=-2.999999999) Error in seq.default(1.1, 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, length.out=-33.3) Error in seq.default(1.1, 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, length.out=-5) Error in seq.default(1.1, 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, length.out=1.1) [1] 1.1 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, length.out=2.999999999) [1] 1.10 3.05 5.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, length.out=33.3) [1] 1.100000 1.218182 1.336364 1.454545 1.572727 1.690909 1.809091 1.927273 [9] 2.045455 2.163636 2.281818 2.400000 2.518182 2.636364 2.754545 2.872727 [17] 2.990909 3.109091 3.227273 3.345455 3.463636 3.581818 3.700000 3.818182 [25] 3.936364 4.054545 4.172727 4.290909 4.409091 4.527273 4.645455 4.763636 [33] 4.881818 5.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, 5, length.out=5) [1] 1.100 2.075 3.050 4.025 5.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, length.out=-1.1) Error in seq.default(1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, length.out=-2.999999999) Error in seq.default(1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, length.out=-33.3) Error in seq.default(1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, length.out=-5) Error in seq.default(1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, length.out=1.1) [1] 1.1 2.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, length.out=2.999999999) [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, length.out=33.3) [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 11.1 12.1 13.1 14.1 15.1 [16] 16.1 17.1 18.1 19.1 20.1 21.1 22.1 23.1 24.1 25.1 26.1 27.1 28.1 29.1 30.1 [31] 31.1 32.1 33.1 34.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1.1, length.out=5) [1] 1.1 2.1 3.1 4.1 5.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, -1L, length.out=-1L) Error in seq.default(1L, -1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, -1L, length.out=-30L) Error in seq.default(1L, -1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, -1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, -1L, length.out=1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, -1L, length.out=30L) [1] 1.00000000 0.93103448 0.86206897 0.79310345 0.72413793 0.65517241 [7] 0.58620690 0.51724138 0.44827586 0.37931034 0.31034483 0.24137931 [13] 0.17241379 0.10344828 0.03448276 -0.03448276 -0.10344828 -0.17241379 [19] -0.24137931 -0.31034483 -0.37931034 -0.44827586 -0.51724138 -0.58620690 [25] -0.65517241 -0.72413793 -0.79310345 -0.86206897 -0.93103448 -1.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, -30L, length.out=-1L) Error in seq.default(1L, -30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, -30L, length.out=-30L) Error in seq.default(1L, -30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, -30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, -30L, length.out=1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, -30L, length.out=30L) [1] 1.00000000 -0.06896552 -1.13793103 -2.20689655 -3.27586207 [6] -4.34482759 -5.41379310 -6.48275862 -7.55172414 -8.62068966 [11] -9.68965517 -10.75862069 -11.82758621 -12.89655172 -13.96551724 [16] -15.03448276 -16.10344828 -17.17241379 -18.24137931 -19.31034483 [21] -20.37931034 -21.44827586 -22.51724138 -23.58620690 -24.65517241 [26] -25.72413793 -26.79310345 -27.86206897 -28.93103448 -30.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 0L, length.out=-1L) Error in seq.default(1L, 0L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 0L, length.out=-30L) Error in seq.default(1L, 0L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 0L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 0L, length.out=1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 0L, length.out=30L) [1] 1.00000000 0.96551724 0.93103448 0.89655172 0.86206897 0.82758621 [7] 0.79310345 0.75862069 0.72413793 0.68965517 0.65517241 0.62068966 [13] 0.58620690 0.55172414 0.51724138 0.48275862 0.44827586 0.41379310 [19] 0.37931034 0.34482759 0.31034483 0.27586207 0.24137931 0.20689655 [25] 0.17241379 0.13793103 0.10344828 0.06896552 0.03448276 0.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 1L, length.out=-1L) Error in seq.default(1L, 1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 1L, length.out=-30L) Error in seq.default(1L, 1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 1L, length.out=1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 1L, length.out=30L) [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 30L, length.out=-1L) Error in seq.default(1L, 30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 30L, length.out=-30L) Error in seq.default(1L, 30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 30L, length.out=1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, 30L, length.out=30L) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, length.out=-1L) Error in seq.default(1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, length.out=-30L) Error in seq.default(1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, length.out=1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(1L, length.out=30L) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, length.out=-1.1) Error in seq.default(2.999999999, -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, length.out=-2.999999999) Error in seq.default(2.999999999, -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, length.out=-33.3) Error in seq.default(2.999999999, -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, length.out=-5) Error in seq.default(2.999999999, -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, length.out=1.1) [1] 3.0 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, length.out=2.999999999) [1] 3.0 1.4 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, length.out=33.3) [1] 2.999999999 2.903030302 2.806060605 2.709090908 2.612121211 [6] 2.515151514 2.418181817 2.321212120 2.224242423 2.127272727 [11] 2.030303030 1.933333333 1.836363636 1.739393939 1.642424242 [16] 1.545454545 1.448484848 1.351515151 1.254545454 1.157575757 [21] 1.060606060 0.963636363 0.866666666 0.769696969 0.672727272 [26] 0.575757576 0.478787879 0.381818182 0.284848485 0.187878788 [31] 0.090909091 -0.006060606 -0.103030303 -0.200000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -0.2, length.out=5) [1] 3.0 2.2 1.4 0.6 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, length.out=-1.1) Error in seq.default(2.999999999, -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, length.out=-2.999999999) Error in seq.default(2.999999999, -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, length.out=-33.3) Error in seq.default(2.999999999, -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, length.out=-5) Error in seq.default(2.999999999, -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, length.out=1.1) [1] 3.0 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, length.out=2.999999999) [1] 3.00 0.95 -1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, length.out=33.3) [1] 3.00000000 2.87575757 2.75151515 2.62727273 2.50303030 2.37878788 [7] 2.25454545 2.13030303 2.00606061 1.88181818 1.75757576 1.63333333 [13] 1.50909091 1.38484848 1.26060606 1.13636364 1.01212121 0.88787879 [19] 0.76363636 0.63939394 0.51515151 0.39090909 0.26666667 0.14242424 [25] 0.01818182 -0.10606061 -0.23030303 -0.35454545 -0.47878788 -0.60303030 [31] -0.72727273 -0.85151515 -0.97575758 -1.10000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -1.1, length.out=5) [1] 3.000 1.975 0.950 -0.075 -1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, length.out=-1.1) Error in seq.default(2.999999999, -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, length.out=-2.999999999) Error in seq.default(2.999999999, -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, length.out=-33.3) Error in seq.default(2.999999999, -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, length.out=-5) Error in seq.default(2.999999999, -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, length.out=1.1) [1] 3 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, length.out=2.999999999) [1] 3 0 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, length.out=33.3) [1] 3.00000000 2.81818182 2.63636364 2.45454545 2.27272727 2.09090909 [7] 1.90909091 1.72727273 1.54545454 1.36363636 1.18181818 1.00000000 [13] 0.81818182 0.63636364 0.45454545 0.27272727 0.09090909 -0.09090909 [19] -0.27272727 -0.45454545 -0.63636364 -0.81818182 -1.00000000 -1.18181818 [25] -1.36363636 -1.54545454 -1.72727273 -1.90909091 -2.09090909 -2.27272727 [31] -2.45454545 -2.63636364 -2.81818182 -3.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -2.999999999, length.out=5) [1] 3.0 1.5 0.0 -1.5 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, length.out=-1.1) Error in seq.default(2.999999999, -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, length.out=-2.999999999) Error in seq.default(2.999999999, -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, length.out=-33.3) Error in seq.default(2.999999999, -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, length.out=-5) Error in seq.default(2.999999999, -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, length.out=1.1) [1] 3.0 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, length.out=2.999999999) [1] 3.00 -15.15 -33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, length.out=33.3) [1] 3.0 1.9 0.8 -0.3 -1.4 -2.5 -3.6 -4.7 -5.8 -6.9 -8.0 -9.1 [13] -10.2 -11.3 -12.4 -13.5 -14.6 -15.7 -16.8 -17.9 -19.0 -20.1 -21.2 -22.3 [25] -23.4 -24.5 -25.6 -26.7 -27.8 -28.9 -30.0 -31.1 -32.2 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -33.3, length.out=5) [1] 3.000 -6.075 -15.150 -24.225 -33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, length.out=-1.1) Error in seq.default(2.999999999, -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, length.out=-2.999999999) Error in seq.default(2.999999999, -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, length.out=-33.3) Error in seq.default(2.999999999, -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, length.out=-5) Error in seq.default(2.999999999, -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, length.out=1.1) [1] 3 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, length.out=2.999999999) [1] 3 -1 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, length.out=33.3) [1] 3.00000000 2.75757576 2.51515151 2.27272727 2.03030303 1.78787879 [7] 1.54545454 1.30303030 1.06060606 0.81818182 0.57575758 0.33333333 [13] 0.09090909 -0.15151515 -0.39393939 -0.63636364 -0.87878788 -1.12121212 [19] -1.36363636 -1.60606061 -1.84848485 -2.09090909 -2.33333333 -2.57575758 [25] -2.81818182 -3.06060606 -3.30303030 -3.54545455 -3.78787879 -4.03030303 [31] -4.27272727 -4.51515152 -4.75757576 -5.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, -5, length.out=5) [1] 3 1 -1 -3 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, length.out=-1.1) Error in seq.default(2.999999999, 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, length.out=-2.999999999) Error in seq.default(2.999999999, 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, length.out=-33.3) Error in seq.default(2.999999999, 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, length.out=-5) Error in seq.default(2.999999999, 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, length.out=1.1) [1] 3.0 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, length.out=2.999999999) [1] 3.0 1.6 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, length.out=33.3) [1] 3.0000000 2.9151515 2.8303030 2.7454545 2.6606061 2.5757576 2.4909091 [8] 2.4060606 2.3212121 2.2363636 2.1515152 2.0666667 1.9818182 1.8969697 [15] 1.8121212 1.7272727 1.6424242 1.5575758 1.4727273 1.3878788 1.3030303 [22] 1.2181818 1.1333333 1.0484848 0.9636364 0.8787879 0.7939394 0.7090909 [29] 0.6242424 0.5393939 0.4545455 0.3696970 0.2848485 0.2000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 0.2, length.out=5) [1] 3.0 2.3 1.6 0.9 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, length.out=-1.1) Error in seq.default(2.999999999, 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, length.out=-2.999999999) Error in seq.default(2.999999999, 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, length.out=-33.3) Error in seq.default(2.999999999, 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, length.out=-5) Error in seq.default(2.999999999, 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, length.out=1.1) [1] 3.0 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, length.out=2.999999999) [1] 3.00 2.05 1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, length.out=33.3) [1] 3.000000 2.942424 2.884848 2.827273 2.769697 2.712121 2.654545 2.596970 [9] 2.539394 2.481818 2.424242 2.366667 2.309091 2.251515 2.193939 2.136364 [17] 2.078788 2.021212 1.963636 1.906061 1.848485 1.790909 1.733333 1.675758 [25] 1.618182 1.560606 1.503030 1.445455 1.387879 1.330303 1.272727 1.215152 [33] 1.157576 1.100000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 1.1, length.out=5) [1] 3.000 2.525 2.050 1.575 1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, length.out=-1.1) Error in seq.default(2.999999999, 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, length.out=-2.999999999) Error in seq.default(2.999999999, 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, length.out=-33.3) Error in seq.default(2.999999999, 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, length.out=-5) Error in seq.default(2.999999999, 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, length.out=1.1) [1] 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, length.out=2.999999999) [1] 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, length.out=33.3) [1] 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 2.999999999, length.out=5) [1] 3 3 3 3 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, length.out=-1.1) Error in seq.default(2.999999999, 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, length.out=-2.999999999) Error in seq.default(2.999999999, 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, length.out=-33.3) Error in seq.default(2.999999999, 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, length.out=-5) Error in seq.default(2.999999999, 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, length.out=1.1) [1] 3.0 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, length.out=2.999999999) [1] 3.00 18.15 33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, length.out=33.3) [1] 3.000000 3.918182 4.836364 5.754545 6.672727 7.590909 8.509091 [8] 9.427273 10.345455 11.263636 12.181818 13.100000 14.018182 14.936364 [15] 15.854545 16.772727 17.690909 18.609091 19.527273 20.445455 21.363636 [22] 22.281818 23.200000 24.118182 25.036364 25.954545 26.872727 27.790909 [29] 28.709091 29.627273 30.545455 31.463636 32.381818 33.300000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 33.3, length.out=5) [1] 3.000 10.575 18.150 25.725 33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, length.out=-1.1) Error in seq.default(2.999999999, 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, length.out=-2.999999999) Error in seq.default(2.999999999, 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, length.out=-33.3) Error in seq.default(2.999999999, 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, length.out=-5) Error in seq.default(2.999999999, 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, length.out=1.1) [1] 3 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, length.out=2.999999999) [1] 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, length.out=33.3) [1] 3.000000 3.060606 3.121212 3.181818 3.242424 3.303030 3.363636 3.424242 [9] 3.484848 3.545455 3.606061 3.666667 3.727273 3.787879 3.848485 3.909091 [17] 3.969697 4.030303 4.090909 4.151515 4.212121 4.272727 4.333333 4.393939 [25] 4.454545 4.515152 4.575758 4.636364 4.696970 4.757576 4.818182 4.878788 [33] 4.939394 5.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, 5, length.out=5) [1] 3.0 3.5 4.0 4.5 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, length.out=-1.1) Error in seq.default(2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, length.out=-2.999999999) Error in seq.default(2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, length.out=-33.3) Error in seq.default(2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, length.out=-5) Error in seq.default(2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, length.out=1.1) [1] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, length.out=2.999999999) [1] 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, length.out=33.3) [1] 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 [26] 28 29 30 31 32 33 34 35 36 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(2.999999999, length.out=5) [1] 3 4 5 6 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, -1L, length.out=-1L) Error in seq.default(30L, -1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, -1L, length.out=-30L) Error in seq.default(30L, -1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, -1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, -1L, length.out=1L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, -1L, length.out=30L) [1] 30.00000000 28.93103448 27.86206897 26.79310345 25.72413793 24.65517241 [7] 23.58620690 22.51724138 21.44827586 20.37931034 19.31034483 18.24137931 [13] 17.17241379 16.10344828 15.03448276 13.96551724 12.89655172 11.82758621 [19] 10.75862069 9.68965517 8.62068966 7.55172414 6.48275862 5.41379310 [25] 4.34482759 3.27586207 2.20689655 1.13793103 0.06896552 -1.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, -30L, length.out=-1L) Error in seq.default(30L, -30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, -30L, length.out=-30L) Error in seq.default(30L, -30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, -30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, -30L, length.out=1L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, -30L, length.out=30L) [1] 30.000000 27.931034 25.862069 23.793103 21.724138 19.655172 [7] 17.586207 15.517241 13.448276 11.379310 9.310345 7.241379 [13] 5.172414 3.103448 1.034483 -1.034483 -3.103448 -5.172414 [19] -7.241379 -9.310345 -11.379310 -13.448276 -15.517241 -17.586207 [25] -19.655172 -21.724138 -23.793103 -25.862069 -27.931034 -30.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 0L, length.out=-1L) Error in seq.default(30L, 0L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 0L, length.out=-30L) Error in seq.default(30L, 0L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 0L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 0L, length.out=1L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 0L, length.out=30L) [1] 30.000000 28.965517 27.931034 26.896552 25.862069 24.827586 23.793103 [8] 22.758621 21.724138 20.689655 19.655172 18.620690 17.586207 16.551724 [15] 15.517241 14.482759 13.448276 12.413793 11.379310 10.344828 9.310345 [22] 8.275862 7.241379 6.206897 5.172414 4.137931 3.103448 2.068966 [29] 1.034483 0.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 1L, length.out=-1L) Error in seq.default(30L, 1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 1L, length.out=-30L) Error in seq.default(30L, 1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 1L, length.out=1L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 1L, length.out=30L) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 30L, length.out=-1L) Error in seq.default(30L, 30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 30L, length.out=-30L) Error in seq.default(30L, 30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 30L, length.out=1L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, 30L, length.out=30L) [1] 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 30 [26] 30 30 30 30 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, length.out=-1L) Error in seq.default(30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, length.out=-30L) Error in seq.default(30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, length.out=1L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(30L, length.out=30L) [1] 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 [26] 55 56 57 58 59 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, length.out=-1.1) Error in seq.default(33.3, -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, length.out=-2.999999999) Error in seq.default(33.3, -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, length.out=-33.3) Error in seq.default(33.3, -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, length.out=-5) Error in seq.default(33.3, -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, length.out=1.1) [1] 33.3 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, length.out=2.999999999) [1] 33.30 16.55 -0.20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, length.out=33.3) [1] 33.3000000 32.2848485 31.2696970 30.2545455 29.2393939 28.2242424 [7] 27.2090909 26.1939394 25.1787879 24.1636364 23.1484848 22.1333333 [13] 21.1181818 20.1030303 19.0878788 18.0727273 17.0575758 16.0424242 [19] 15.0272727 14.0121212 12.9969697 11.9818182 10.9666667 9.9515152 [25] 8.9363636 7.9212121 6.9060606 5.8909091 4.8757576 3.8606061 [31] 2.8454545 1.8303030 0.8151515 -0.2000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -0.2, length.out=5) [1] 33.300 24.925 16.550 8.175 -0.200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, length.out=-1.1) Error in seq.default(33.3, -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, length.out=-2.999999999) Error in seq.default(33.3, -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, length.out=-33.3) Error in seq.default(33.3, -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, length.out=-5) Error in seq.default(33.3, -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, length.out=1.1) [1] 33.3 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, length.out=2.999999999) [1] 33.3 16.1 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, length.out=33.3) [1] 33.30000000 32.25757576 31.21515152 30.17272727 29.13030303 28.08787879 [7] 27.04545455 26.00303030 24.96060606 23.91818182 22.87575758 21.83333333 [13] 20.79090909 19.74848485 18.70606061 17.66363636 16.62121212 15.57878788 [19] 14.53636364 13.49393939 12.45151515 11.40909091 10.36666667 9.32424242 [25] 8.28181818 7.23939394 6.19696970 5.15454545 4.11212121 3.06969697 [31] 2.02727273 0.98484848 -0.05757576 -1.10000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -1.1, length.out=5) [1] 33.3 24.7 16.1 7.5 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, length.out=-1.1) Error in seq.default(33.3, -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, length.out=-2.999999999) Error in seq.default(33.3, -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, length.out=-33.3) Error in seq.default(33.3, -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, length.out=-5) Error in seq.default(33.3, -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, length.out=1.1) [1] 33.3 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, length.out=2.999999999) [1] 33.30 15.15 -3.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, length.out=33.3) [1] 33.3 32.2 31.1 30.0 28.9 27.8 26.7 25.6 24.5 23.4 22.3 21.2 20.1 19.0 17.9 [16] 16.8 15.7 14.6 13.5 12.4 11.3 10.2 9.1 8.0 6.9 5.8 4.7 3.6 2.5 1.4 [31] 0.3 -0.8 -1.9 -3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -2.999999999, length.out=5) [1] 33.300 24.225 15.150 6.075 -3.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, length.out=-1.1) Error in seq.default(33.3, -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, length.out=-2.999999999) Error in seq.default(33.3, -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, length.out=-33.3) Error in seq.default(33.3, -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, length.out=-5) Error in seq.default(33.3, -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, length.out=1.1) [1] 33.3 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, length.out=2.999999999) [1] 33.3 0.0 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, length.out=33.3) [1] 33.300000 31.281818 29.263636 27.245455 25.227273 23.209091 [7] 21.190909 19.172727 17.154545 15.136364 13.118182 11.100000 [13] 9.081818 7.063636 5.045455 3.027273 1.009091 -1.009091 [19] -3.027273 -5.045455 -7.063636 -9.081818 -11.100000 -13.118182 [25] -15.136364 -17.154545 -19.172727 -21.190909 -23.209091 -25.227273 [31] -27.245455 -29.263636 -31.281818 -33.300000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -33.3, length.out=5) [1] 33.30 16.65 0.00 -16.65 -33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, length.out=-1.1) Error in seq.default(33.3, -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, length.out=-2.999999999) Error in seq.default(33.3, -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, length.out=-33.3) Error in seq.default(33.3, -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, length.out=-5) Error in seq.default(33.3, -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, length.out=1.1) [1] 33.3 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, length.out=2.999999999) [1] 33.30 14.15 -5.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, length.out=33.3) [1] 33.3000000 32.1393939 30.9787879 29.8181818 28.6575758 27.4969697 [7] 26.3363636 25.1757576 24.0151515 22.8545455 21.6939394 20.5333333 [13] 19.3727273 18.2121212 17.0515152 15.8909091 14.7303030 13.5696970 [19] 12.4090909 11.2484848 10.0878788 8.9272727 7.7666667 6.6060606 [25] 5.4454545 4.2848485 3.1242424 1.9636364 0.8030303 -0.3575758 [31] -1.5181818 -2.6787879 -3.8393939 -5.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, -5, length.out=5) [1] 33.300 23.725 14.150 4.575 -5.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, length.out=-1.1) Error in seq.default(33.3, 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, length.out=-2.999999999) Error in seq.default(33.3, 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, length.out=-33.3) Error in seq.default(33.3, 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, length.out=-5) Error in seq.default(33.3, 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, length.out=1.1) [1] 33.3 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, length.out=2.999999999) [1] 33.30 16.75 0.20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, length.out=33.3) [1] 33.300000 32.296970 31.293939 30.290909 29.287879 28.284848 27.281818 [8] 26.278788 25.275758 24.272727 23.269697 22.266667 21.263636 20.260606 [15] 19.257576 18.254545 17.251515 16.248485 15.245455 14.242424 13.239394 [22] 12.236364 11.233333 10.230303 9.227273 8.224242 7.221212 6.218182 [29] 5.215152 4.212121 3.209091 2.206061 1.203030 0.200000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 0.2, length.out=5) [1] 33.300 25.025 16.750 8.475 0.200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, length.out=-1.1) Error in seq.default(33.3, 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, length.out=-2.999999999) Error in seq.default(33.3, 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, length.out=-33.3) Error in seq.default(33.3, 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, length.out=-5) Error in seq.default(33.3, 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, length.out=1.1) [1] 33.3 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, length.out=2.999999999) [1] 33.3 17.2 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, length.out=33.3) [1] 33.300000 32.324242 31.348485 30.372727 29.396970 28.421212 27.445455 [8] 26.469697 25.493939 24.518182 23.542424 22.566667 21.590909 20.615152 [15] 19.639394 18.663636 17.687879 16.712121 15.736364 14.760606 13.784848 [22] 12.809091 11.833333 10.857576 9.881818 8.906061 7.930303 6.954545 [29] 5.978788 5.003030 4.027273 3.051515 2.075758 1.100000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 1.1, length.out=5) [1] 33.30 25.25 17.20 9.15 1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, length.out=-1.1) Error in seq.default(33.3, 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, length.out=-2.999999999) Error in seq.default(33.3, 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, length.out=-33.3) Error in seq.default(33.3, 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, length.out=-5) Error in seq.default(33.3, 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, length.out=1.1) [1] 33.3 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, length.out=2.999999999) [1] 33.30 18.15 3.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, length.out=33.3) [1] 33.300000 32.381818 31.463636 30.545455 29.627273 28.709091 27.790909 [8] 26.872727 25.954545 25.036364 24.118182 23.200000 22.281818 21.363636 [15] 20.445455 19.527273 18.609091 17.690909 16.772727 15.854545 14.936364 [22] 14.018182 13.100000 12.181818 11.263636 10.345455 9.427273 8.509091 [29] 7.590909 6.672727 5.754545 4.836364 3.918182 3.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 2.999999999, length.out=5) [1] 33.300 25.725 18.150 10.575 3.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, length.out=-1.1) Error in seq.default(33.3, 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, length.out=-2.999999999) Error in seq.default(33.3, 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, length.out=-33.3) Error in seq.default(33.3, 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, length.out=-5) Error in seq.default(33.3, 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, length.out=1.1) [1] 33.3 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, length.out=2.999999999) [1] 33.3 33.3 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, length.out=33.3) [1] 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 [16] 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 33.3 [31] 33.3 33.3 33.3 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 33.3, length.out=5) [1] 33.3 33.3 33.3 33.3 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, length.out=-1.1) Error in seq.default(33.3, 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, length.out=-2.999999999) Error in seq.default(33.3, 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, length.out=-33.3) Error in seq.default(33.3, 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, length.out=-5) Error in seq.default(33.3, 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, length.out=1.1) [1] 33.3 5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, length.out=2.999999999) [1] 33.30 19.15 5.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, length.out=33.3) [1] 33.300000 32.442424 31.584848 30.727273 29.869697 29.012121 28.154545 [8] 27.296970 26.439394 25.581818 24.724242 23.866667 23.009091 22.151515 [15] 21.293939 20.436364 19.578788 18.721212 17.863636 17.006061 16.148485 [22] 15.290909 14.433333 13.575758 12.718182 11.860606 11.003030 10.145455 [29] 9.287879 8.430303 7.572727 6.715152 5.857576 5.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, 5, length.out=5) [1] 33.300 26.225 19.150 12.075 5.000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, length.out=-1.1) Error in seq.default(33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, length.out=-2.999999999) Error in seq.default(33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, length.out=-33.3) Error in seq.default(33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, length.out=-5) Error in seq.default(33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, length.out=1.1) [1] 33.3 34.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, length.out=2.999999999) [1] 33.3 34.3 35.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, length.out=33.3) [1] 33.3 34.3 35.3 36.3 37.3 38.3 39.3 40.3 41.3 42.3 43.3 44.3 45.3 46.3 47.3 [16] 48.3 49.3 50.3 51.3 52.3 53.3 54.3 55.3 56.3 57.3 58.3 59.3 60.3 61.3 62.3 [31] 63.3 64.3 65.3 66.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(33.3, length.out=5) [1] 33.3 34.3 35.3 36.3 37.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, length.out=-1.1) Error in seq.default(5, -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, length.out=-2.999999999) Error in seq.default(5, -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, length.out=-33.3) Error in seq.default(5, -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, length.out=-5) Error in seq.default(5, -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, length.out=1.1) [1] 5.0 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, length.out=2.999999999) [1] 5.0 2.4 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, length.out=33.3) [1] 5.00000000 4.84242424 4.68484848 4.52727273 4.36969697 4.21212121 [7] 4.05454545 3.89696970 3.73939394 3.58181818 3.42424242 3.26666667 [13] 3.10909091 2.95151515 2.79393939 2.63636364 2.47878788 2.32121212 [19] 2.16363636 2.00606061 1.84848485 1.69090909 1.53333333 1.37575758 [25] 1.21818182 1.06060606 0.90303030 0.74545455 0.58787879 0.43030303 [31] 0.27272727 0.11515152 -0.04242424 -0.20000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -0.2, length.out=5) [1] 5.0 3.7 2.4 1.1 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, length.out=-1.1) Error in seq.default(5, -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, length.out=-2.999999999) Error in seq.default(5, -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, length.out=-33.3) Error in seq.default(5, -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, length.out=-5) Error in seq.default(5, -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, length.out=1.1) [1] 5.0 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, length.out=2.999999999) [1] 5.00 1.95 -1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, length.out=33.3) [1] 5.000000000 4.815151515 4.630303030 4.445454545 4.260606061 [6] 4.075757576 3.890909091 3.706060606 3.521212121 3.336363636 [11] 3.151515152 2.966666667 2.781818182 2.596969697 2.412121212 [16] 2.227272727 2.042424242 1.857575758 1.672727273 1.487878788 [21] 1.303030303 1.118181818 0.933333333 0.748484848 0.563636364 [26] 0.378787879 0.193939394 0.009090909 -0.175757576 -0.360606061 [31] -0.545454545 -0.730303030 -0.915151515 -1.100000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -1.1, length.out=5) [1] 5.000 3.475 1.950 0.425 -1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, length.out=-1.1) Error in seq.default(5, -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, length.out=-2.999999999) Error in seq.default(5, -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, length.out=-33.3) Error in seq.default(5, -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, length.out=-5) Error in seq.default(5, -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, length.out=1.1) [1] 5 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, length.out=2.999999999) [1] 5 1 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, length.out=33.3) [1] 5.00000000 4.75757576 4.51515152 4.27272727 4.03030303 3.78787879 [7] 3.54545455 3.30303030 3.06060606 2.81818182 2.57575758 2.33333333 [13] 2.09090909 1.84848485 1.60606061 1.36363636 1.12121212 0.87878788 [19] 0.63636364 0.39393939 0.15151515 -0.09090909 -0.33333333 -0.57575758 [25] -0.81818182 -1.06060606 -1.30303030 -1.54545454 -1.78787879 -2.03030303 [31] -2.27272727 -2.51515151 -2.75757576 -3.00000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -2.999999999, length.out=5) [1] 5 3 1 -1 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, length.out=-1.1) Error in seq.default(5, -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, length.out=-2.999999999) Error in seq.default(5, -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, length.out=-33.3) Error in seq.default(5, -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, length.out=-5) Error in seq.default(5, -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, length.out=1.1) [1] 5.0 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, length.out=2.999999999) [1] 5.00 -14.15 -33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, length.out=33.3) [1] 5.0000000 3.8393939 2.6787879 1.5181818 0.3575758 -0.8030303 [7] -1.9636364 -3.1242424 -4.2848485 -5.4454545 -6.6060606 -7.7666667 [13] -8.9272727 -10.0878788 -11.2484848 -12.4090909 -13.5696970 -14.7303030 [19] -15.8909091 -17.0515152 -18.2121212 -19.3727273 -20.5333333 -21.6939394 [25] -22.8545455 -24.0151515 -25.1757576 -26.3363636 -27.4969697 -28.6575758 [31] -29.8181818 -30.9787879 -32.1393939 -33.3000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -33.3, length.out=5) [1] 5.000 -4.575 -14.150 -23.725 -33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -5, length.out=-1.1) Error in seq.default(5, -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -5, length.out=-2.999999999) Error in seq.default(5, -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -5, length.out=-33.3) Error in seq.default(5, -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -5, length.out=-5) Error in seq.default(5, -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -5, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -5, length.out=1.1) [1] 5 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -5, length.out=2.999999999) [1] 5 0 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -5, length.out=33.3) [1] 5.0000000 4.6969697 4.3939394 4.0909091 3.7878788 3.4848485 [7] 3.1818182 2.8787879 2.5757576 2.2727273 1.9696970 1.6666667 [13] 1.3636364 1.0606061 0.7575758 0.4545455 0.1515152 -0.1515152 [19] -0.4545455 -0.7575758 -1.0606061 -1.3636364 -1.6666667 -1.9696970 [25] -2.2727273 -2.5757576 -2.8787879 -3.1818182 -3.4848485 -3.7878788 [31] -4.0909091 -4.3939394 -4.6969697 -5.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, -5, length.out=5) [1] 5.0 2.5 0.0 -2.5 -5.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, length.out=-1.1) Error in seq.default(5, 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, length.out=-2.999999999) Error in seq.default(5, 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, length.out=-33.3) Error in seq.default(5, 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, length.out=-5) Error in seq.default(5, 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, length.out=1.1) [1] 5.0 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, length.out=2.999999999) [1] 5.0 2.6 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, length.out=33.3) [1] 5.0000000 4.8545455 4.7090909 4.5636364 4.4181818 4.2727273 4.1272727 [8] 3.9818182 3.8363636 3.6909091 3.5454545 3.4000000 3.2545455 3.1090909 [15] 2.9636364 2.8181818 2.6727273 2.5272727 2.3818182 2.2363636 2.0909091 [22] 1.9454545 1.8000000 1.6545455 1.5090909 1.3636364 1.2181818 1.0727273 [29] 0.9272727 0.7818182 0.6363636 0.4909091 0.3454545 0.2000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 0.2, length.out=5) [1] 5.0 3.8 2.6 1.4 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, length.out=-1.1) Error in seq.default(5, 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, length.out=-2.999999999) Error in seq.default(5, 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, length.out=-33.3) Error in seq.default(5, 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, length.out=-5) Error in seq.default(5, 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, length.out=1.1) [1] 5.0 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, length.out=2.999999999) [1] 5.00 3.05 1.10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, length.out=33.3) [1] 5.000000 4.881818 4.763636 4.645455 4.527273 4.409091 4.290909 4.172727 [9] 4.054545 3.936364 3.818182 3.700000 3.581818 3.463636 3.345455 3.227273 [17] 3.109091 2.990909 2.872727 2.754545 2.636364 2.518182 2.400000 2.281818 [25] 2.163636 2.045455 1.927273 1.809091 1.690909 1.572727 1.454545 1.336364 [33] 1.218182 1.100000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 1.1, length.out=5) [1] 5.000 4.025 3.050 2.075 1.100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, length.out=-1.1) Error in seq.default(5, 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, length.out=-2.999999999) Error in seq.default(5, 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, length.out=-33.3) Error in seq.default(5, 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, length.out=-5) Error in seq.default(5, 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, length.out=1.1) [1] 5 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, length.out=2.999999999) [1] 5 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, length.out=33.3) [1] 5.000000 4.939394 4.878788 4.818182 4.757576 4.696970 4.636364 4.575758 [9] 4.515152 4.454545 4.393939 4.333333 4.272727 4.212121 4.151515 4.090909 [17] 4.030303 3.969697 3.909091 3.848485 3.787879 3.727273 3.666667 3.606061 [25] 3.545455 3.484848 3.424242 3.363636 3.303030 3.242424 3.181818 3.121212 [33] 3.060606 3.000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 2.999999999, length.out=5) [1] 5.0 4.5 4.0 3.5 3.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, length.out=-1.1) Error in seq.default(5, 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, length.out=-2.999999999) Error in seq.default(5, 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, length.out=-33.3) Error in seq.default(5, 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, length.out=-5) Error in seq.default(5, 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, length.out=1.1) [1] 5.0 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, length.out=2.999999999) [1] 5.00 19.15 33.30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, length.out=33.3) [1] 5.000000 5.857576 6.715152 7.572727 8.430303 9.287879 10.145455 [8] 11.003030 11.860606 12.718182 13.575758 14.433333 15.290909 16.148485 [15] 17.006061 17.863636 18.721212 19.578788 20.436364 21.293939 22.151515 [22] 23.009091 23.866667 24.724242 25.581818 26.439394 27.296970 28.154545 [29] 29.012121 29.869697 30.727273 31.584848 32.442424 33.300000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 33.3, length.out=5) [1] 5.000 12.075 19.150 26.225 33.300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 5, length.out=-1.1) Error in seq.default(5, 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 5, length.out=-2.999999999) Error in seq.default(5, 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 5, length.out=-33.3) Error in seq.default(5, 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 5, length.out=-5) Error in seq.default(5, 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 5, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 5, length.out=1.1) [1] 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 5, length.out=2.999999999) [1] 5 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 5, length.out=33.3) [1] 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, 5, length.out=5) [1] 5 5 5 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, length.out=-1.1) Error in seq.default(5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, length.out=-2.999999999) Error in seq.default(5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, length.out=-33.3) Error in seq.default(5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, length.out=-5) Error in seq.default(5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, length.out=1.1) [1] 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, length.out=2.999999999) [1] 5 6 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, length.out=33.3) [1] 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 [26] 30 31 32 33 34 35 36 37 38 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(5, length.out=5) [1] 5 6 7 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-0.2, length.out=-1.1) Error in seq.default(to = -0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-0.2, length.out=-2.999999999) Error in seq.default(to = -0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-0.2, length.out=-33.3) Error in seq.default(to = -0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-0.2, length.out=-5) Error in seq.default(to = -0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-0.2, length.out=0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-0.2, length.out=1.1) [1] -1.2 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-0.2, length.out=2.999999999) [1] -2.2 -1.2 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-0.2, length.out=33.3) [1] -33.2 -32.2 -31.2 -30.2 -29.2 -28.2 -27.2 -26.2 -25.2 -24.2 -23.2 -22.2 [13] -21.2 -20.2 -19.2 -18.2 -17.2 -16.2 -15.2 -14.2 -13.2 -12.2 -11.2 -10.2 [25] -9.2 -8.2 -7.2 -6.2 -5.2 -4.2 -3.2 -2.2 -1.2 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-0.2, length.out=5) [1] -4.2 -3.2 -2.2 -1.2 -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1.1, length.out=-1.1) Error in seq.default(to = -1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1.1, length.out=-2.999999999) Error in seq.default(to = -1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1.1, length.out=-33.3) Error in seq.default(to = -1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1.1, length.out=-5) Error in seq.default(to = -1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1.1, length.out=0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1.1, length.out=1.1) [1] -2.1 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1.1, length.out=2.999999999) [1] -3.1 -2.1 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1.1, length.out=33.3) [1] -34.1 -33.1 -32.1 -31.1 -30.1 -29.1 -28.1 -27.1 -26.1 -25.1 -24.1 -23.1 [13] -22.1 -21.1 -20.1 -19.1 -18.1 -17.1 -16.1 -15.1 -14.1 -13.1 -12.1 -11.1 [25] -10.1 -9.1 -8.1 -7.1 -6.1 -5.1 -4.1 -3.1 -2.1 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1.1, length.out=5) [1] -5.1 -4.1 -3.1 -2.1 -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1L, length.out=-1L) Error in seq.default(to = -1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1L, length.out=-30L) Error in seq.default(to = -1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1L, length.out=1L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-1L, length.out=30L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-2.999999999, length.out=-1.1) Error in seq.default(to = -2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-2.999999999, length.out=-2.999999999) Error in seq.default(to = -2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-2.999999999, length.out=-33.3) Error in seq.default(to = -2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-2.999999999, length.out=-5) Error in seq.default(to = -2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-2.999999999, length.out=0.2) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-2.999999999, length.out=1.1) [1] -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-2.999999999, length.out=2.999999999) [1] -5 -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-2.999999999, length.out=33.3) [1] -36 -35 -34 -33 -32 -31 -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 [20] -17 -16 -15 -14 -13 -12 -11 -10 -9 -8 -7 -6 -5 -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-2.999999999, length.out=5) [1] -7 -6 -5 -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-30L, length.out=-1L) Error in seq.default(to = -30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-30L, length.out=-30L) Error in seq.default(to = -30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-30L, length.out=1L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-30L, length.out=30L) [1] -59 -58 -57 -56 -55 -54 -53 -52 -51 -50 -49 -48 -47 -46 -45 -44 -43 -42 -41 [20] -40 -39 -38 -37 -36 -35 -34 -33 -32 -31 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-33.3, length.out=-1.1) Error in seq.default(to = -33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-33.3, length.out=-2.999999999) Error in seq.default(to = -33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-33.3, length.out=-33.3) Error in seq.default(to = -33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-33.3, length.out=-5) Error in seq.default(to = -33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-33.3, length.out=0.2) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-33.3, length.out=1.1) [1] -34.3 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-33.3, length.out=2.999999999) [1] -35.3 -34.3 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-33.3, length.out=33.3) [1] -66.3 -65.3 -64.3 -63.3 -62.3 -61.3 -60.3 -59.3 -58.3 -57.3 -56.3 -55.3 [13] -54.3 -53.3 -52.3 -51.3 -50.3 -49.3 -48.3 -47.3 -46.3 -45.3 -44.3 -43.3 [25] -42.3 -41.3 -40.3 -39.3 -38.3 -37.3 -36.3 -35.3 -34.3 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-33.3, length.out=5) [1] -37.3 -36.3 -35.3 -34.3 -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-5, length.out=-1.1) Error in seq.default(to = -5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-5, length.out=-2.999999999) Error in seq.default(to = -5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-5, length.out=-33.3) Error in seq.default(to = -5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-5, length.out=-5) Error in seq.default(to = -5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-5, length.out=0.2) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-5, length.out=1.1) [1] -6 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-5, length.out=2.999999999) [1] -7 -6 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-5, length.out=33.3) [1] -38 -37 -36 -35 -34 -33 -32 -31 -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 [20] -19 -18 -17 -16 -15 -14 -13 -12 -11 -10 -9 -8 -7 -6 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=-5, length.out=5) [1] -9 -8 -7 -6 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0.2, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0.2, length.out=-1.1) Error in seq.default(to = 0.2, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0.2, length.out=-2.999999999) Error in seq.default(to = 0.2, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0.2, length.out=-33.3) Error in seq.default(to = 0.2, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0.2, length.out=-5) Error in seq.default(to = 0.2, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0.2, length.out=0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0.2, length.out=1.1) [1] -0.8 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0.2, length.out=2.999999999) [1] -1.8 -0.8 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0.2, length.out=33.3) [1] -32.8 -31.8 -30.8 -29.8 -28.8 -27.8 -26.8 -25.8 -24.8 -23.8 -22.8 -21.8 [13] -20.8 -19.8 -18.8 -17.8 -16.8 -15.8 -14.8 -13.8 -12.8 -11.8 -10.8 -9.8 [25] -8.8 -7.8 -6.8 -5.8 -4.8 -3.8 -2.8 -1.8 -0.8 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0.2, length.out=5) [1] -3.8 -2.8 -1.8 -0.8 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0L, length.out=-1L) Error in seq.default(to = 0L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0L, length.out=-30L) Error in seq.default(to = 0L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0L, length.out=1L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=0L, length.out=30L) [1] -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 -11 [20] -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1.1, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1.1, length.out=-1.1) Error in seq.default(to = 1.1, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1.1, length.out=-2.999999999) Error in seq.default(to = 1.1, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1.1, length.out=-33.3) Error in seq.default(to = 1.1, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1.1, length.out=-5) Error in seq.default(to = 1.1, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1.1, length.out=0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1.1, length.out=1.1) [1] 0.1 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1.1, length.out=2.999999999) [1] -0.9 0.1 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1.1, length.out=33.3) [1] -31.9 -30.9 -29.9 -28.9 -27.9 -26.9 -25.9 -24.9 -23.9 -22.9 -21.9 -20.9 [13] -19.9 -18.9 -17.9 -16.9 -15.9 -14.9 -13.9 -12.9 -11.9 -10.9 -9.9 -8.9 [25] -7.9 -6.9 -5.9 -4.9 -3.9 -2.9 -1.9 -0.9 0.1 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1.1, length.out=5) [1] -2.9 -1.9 -0.9 0.1 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1L, length.out=-1L) Error in seq.default(to = 1L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1L, length.out=-30L) Error in seq.default(to = 1L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1L, length.out=1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=1L, length.out=30L) [1] -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 -11 -10 [20] -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=2.999999999, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=2.999999999, length.out=-1.1) Error in seq.default(to = 2.999999999, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=2.999999999, length.out=-2.999999999) Error in seq.default(to = 2.999999999, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=2.999999999, length.out=-33.3) Error in seq.default(to = 2.999999999, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=2.999999999, length.out=-5) Error in seq.default(to = 2.999999999, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=2.999999999, length.out=0.2) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=2.999999999, length.out=1.1) [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=2.999999999, length.out=2.999999999) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=2.999999999, length.out=33.3) [1] -3.0e+01 -2.9e+01 -2.8e+01 -2.7e+01 -2.6e+01 -2.5e+01 -2.4e+01 -2.3e+01 [9] -2.2e+01 -2.1e+01 -2.0e+01 -1.9e+01 -1.8e+01 -1.7e+01 -1.6e+01 -1.5e+01 [17] -1.4e+01 -1.3e+01 -1.2e+01 -1.1e+01 -1.0e+01 -9.0e+00 -8.0e+00 -7.0e+00 [25] -6.0e+00 -5.0e+00 -4.0e+00 -3.0e+00 -2.0e+00 -1.0e+00 -1.0e-09 1.0e+00 [33] 2.0e+00 3.0e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=2.999999999, length.out=5) [1] -1e+00 -1e-09 1e+00 2e+00 3e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=30L, length.out=-1L) Error in seq.default(to = 30L, length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=30L, length.out=-30L) Error in seq.default(to = 30L, length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=30L, length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=30L, length.out=1L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=30L, length.out=30L) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=33.3, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=33.3, length.out=-1.1) Error in seq.default(to = 33.3, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=33.3, length.out=-2.999999999) Error in seq.default(to = 33.3, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=33.3, length.out=-33.3) Error in seq.default(to = 33.3, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=33.3, length.out=-5) Error in seq.default(to = 33.3, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=33.3, length.out=0.2) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=33.3, length.out=1.1) [1] 32.3 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=33.3, length.out=2.999999999) [1] 31.3 32.3 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=33.3, length.out=33.3) [1] 0.3 1.3 2.3 3.3 4.3 5.3 6.3 7.3 8.3 9.3 10.3 11.3 12.3 13.3 14.3 [16] 15.3 16.3 17.3 18.3 19.3 20.3 21.3 22.3 23.3 24.3 25.3 26.3 27.3 28.3 29.3 [31] 30.3 31.3 32.3 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=33.3, length.out=5) [1] 29.3 30.3 31.3 32.3 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=5, length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=5, length.out=-1.1) Error in seq.default(to = 5, length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=5, length.out=-2.999999999) Error in seq.default(to = 5, length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=5, length.out=-33.3) Error in seq.default(to = 5, length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=5, length.out=-5) Error in seq.default(to = 5, length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=5, length.out=0.2) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=5, length.out=1.1) [1] 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=5, length.out=2.999999999) [1] 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=5, length.out=33.3) [1] -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 -11 -10 [20] -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToLengthOutNumeric#Output.IgnoreErrorMessage# #seq(to=5, length.out=5) [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq("2", "3") [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, -0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, -1.1) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, -1L) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, -2.999999999) [1] -0.2 -1.2 -2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, -30L) [1] -0.2 -1.2 -2.2 -3.2 -4.2 -5.2 -6.2 -7.2 -8.2 -9.2 -10.2 -11.2 [13] -12.2 -13.2 -14.2 -15.2 -16.2 -17.2 -18.2 -19.2 -20.2 -21.2 -22.2 -23.2 [25] -24.2 -25.2 -26.2 -27.2 -28.2 -29.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, -33.3) [1] -0.2 -1.2 -2.2 -3.2 -4.2 -5.2 -6.2 -7.2 -8.2 -9.2 -10.2 -11.2 [13] -12.2 -13.2 -14.2 -15.2 -16.2 -17.2 -18.2 -19.2 -20.2 -21.2 -22.2 -23.2 [25] -24.2 -25.2 -26.2 -27.2 -28.2 -29.2 -30.2 -31.2 -32.2 -33.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, -5) [1] -0.2 -1.2 -2.2 -3.2 -4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, 0.2) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, 0L) [1] -0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, 1.1) [1] -0.2 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, 1L) [1] -0.2 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, 2.999999999) [1] -0.2 0.8 1.8 2.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, 30L) [1] -0.2 0.8 1.8 2.8 3.8 4.8 5.8 6.8 7.8 8.8 9.8 10.8 11.8 12.8 13.8 [16] 14.8 15.8 16.8 17.8 18.8 19.8 20.8 21.8 22.8 23.8 24.8 25.8 26.8 27.8 28.8 [31] 29.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, 33.3) [1] -0.2 0.8 1.8 2.8 3.8 4.8 5.8 6.8 7.8 8.8 9.8 10.8 11.8 12.8 13.8 [16] 14.8 15.8 16.8 17.8 18.8 19.8 20.8 21.8 22.8 23.8 24.8 25.8 26.8 27.8 28.8 [31] 29.8 30.8 31.8 32.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-0.2, 5) [1] -0.2 0.8 1.8 2.8 3.8 4.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, -0.2) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, -1.1) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, -1L) [1] -1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, -2.999999999) [1] -1.1 -2.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, -30L) [1] -1.1 -2.1 -3.1 -4.1 -5.1 -6.1 -7.1 -8.1 -9.1 -10.1 -11.1 -12.1 [13] -13.1 -14.1 -15.1 -16.1 -17.1 -18.1 -19.1 -20.1 -21.1 -22.1 -23.1 -24.1 [25] -25.1 -26.1 -27.1 -28.1 -29.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, -33.3) [1] -1.1 -2.1 -3.1 -4.1 -5.1 -6.1 -7.1 -8.1 -9.1 -10.1 -11.1 -12.1 [13] -13.1 -14.1 -15.1 -16.1 -17.1 -18.1 -19.1 -20.1 -21.1 -22.1 -23.1 -24.1 [25] -25.1 -26.1 -27.1 -28.1 -29.1 -30.1 -31.1 -32.1 -33.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, -5) [1] -1.1 -2.1 -3.1 -4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, 0.2) [1] -1.1 -0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, 0L) [1] -1.1 -0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, 1.1) [1] -1.1 -0.1 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, 1L) [1] -1.1 -0.1 0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, 2.999999999) [1] -1.1 -0.1 0.9 1.9 2.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, 30L) [1] -1.1 -0.1 0.9 1.9 2.9 3.9 4.9 5.9 6.9 7.9 8.9 9.9 10.9 11.9 12.9 [16] 13.9 14.9 15.9 16.9 17.9 18.9 19.9 20.9 21.9 22.9 23.9 24.9 25.9 26.9 27.9 [31] 28.9 29.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, 33.3) [1] -1.1 -0.1 0.9 1.9 2.9 3.9 4.9 5.9 6.9 7.9 8.9 9.9 10.9 11.9 12.9 [16] 13.9 14.9 15.9 16.9 17.9 18.9 19.9 20.9 21.9 22.9 23.9 24.9 25.9 26.9 27.9 [31] 28.9 29.9 30.9 31.9 32.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1.1, 5) [1] -1.1 -0.1 0.9 1.9 2.9 3.9 4.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, -0.2) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, -1.1) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, -1L) [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, -2.999999999) [1] -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, -30L) [1] -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 [20] -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, -33.3) [1] -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 [20] -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, -5) [1] -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, 0.2) [1] -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, 0L) [1] -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, 1.1) [1] -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, 1L) [1] -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, 2.999999999) [1] -1 0 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, 30L) [1] -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 [26] 24 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, 33.3) [1] -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 [26] 24 25 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-1L, 5) [1] -1 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, -0.2) [1] -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, -1.1) [1] -3 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, -1L) [1] -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, -2.999999999) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, -30L) [1] -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 [20] -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, -33.3) [1] -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 [20] -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, -5) [1] -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, 0.2) [1] -3e+00 -2e+00 -1e+00 1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, 0L) [1] -3e+00 -2e+00 -1e+00 1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, 1.1) [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, 1L) [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, 2.999999999) [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 2e+00 3e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, 30L) [1] -3.0e+00 -2.0e+00 -1.0e+00 1.0e-09 1.0e+00 2.0e+00 3.0e+00 4.0e+00 [9] 5.0e+00 6.0e+00 7.0e+00 8.0e+00 9.0e+00 1.0e+01 1.1e+01 1.2e+01 [17] 1.3e+01 1.4e+01 1.5e+01 1.6e+01 1.7e+01 1.8e+01 1.9e+01 2.0e+01 [25] 2.1e+01 2.2e+01 2.3e+01 2.4e+01 2.5e+01 2.6e+01 2.7e+01 2.8e+01 [33] 2.9e+01 3.0e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, 33.3) [1] -3.0e+00 -2.0e+00 -1.0e+00 1.0e-09 1.0e+00 2.0e+00 3.0e+00 4.0e+00 [9] 5.0e+00 6.0e+00 7.0e+00 8.0e+00 9.0e+00 1.0e+01 1.1e+01 1.2e+01 [17] 1.3e+01 1.4e+01 1.5e+01 1.6e+01 1.7e+01 1.8e+01 1.9e+01 2.0e+01 [25] 2.1e+01 2.2e+01 2.3e+01 2.4e+01 2.5e+01 2.6e+01 2.7e+01 2.8e+01 [33] 2.9e+01 3.0e+01 3.1e+01 3.2e+01 3.3e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-2.999999999, 5) [1] -3e+00 -2e+00 -1e+00 1e-09 1e+00 2e+00 3e+00 4e+00 5e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, -0.2) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, -1.1) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, -1L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, -2.999999999) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, -30L) [1] -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, -33.3) [1] -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, -5) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, 0.2) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, 0L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, 1.1) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, 1L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, 2.999999999) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, 30L) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 [39] 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 [58] 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, 33.3) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 [39] 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 [58] 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-30L, 5) [1] -30 -29 -28 -27 -26 -25 -24 -23 -22 -21 -20 -19 -18 -17 -16 -15 -14 -13 -12 [20] -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, -0.2) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, -1.1) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, -1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, -2.999999999) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, -30L) [1] -33.3 -32.3 -31.3 -30.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, -33.3) [1] -33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, -5) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, 0.2) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, 0L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, 1.1) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, 1L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, 2.999999999) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, 30L) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 3.7 4.7 5.7 6.7 7.7 8.7 9.7 10.7 11.7 12.7 13.7 [49] 14.7 15.7 16.7 17.7 18.7 19.7 20.7 21.7 22.7 23.7 24.7 25.7 [61] 26.7 27.7 28.7 29.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, 33.3) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 3.7 4.7 5.7 6.7 7.7 8.7 9.7 10.7 11.7 12.7 13.7 [49] 14.7 15.7 16.7 17.7 18.7 19.7 20.7 21.7 22.7 23.7 24.7 25.7 [61] 26.7 27.7 28.7 29.7 30.7 31.7 32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-33.3, 5) [1] -33.3 -32.3 -31.3 -30.3 -29.3 -28.3 -27.3 -26.3 -25.3 -24.3 -23.3 -22.3 [13] -21.3 -20.3 -19.3 -18.3 -17.3 -16.3 -15.3 -14.3 -13.3 -12.3 -11.3 -10.3 [25] -9.3 -8.3 -7.3 -6.3 -5.3 -4.3 -3.3 -2.3 -1.3 -0.3 0.7 1.7 [37] 2.7 3.7 4.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, -0.2) [1] -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, -1.1) [1] -5 -4 -3 -2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, -1L) [1] -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, -2.999999999) [1] -5 -4 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, -30L) [1] -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 [20] -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, -33.3) [1] -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 [20] -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, -5) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, 0.2) [1] -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, 0L) [1] -5 -4 -3 -2 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, 1.1) [1] -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, 1L) [1] -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, 2.999999999) [1] -5 -4 -3 -2 -1 0 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, 30L) [1] -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 [26] 20 21 22 23 24 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, 33.3) [1] -5 -4 -3 -2 -1 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 [26] 20 21 22 23 24 25 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(-5, 5) [1] -5 -4 -3 -2 -1 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, -0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, -1.1) [1] 0.2 -0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, -1L) [1] 0.2 -0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, -2.999999999) [1] 0.2 -0.8 -1.8 -2.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, -30L) [1] 0.2 -0.8 -1.8 -2.8 -3.8 -4.8 -5.8 -6.8 -7.8 -8.8 -9.8 -10.8 [13] -11.8 -12.8 -13.8 -14.8 -15.8 -16.8 -17.8 -18.8 -19.8 -20.8 -21.8 -22.8 [25] -23.8 -24.8 -25.8 -26.8 -27.8 -28.8 -29.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, -33.3) [1] 0.2 -0.8 -1.8 -2.8 -3.8 -4.8 -5.8 -6.8 -7.8 -8.8 -9.8 -10.8 [13] -11.8 -12.8 -13.8 -14.8 -15.8 -16.8 -17.8 -18.8 -19.8 -20.8 -21.8 -22.8 [25] -23.8 -24.8 -25.8 -26.8 -27.8 -28.8 -29.8 -30.8 -31.8 -32.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, -5) [1] 0.2 -0.8 -1.8 -2.8 -3.8 -4.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, 0.2) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, 0L) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, 1.1) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, 1L) [1] 0.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, 2.999999999) [1] 0.2 1.2 2.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, 30L) [1] 0.2 1.2 2.2 3.2 4.2 5.2 6.2 7.2 8.2 9.2 10.2 11.2 12.2 13.2 14.2 [16] 15.2 16.2 17.2 18.2 19.2 20.2 21.2 22.2 23.2 24.2 25.2 26.2 27.2 28.2 29.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, 33.3) [1] 0.2 1.2 2.2 3.2 4.2 5.2 6.2 7.2 8.2 9.2 10.2 11.2 12.2 13.2 14.2 [16] 15.2 16.2 17.2 18.2 19.2 20.2 21.2 22.2 23.2 24.2 25.2 26.2 27.2 28.2 29.2 [31] 30.2 31.2 32.2 33.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0.2, 5) [1] 0.2 1.2 2.2 3.2 4.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, -0.2) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, -1.1) [1] 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, -1L) [1] 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, -2.999999999) [1] 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, -30L) [1] 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 [20] -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, -33.3) [1] 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 [20] -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, -5) [1] 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, 0.2) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, 0L) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, 1.1) [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, 1L) [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, 2.999999999) [1] 0 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, 30L) [1] 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 [26] 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, 33.3) [1] 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 [26] 25 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(0L, 5) [1] 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, -0.2) [1] 1.1 0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, -1.1) [1] 1.1 0.1 -0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, -1L) [1] 1.1 0.1 -0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, -2.999999999) [1] 1.1 0.1 -0.9 -1.9 -2.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, -30L) [1] 1.1 0.1 -0.9 -1.9 -2.9 -3.9 -4.9 -5.9 -6.9 -7.9 -8.9 -9.9 [13] -10.9 -11.9 -12.9 -13.9 -14.9 -15.9 -16.9 -17.9 -18.9 -19.9 -20.9 -21.9 [25] -22.9 -23.9 -24.9 -25.9 -26.9 -27.9 -28.9 -29.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, -33.3) [1] 1.1 0.1 -0.9 -1.9 -2.9 -3.9 -4.9 -5.9 -6.9 -7.9 -8.9 -9.9 [13] -10.9 -11.9 -12.9 -13.9 -14.9 -15.9 -16.9 -17.9 -18.9 -19.9 -20.9 -21.9 [25] -22.9 -23.9 -24.9 -25.9 -26.9 -27.9 -28.9 -29.9 -30.9 -31.9 -32.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, -5) [1] 1.1 0.1 -0.9 -1.9 -2.9 -3.9 -4.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, 0.2) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, 0L) [1] 1.1 0.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, 1.1) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, 1L) [1] 1.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, 2.999999999) [1] 1.1 2.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, 30L) [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 11.1 12.1 13.1 14.1 15.1 [16] 16.1 17.1 18.1 19.1 20.1 21.1 22.1 23.1 24.1 25.1 26.1 27.1 28.1 29.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, 33.3) [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 11.1 12.1 13.1 14.1 15.1 [16] 16.1 17.1 18.1 19.1 20.1 21.1 22.1 23.1 24.1 25.1 26.1 27.1 28.1 29.1 30.1 [31] 31.1 32.1 33.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1.1, 5) [1] 1.1 2.1 3.1 4.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, -0.2) [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, -1.1) [1] 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, -1L) [1] 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, -2.999999999) [1] 1 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, -30L) [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 [20] -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, -33.3) [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 [20] -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, -5) [1] 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, 0.2) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, 0L) [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, 1.1) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, 1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, 2.999999999) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, 30L) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, 33.3) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(1L, 5) [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, -0.2) [1] 3e+00 2e+00 1e+00 -1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, -1.1) [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, -1L) [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, -2.999999999) [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 -2e+00 -3e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, -30L) [1] 3.0e+00 2.0e+00 1.0e+00 -1.0e-09 -1.0e+00 -2.0e+00 -3.0e+00 -4.0e+00 [9] -5.0e+00 -6.0e+00 -7.0e+00 -8.0e+00 -9.0e+00 -1.0e+01 -1.1e+01 -1.2e+01 [17] -1.3e+01 -1.4e+01 -1.5e+01 -1.6e+01 -1.7e+01 -1.8e+01 -1.9e+01 -2.0e+01 [25] -2.1e+01 -2.2e+01 -2.3e+01 -2.4e+01 -2.5e+01 -2.6e+01 -2.7e+01 -2.8e+01 [33] -2.9e+01 -3.0e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, -33.3) [1] 3.0e+00 2.0e+00 1.0e+00 -1.0e-09 -1.0e+00 -2.0e+00 -3.0e+00 -4.0e+00 [9] -5.0e+00 -6.0e+00 -7.0e+00 -8.0e+00 -9.0e+00 -1.0e+01 -1.1e+01 -1.2e+01 [17] -1.3e+01 -1.4e+01 -1.5e+01 -1.6e+01 -1.7e+01 -1.8e+01 -1.9e+01 -2.0e+01 [25] -2.1e+01 -2.2e+01 -2.3e+01 -2.4e+01 -2.5e+01 -2.6e+01 -2.7e+01 -2.8e+01 [33] -2.9e+01 -3.0e+01 -3.1e+01 -3.2e+01 -3.3e+01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, -5) [1] 3e+00 2e+00 1e+00 -1e-09 -1e+00 -2e+00 -3e+00 -4e+00 -5e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, 0.2) [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, 0L) [1] 3e+00 2e+00 1e+00 -1e-09 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, 1.1) [1] 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, 1L) [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, 2.999999999) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, 30L) [1] 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 [26] 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, 33.3) [1] 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 [26] 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(2.999999999, 5) [1] 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, -0.2) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, -1.1) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, -1L) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, -2.999999999) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, -30L) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 [20] 11 10 9 8 7 6 5 4 3 2 1 0 -1 -2 -3 -4 -5 -6 -7 [39] -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 [58] -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, -33.3) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 [20] 11 10 9 8 7 6 5 4 3 2 1 0 -1 -2 -3 -4 -5 -6 -7 [39] -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 [58] -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, -5) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, 0.2) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, 0L) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, 1.1) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, 1L) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, 2.999999999) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, 30L) [1] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, 33.3) [1] 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(30L, 5) [1] 30 29 28 27 26 25 24 23 22 21 20 19 18 17 16 15 14 13 12 11 10 9 8 7 6 [26] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, -0.2) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, -1.1) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, -1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, -2.999999999) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 -1.7 -2.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, -30L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 [13] 21.3 20.3 19.3 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 [25] 9.3 8.3 7.3 6.3 5.3 4.3 3.3 2.3 1.3 0.3 -0.7 -1.7 [37] -2.7 -3.7 -4.7 -5.7 -6.7 -7.7 -8.7 -9.7 -10.7 -11.7 -12.7 -13.7 [49] -14.7 -15.7 -16.7 -17.7 -18.7 -19.7 -20.7 -21.7 -22.7 -23.7 -24.7 -25.7 [61] -26.7 -27.7 -28.7 -29.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, -33.3) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 [13] 21.3 20.3 19.3 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 [25] 9.3 8.3 7.3 6.3 5.3 4.3 3.3 2.3 1.3 0.3 -0.7 -1.7 [37] -2.7 -3.7 -4.7 -5.7 -6.7 -7.7 -8.7 -9.7 -10.7 -11.7 -12.7 -13.7 [49] -14.7 -15.7 -16.7 -17.7 -18.7 -19.7 -20.7 -21.7 -22.7 -23.7 -24.7 -25.7 [61] -26.7 -27.7 -28.7 -29.7 -30.7 -31.7 -32.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, -5) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 -0.7 -1.7 -2.7 -3.7 -4.7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, 0.2) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, 0L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 0.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, 1.1) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, 1L) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 2.3 1.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, 2.999999999) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 4.3 [31] 3.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, 30L) [1] 33.3 32.3 31.3 30.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, 33.3) [1] 33.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(33.3, 5) [1] 33.3 32.3 31.3 30.3 29.3 28.3 27.3 26.3 25.3 24.3 23.3 22.3 21.3 20.3 19.3 [16] 18.3 17.3 16.3 15.3 14.3 13.3 12.3 11.3 10.3 9.3 8.3 7.3 6.3 5.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, -0.2) [1] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, -1.1) [1] 5 4 3 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, -1L) [1] 5 4 3 2 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, -2.999999999) [1] 5 4 3 2 1 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, -30L) [1] 5 4 3 2 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 [20] -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, -33.3) [1] 5 4 3 2 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 [20] -14 -15 -16 -17 -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 [39] -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, -5) [1] 5 4 3 2 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, 0.2) [1] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, 0L) [1] 5 4 3 2 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, 1.1) [1] 5 4 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, 1L) [1] 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, 2.999999999) [1] 5 4 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, 30L) [1] 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 [26] 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, 33.3) [1] 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 [26] 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq(5, 5) [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testFromToNumeric# #seq.int("2", "3") [1] 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=-0.2) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=-1.1) Error in seq.default(length.out = -1.1) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=-1L) Error in seq.default(length.out = -1L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=-2.999999999) Error in seq.default(length.out = -2.999999999) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=-30L) Error in seq.default(length.out = -30L) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=-33.3) Error in seq.default(length.out = -33.3) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=-5) Error in seq.default(length.out = -5) : 'length.out' must be a non-negative number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=0.2) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=0L) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=1.1) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=2.999999999) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=30L) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=33.3) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 34 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testLengthOutOnly#Output.IgnoreErrorMessage# #seq(length.out=5) [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testNoArgs# #seq() [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq("abc") [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(1+1i) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(F) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(T) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(as.raw(40L)) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(character()) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(complex()) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(expression()) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(function() {}) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(list()) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(list(2)) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(logical()) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(pairlist()) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNotNumericFrom# #seq(raw()) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(-0.2) [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(-1.1) [1] 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(-1L) [1] 1 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(-2.999999999) [1] 1 0 -1 -2 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(-30L) [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 [20] -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(-33.3) [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 -11 -12 -13 -14 -15 -16 -17 [20] -18 -19 -20 -21 -22 -23 -24 -25 -26 -27 -28 -29 -30 -31 -32 -33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(-5) [1] 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(0.2) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(0L) [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(1.1) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(1L) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(2.999999999) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(30L) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(33.3) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(5) [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(double()) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testOneNumericFrom# #seq(integer()) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSeqArgMatching# #{ foo <- function(beg, end, by, len) seq(beg, end, by, length.out = len); foo(beg=1, by=1, len=10) } [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSeqDispatch# #{ d <- as.Date(1, origin = "1970-01-01"); seq(d, by=1, length.out=4) } [1] "1970-01-02" "1970-01-03" "1970-01-04" "1970-01-05" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSeqDispatch# #{ d <- as.Date(1, origin = "1970-01-01"); seq.int(d, by=1, length.out=4) } [1] "1970-01-02" "1970-01-03" "1970-01-04" "1970-01-05" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(0,0) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(0,0,0) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(0,0,1i) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(0L,0L) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(0L,0L,0L) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(1,-4,-2) } [1] 1 -1 -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(10L,1L) } [1] 10 9 8 7 6 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(1L,10L) } [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(1L,4L,2L) } [1] 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement#Output.MayIgnoreErrorContext# #{ seq(7, c(41,42)) } Error in seq.default(7, c(41, 42)) : 'to' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement#Output.IgnoreErrorContext# #{ seq(7, integer()) } Error in seq.default(7, integer()) : 'to' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement#Output.MayIgnoreErrorContext# #{ seq(c(1,2), 7) } Error in seq.default(c(1, 2), 7) : 'from' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(double()) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(from=3L, length.out=3L) } [1] 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(integer()) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement#Output.IgnoreErrorContext# #{ seq(integer(), 7) } Error in seq.default(integer(), 7) : 'from' must be of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(to=10L, by=1) } [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ seq(to=10L, by=1.1) } [1] 1.0 2.1 3.2 4.3 5.4 6.5 7.6 8.7 9.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1, 3)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1, 3L)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1, 3L, by=2)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1, 3L, by=2L)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1, 3L, length.out=5)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1, 3L, length.out=5L)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1, along.with=double())) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1, length.out=0)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1, length.out=0L)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, 3)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, 3, by=2)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, 3, by=2L)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, 3, length.out=5)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, 3, length.out=5L)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, 3L)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, 3L, by=2)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, 3L, by=2L)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, 3L, length.out=2)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, 3L, length.out=2L)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(1L, along.with=double())) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(FALSE, TRUE)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(TRUE, FALSE, length.out=5)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(TRUE, FALSE, length.out=5L)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(along.with=c(1,2))) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(to=3L, by=5)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(to=3L, by=5L)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(to=3L, length.out=2)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatement# #{ typeof(seq(to=3L, length.out=2L)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ round(seq(from=10.5, to=15.4, length.out=4), digits=5) } [1] 10.50000 12.13333 13.76667 15.40000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ round(seq(from=3L,to=-2L,by=-4.2), digits=5) } [1] 3.0 -1.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(along.with=-3:-5) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(along.with=10) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(along.with=1:10) } [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(along.with=NA) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(along=c(10,11,12)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(from=-10,to=-5,by=2) } [1] -10 -8 -6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(from=-10.4,to=-5.8,by=2.1) } [1] -10.4 -8.3 -6.2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(from=1,to=3) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(from=1,to=3,by=1) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(from=1.4) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(from=1.7) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(from=10:12) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(from=11, to=12, length.out=2) } [1] 11 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(from=TRUE, to=TRUE, length.out=0) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(from=c(TRUE, FALSE)) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(length.out=0) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(length.out=1) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(length.out=13.4) } [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testSequenceStatementNamedParams# #{ seq(to=-1,from=-10) } [1] -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testseq29# #argv <- structure(list(0, 38431.66015625, by = 1000), .Names = c('', '', 'by'));do.call('seq', argv) [1] 0 1000 2000 3000 4000 5000 6000 7000 8000 9000 10000 11000 [13] 12000 13000 14000 15000 16000 17000 18000 19000 20000 21000 22000 23000 [25] 24000 25000 26000 27000 28000 29000 30000 31000 32000 33000 34000 35000 [37] 36000 37000 38000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq.testseq30# #argv <- structure(list(18000, 28000, length = 50L), .Names = c('', '', 'length'));do.call('seq', argv) [1] 18000.00 18204.08 18408.16 18612.24 18816.33 19020.41 19224.49 19428.57 [9] 19632.65 19836.73 20040.82 20244.90 20448.98 20653.06 20857.14 21061.22 [17] 21265.31 21469.39 21673.47 21877.55 22081.63 22285.71 22489.80 22693.88 [25] 22897.96 23102.04 23306.12 23510.20 23714.29 23918.37 24122.45 24326.53 [33] 24530.61 24734.69 24938.78 25142.86 25346.94 25551.02 25755.10 25959.18 [41] 26163.27 26367.35 26571.43 26775.51 26979.59 27183.67 27387.76 27591.84 [49] 27795.92 28000.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testWithNonStandardLength# #seq_along() Error in seq_along() : 0 arguments passed to 'seq_along' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testWithNonStandardLength# #{ assign('length.myclass', function(...) 42, envir=.__S3MethodsTable__.); x <- 1; class(x) <- 'myclass'; res <- seq_along(x); rm('length.myclass', envir=.__S3MethodsTable__.); res } [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testWithNonStandardLength# #{ length <- function(x) 42; seq_along(c(1,2,3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testWithNonStandardLength# #{ x <- c(1,2,3); class(x) <- 'myclass'; length.myclass <- function(w) '48'; seq_along(x) } [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testWithNonStandardLength# #{ x <- c(1,2,3); class(x) <- 'myclass'; length.myclass <- function(w) 42; seq_along(x) } [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testWithNonStandardLength# #{ x <- c(1,2,3); class(x) <- 'myclass'; length.myclass <- function(w) c(100, 200); seq_along(x) } [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 [19] 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 [37] 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 [55] 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 [73] 73 74 75 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 [91] 91 92 93 94 95 96 97 98 99 100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq1# #argv <- list(c('y', 'A', 'U', 'V'));do.call('seq_along', argv); [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq10# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, -45, -44, -43, -42, -41, -40, -39, -38, -37, -36, -35, -34, -33, -32, -31, -30, -29, -28, -27, NA, -25, -24, -23, -22, -21, -20, -19, -18, -17, -16, -15, -14, -13, -12, -11, -10, -9, -8, -7, -6, -5, -4, -3, -2, -1, 0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, NA, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52), .Dim = c(98L, 2L), .Dimnames = list(NULL, c('intercept', 'trend'))));do.call('seq_along', argv); [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 [19] 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 [37] 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 [55] 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 [73] 73 74 75 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 [91] 91 92 93 94 95 96 97 98 99 100 101 102 103 104 105 106 107 108 [109] 109 110 111 112 113 114 115 116 117 118 119 120 121 122 123 124 125 126 [127] 127 128 129 130 131 132 133 134 135 136 137 138 139 140 141 142 143 144 [145] 145 146 147 148 149 150 151 152 153 154 155 156 157 158 159 160 161 162 [163] 163 164 165 166 167 168 169 170 171 172 173 174 175 176 177 178 179 180 [181] 181 182 183 184 185 186 187 188 189 190 191 192 193 194 195 196 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq11# #argv <- list(list(structure(c(112, 118, 132, 129, 121, 135, 148, 148, 136, 119, 104, 118, 115, 126, 141, 135, 125, 149, 170, 170, 158, 133, 114, 140, 145, 150, 178, 163, 172, 178, 199, 199, 184, 162, 146, 166, 171, 180, 193, 181, 183, 218, 230, 242, 209, 191, 172, 194, 196, 196, 236, 235, 229, 243, 264, 272, 237, 211, 180, 201, 204, 188, 235, 227, 234, 264, 302, 293, 259, 229, 203, 229, 242, 233, 267, 269, 270, 315, 364, 347, 312, 274, 237, 278, 284, 277, 317, 313, 318, 374, 413, 405, 355, 306, 271, 306, 315, 301, 356, 348, 355, 422, 465, 467, 404, 347, 305, 336, 340, 318, 362, 348, 363, 435, 491, 505, 404, 359, 310, 337, 360, 342, 406, 396, 420, 472, 548, 559, 463, 407, 362, 405, 417, 391, 419, 461, 472, 535, 622, 606, 508, 461, 390, 432), .Tsp = c(1949, 1960.91666666667, 12), class = 'ts'), structure(c(419.147602949539, 391.474665943444, 435.919286153217, 443.935203034261, 455.023399013445, 517.28707821144, 589.71337277669, 582.999919227301, 484.573388713116, 428.878182738437, 368.526582998452, 406.728709993152, 415.660571294428, 388.716535970235, 433.006017658935, 440.885684396326, 451.651900136866, 513.051252429496, 584.327164324967, 577.055407135124, 479.076505013118, 423.494870357491, 363.43932958967, 400.592058645117), .Tsp = c(1961, 1962.91666666667, 12), class = 'ts'), structure(c(484.030717075782, 462.954959541421, 526.353307750503, 546.165638262644, 569.502470928676, 657.838443307596, 761.241730163307, 763.280655335144, 642.989004951864, 576.423799567567, 501.429012064338, 559.981301364233, 591.700754553767, 565.210772316967, 642.377841008703, 666.682421047093, 695.547100430962, 804.065022775202, 931.340589597203, 934.837830059897, 788.422986194072, 707.666678543854, 616.37838266375, 689.250456425465), .Tsp = c(1961, 1962.91666666667, 12), class = 'ts')));do.call('seq_along', argv); [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq12# #argv <- list(c(0.923879532511287+0.38268343236509i, 0.707106781186548+0.707106781186547i, 0.38268343236509+0.923879532511287i, 0+1i, -0.38268343236509+0.923879532511287i, -0.707106781186547+0.707106781186548i, -0.923879532511287+0.38268343236509i, -1+0i, -0.923879532511287-0.38268343236509i, -0.707106781186548-0.707106781186547i, -0.38268343236509-0.923879532511287i, 0-1i, 0.38268343236509-0.923879532511287i, 0.707106781186547-0.707106781186548i, 0.923879532511287-0.38268343236509i, 1-0i));do.call('seq_along', argv); [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq14# #argv <- list(structure(list(g = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L), .Label = c('1', '2', '3', '4'), class = 'factor')), .Names = 'g'));do.call('seq_along', argv); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq15# #argv <- list(structure(list(20), row.names = c(NA, -1L)));do.call('seq_along', argv); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq16# #argv <- list(list(list(c('', '', '\036', '', 'New', 'print()', '(S3)', 'method', 'for', 'class', '\'function\',', '', '', '', '', '', '', '', 'also', 'used', 'for', 'auto-printing.', '', 'Further,', '.Primitive', '', '', '', '', '', '', '', 'functions', 'now', 'print', 'and', 'auto-print', 'identically.', '', 'The', 'new', 'method', '', '', '', '', '', '', '', 'is', 'based', 'on', 'code', 'suggestions', 'by', 'Romain', 'François.'))));do.call('seq_along', argv); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq17# #argv <- list(structure(list(Topic = c('myTst-package', 'foo-class', 'myTst', 'show,foo-method', 'show,foo-method', 'show-methods'), File = c('myTst-package', 'foo-class', 'myTst-package', 'foo-class', 'show-methods', 'show-methods')), .Names = c('Topic', 'File'), row.names = c(3L, 1L, 4L, 2L, 6L, 5L)));do.call('seq_along', argv); [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq18# #argv <- list(structure(list(structure(' A Simple Plot and Legend Demo ', Rd_tag = 'TEXT')), Rd_tag = 'Rd', class = 'Rd'));do.call('seq_along', argv); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq19# #argv <- list(structure(list(Topic = character(0), File = character(0), Title = character(0), Internal = character(0)), .Names = c('Topic', 'File', 'Title', 'Internal'), row.names = integer(0), class = 'data.frame'));do.call('seq_along', argv); [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq2# #argv <- list(structure(c(1, 2, 3, 0, 10, NA), .Dim = c(3L, 2L)));do.call('seq_along', argv); [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq20# #argv <- list(structure(c(2.21843970753346, 1.80732678656753, -1.09399175987006, 0.585986462327552, -5.68458926982395, 1.23352238598674, 0.457950438444482, 2.51599006679516, -2.28780372840319, 5.53596062467695, 2.17890565095959, -1.59611751350773, -2.9672978602151, 0.745175851232308, 1.93388282434376, -3.03559459078455, 2.19500990255906, 0.0725275773318347, -0.75336064096447, -1.15505962102859, -2.84782886882524, -1.41070341448251, -0.540252474026749, 4.87719739781058, 0.890715639552621, -0.968642103099399, 1.73177156113283, -0.993218102309356, -0.656454198323984, -1.5299506933835, -0.298424468882268, 6.51011264717937, 2.68326774833378, 1.99295445531679, -0.214079422583434, 6.73505308264589, -4.54579214489424, -2.3991834444486, -1.71479569181251, -6.47293095421849, -1.67116930820449, -11.5853328029437, -2.48588878138021, -0.888857646918452, 8.06807102468956, -0.216046323028316, 6.24682938323398, -1.74761908105831, 2.53082303181417, 2.31410662801887, 2.97453294161523, -2.88723068649699, -1.04144266580674, -0.835536300630093, -6.10229135345437, -4.37605802846523, -1.94289029309402e-16, 5.96619037131792, -1.1474434665393, 3.78819830631063, -3.01580771910632, -0.656454198323984, 1.50824785799851, -2.06401783962239, -3.02346226775125, 0.407243897855763, -3.96478352340807, -2.12718621336067, -0.78924288871239, -3.03559459078455, 0.457950438444496, -0.797900839851943, -3.38233849466459, 1.97815029009903, 0.745175851232309, -1.09645503136389, 0.341748714147263, 7.32472922782987, -1.33672649241008, 1.51931399477032, 0.00590129163826772, -4.09533092706814, 0.195481697042187, -2.7736762657602, -3.48737543915568, 0.536312040203338, 0.775871729180551, 4.37979177946206, 1.30271070089245, 4.2132287611068, 7.33457656622414, 3.28311350719274, -1.30271070089245), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93')));do.call('seq_along', argv); [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 [51] 51 52 53 54 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 73 74 75 [76] 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 91 92 93 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq21# #argv <- list(structure(list(surname = structure(integer(0), .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(integer(0), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(integer(0), .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = integer(0), class = 'data.frame'));do.call('seq_along', argv); [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq22# #argv <- list(structure(list(A = 0:10, B = 10:20, `NA` = 20:30), .Names = c('A', 'B', NA), row.names = c(NA, -11L), class = 'data.frame'));do.call('seq_along', argv); [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq23# #argv <- list(c(TRUE, TRUE, TRUE));do.call('seq_along', argv); [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq24# #argv <- list(structure(c(3, 8), .Dim = 2L, .Dimnames = structure(list(g = c('1', '2')), .Names = 'g'), call = quote(by.data.frame(data = X, INDICES = g, FUN = colMeans)), class = 'by'));do.call('seq_along', argv); [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq25# #argv <- list(structure(list(.Data = 'numeric'), .Names = '.Data'));do.call('seq_along', argv); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq28# #argv <- list(structure(list(num = 1:4, fac = structure(11:14, .Label = c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm', 'n', 'o'), class = 'factor'), date = structure(c(15065, 15066, 15067, 15068), class = 'Date'), pv = structure(list(1:3, 4:5, 6:7, 8:10), class = c('package_version', 'numeric_version'))), .Names = c('num', 'fac', 'date', 'pv'), row.names = c(NA, -4L), class = 'data.frame'));do.call('seq_along', argv) [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq3# #argv <- list(0L);seq_len(argv[[1]]); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq4# #argv <- list(structure(list(x = 1:3, y = structure(1:3, .Label = c('A', 'D', 'E'), class = 'factor'), z = c(6, 9, 10)), .Names = c('x', 'y', 'z'), row.names = c(NA, -3L), class = 'data.frame'));do.call('seq_along', argv); [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq7# #argv <- list(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE));do.call('seq_along', argv); [1] 1 2 3 4 5 6 7 8 9 10 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq8# #argv <- list(structure(list(levels = c('1', '2', NA), class = 'factor'), .Names = c('levels', 'class')));do.call('seq_along', argv); [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_along.testseq9# #argv <- list(list(c(1+1i, 2+1.4142135623731i, 3+1.73205080756888i, 4+2i, 5+2.23606797749979i, 6+2.44948974278318i, 7+2.64575131106459i, 8+2.82842712474619i, 9+3i, 10+3.1622776601684i)));do.call('seq_along', argv); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testSeqLen#Output.IgnoreWarningContext# #{ seq_len("foo") } Error in seq_len("foo") : argument must be coercible to non-negative integer In addition: Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testSeqLen# #{ seq_len(-1) } Error in seq_len(-1) : argument must be coercible to non-negative integer ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testSeqLen# #{ seq_len(0) + 1.1; } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testSeqLen# #{ seq_len(10) } [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testSeqLen# #{ seq_len(1:2) } [1] 1 Warning message: In seq_len(1:2) : first element used of 'length.out' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testSeqLen# #{ seq_len(5L) } [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testSeqLen# #{ seq_len(NA) } Error in seq_len(NA) : argument must be coercible to non-negative integer ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testSeqLen# #{ seq_len(NULL) } Error in seq_len(NULL) : argument must be coercible to non-negative integer In addition: Warning message: In seq_len(NULL) : first element used of 'length.out' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testSeqLen# #{ seq_len(integer()) } Error in seq_len(integer()) : argument must be coercible to non-negative integer In addition: Warning message: In seq_len(integer()) : first element used of 'length.out' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testseq13# #argv <- list(structure(3.14159265358979, class = structure('3.14159265358979', class = 'testit')));do.call('seq_len', argv); [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testseq26# #argv <- list(structure(2, .Names = 'Ind'));do.call('seq_len', argv); [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testseq27#Output.IgnoreWarningContext# #argv <- list(c(2L, 2L));do.call('seq_len', argv) [1] 1 2 Warning message: In seq_len(c(2L, 2L)) : first element used of 'length.out' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seq_len.testseq5# #argv <- list(FALSE);do.call('seq_len', argv); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint1# #argv <- list(16146, by = 1, length.out = 4);do.call('seq.int', argv); [1] 16146 16147 16148 16149 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint10# #argv <- list(from = 0, to = structure(-1, .Names = 'c0'));do.call('seq.int', argv); [1] 0 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint11# #argv <- list(10L, 99L, 1);do.call('seq.int', argv); [1] 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 [26] 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 55 56 57 58 59 [51] 60 61 62 63 64 65 66 67 68 69 70 71 72 73 74 75 76 77 78 79 80 81 82 83 84 [76] 85 86 87 88 89 90 91 92 93 94 95 96 97 98 99 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint12# #argv <- list(1L);seq.int(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint13# #argv <- list(102L, 112L, 1L);do.call('seq.int', argv); [1] 102 103 104 105 106 107 108 109 110 111 112 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint14# #argv <- list(from = 0.95, by = -0.120360949612403, length.out = 6);do.call('seq.int', argv); [1] 0.9500000 0.8296391 0.7092781 0.5889172 0.4685562 0.3481953 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint15# #argv <- list(list());seq.int(argv[[1]]); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint16# #argv <- list(-0.2, 1, length.out = 7);do.call('seq.int', argv); [1] -2.000000e-01 -2.775558e-17 2.000000e-01 4.000000e-01 6.000000e-01 [6] 8.000000e-01 1.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint17# #argv <- list(from = 0.070740277703696, to = 0.793110173512391, length.out = NULL);do.call('seq.int', argv); [1] 0.07074028 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint18# #argv <- list(105L, 112L, 3L);do.call('seq.int', argv); [1] 105 108 111 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint19# #argv <- list(0, length.out = 3L);do.call('seq.int', argv); [1] 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint2# #argv <- list(0.9, 0.95, length.out = 16);do.call('seq.int', argv); [1] 0.9000000 0.9033333 0.9066667 0.9100000 0.9133333 0.9166667 0.9200000 [8] 0.9233333 0.9266667 0.9300000 0.9333333 0.9366667 0.9400000 0.9433333 [15] 0.9466667 0.9500000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint20# #argv <- list(0, structure(345600, tzone = 'GMT'), 43200);do.call('seq.int', argv); [1] 0 43200 86400 129600 172800 216000 259200 302400 345600 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint21# #argv <- list(-7, 7, length.out = 11);do.call('seq.int', argv); [1] -7.0 -5.6 -4.2 -2.8 -1.4 0.0 1.4 2.8 4.2 5.6 7.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint22# #argv <- list(4, 4L);do.call('seq.int', argv); [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint23# #argv <- list(0L, 49, 1);do.call('seq.int', argv); [1] 0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 [26] 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint24# #argv <- list(1, 1, by = 1);do.call('seq.int', argv); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint26#Output.IgnoreErrorContext# #argv <- list(NaN, NaN);do.call('seq.int', argv) Error in seq.int(NaN, NaN) : 'from' must be a finite number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint27#Output.IgnoreErrorContext# #argv <- structure(list(1.2, 1, by = 1), .Names = c('', '', 'by'));do.call('seq.int', argv) Error in seq.int(1.2, 1, by = 1) : wrong sign in 'by' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint28#Output.IgnoreErrorContext# #argv <- structure(list(to = NaN), .Names = 'to');do.call('seq.int', argv) Error in seq.int(to = NaN) : 'to' must be a finite number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint29#Output.IgnoreErrorContext# #argv <- list(NaN);do.call('seq.int', argv) Error in seq.int(NaN) : 'from' must be a finite number ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint3# #argv <- list(FALSE);seq.int(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint4# #argv <- list(1.2e+100, 1.3e+100, length.out = 2);do.call('seq.int', argv); [1] 1.2e+100 1.3e+100 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint5# #argv <- list(structure(0.88, .Names = 'Other'), structure(1, .Names = 'Vanilla Cream'), length.out = 24);do.call('seq.int', argv); [1] 0.8800000 0.8852174 0.8904348 0.8956522 0.9008696 0.9060870 0.9113043 [8] 0.9165217 0.9217391 0.9269565 0.9321739 0.9373913 0.9426087 0.9478261 [15] 0.9530435 0.9582609 0.9634783 0.9686957 0.9739130 0.9791304 0.9843478 [22] 0.9895652 0.9947826 1.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint6# #argv <- list(953553600, by = 86400, length.out = 10);do.call('seq.int', argv); [1] 953553600 953640000 953726400 953812800 953899200 953985600 954072000 [8] 954158400 954244800 954331200 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint7# #argv <- list(25L);seq.int(argv[[1]]); [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint8# #argv <- list(from = 2.0943951023932, to = 2.61799387799149, by = 0.0174532925199433);do.call('seq.int', argv); [1] 2.094395 2.111848 2.129302 2.146755 2.164208 2.181662 2.199115 2.216568 [9] 2.234021 2.251475 2.268928 2.286381 2.303835 2.321288 2.338741 2.356194 [17] 2.373648 2.391101 2.408554 2.426008 2.443461 2.460914 2.478368 2.495821 [25] 2.513274 2.530727 2.548181 2.565634 2.583087 2.600541 2.617994 ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqint9# #argv <- list(from = 0, to = 0.793110173512391, length.out = FALSE);do.call('seq.int', argv); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seqint.testseqintGenericDispatch# #{ seq.int.cls <- function(x) 42; seq.int(structure(c(1,2), class='cls')); } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testSerializeWithPromises# #{ f <- function(...) serialize(environment()[['...']], NULL, version=2); x <- unserialize(f(a=3,b=2,c=1)); typeof(x) } [1] "..." ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testSerializeWithPromises# #{ f <- function(...) serialize(environment()[['...']], NULL, version=3); x <- unserialize(f(a=3,b=2,c=1)); typeof(x) } [1] "..." ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testSerializeWithPromises# #{ f <- function(...) serialize(mget('...'), NULL, version=2); length(unserialize(f(a=3,b=2,c=1))[[1]]); } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testSerializeWithPromises# #{ f <- function(...) serialize(mget('...'), NULL, version=3); length(unserialize(f(a=3,b=2,c=1))[[1]]); } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize#Ignored.ImplementationError# #options(keep.source=FALSE); fc <- setClass('FooSerial1', representation(a = 'call')); serialize(fc, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 01 07 03 00 00 04 02 00 00 00 [26] 01 00 04 00 09 00 00 00 09 63 6c 61 73 73 4e 61 6d 65 00 00 02 10 00 00 00 [51] 01 00 04 00 09 00 00 00 0a 46 6f 6f 53 65 72 69 61 6c 31 00 00 04 02 00 00 [76] 00 01 00 04 00 09 00 00 00 07 70 61 63 6b 61 67 65 00 00 00 10 00 00 00 01 [101] 00 04 00 09 00 00 00 0a 2e 47 6c 6f 62 61 6c 45 6e 76 00 00 00 fe 00 00 04 [126] 02 00 00 02 ff 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 0a 2e 47 6c 6f [151] 62 61 6c 45 6e 76 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 05 63 6c 61 [176] 73 73 00 00 02 10 00 00 00 01 00 04 00 09 00 00 00 16 63 6c 61 73 73 47 65 [201] 6e 65 72 61 74 6f 72 46 75 6e 63 74 69 6f 6e 00 00 04 02 00 00 02 ff 00 00 [226] 00 10 00 00 00 01 00 04 00 09 00 00 00 07 6d 65 74 68 6f 64 73 00 00 00 fe [251] 00 00 00 fe 00 00 00 fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 03 2e [276] 2e 2e 00 00 00 fb 00 00 00 fe 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 [301] 03 6e 65 77 00 00 00 02 00 00 02 10 00 00 00 01 00 04 00 09 00 00 00 0a 46 [326] 6f 6f 53 65 72 69 61 6c 31 00 00 04 02 00 00 02 ff 00 00 00 10 00 00 00 01 [351] 00 04 00 09 00 00 00 0a 2e 47 6c 6f 62 61 6c 45 6e 76 00 00 00 fe 00 00 00 [376] 06 00 00 04 ff 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize#Ignored.ImplementationError# #options(keep.source=FALSE); fc <- setClass('FooSerial1', representation(a = 'call')); serialize(fc, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 01 [26] 07 03 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 09 63 6c 61 73 73 4e 61 [51] 6d 65 00 00 02 10 00 00 00 01 00 04 00 09 00 00 00 0a 46 6f 6f 53 65 72 69 [76] 61 6c 31 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 07 70 61 63 6b 61 67 [101] 65 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 0a 2e 47 6c 6f 62 61 6c 45 [126] 6e 76 00 00 00 fe 00 00 04 02 00 00 02 ff 00 00 00 10 00 00 00 01 00 04 00 [151] 09 00 00 00 0a 2e 47 6c 6f 62 61 6c 45 6e 76 00 00 04 02 00 00 00 01 00 04 [176] 00 09 00 00 00 05 63 6c 61 73 73 00 00 02 10 00 00 00 01 00 04 00 09 00 00 [201] 00 16 63 6c 61 73 73 47 65 6e 65 72 61 74 6f 72 46 75 6e 63 74 69 6f 6e 00 [226] 00 04 02 00 00 02 ff 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 07 6d 65 [251] 74 68 6f 64 73 00 00 00 fe 00 00 00 fe 00 00 00 fd 00 00 04 02 00 00 00 01 [276] 00 04 00 09 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 00 00 06 00 00 [301] 00 01 00 04 00 09 00 00 00 03 6e 65 77 00 00 00 02 00 00 02 10 00 00 00 01 [326] 00 04 00 09 00 00 00 0a 46 6f 6f 53 65 72 69 61 6c 31 00 00 04 02 00 00 02 [351] ff 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 0a 2e 47 6c 6f 62 61 6c 45 [376] 6e 76 00 00 00 fe 00 00 00 06 00 00 04 ff 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); mc <- setClass('FooSerial0', representation(a = 'call')); obj <- new('FooSerial0'); serialize(obj, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 01 03 19 00 00 04 02 00 00 00 [26] 01 00 04 00 09 00 00 00 01 61 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 [51] 07 3c 75 6e 64 65 66 3e 00 00 00 fe 00 00 04 02 00 00 00 01 00 04 00 09 00 [76] 00 00 05 63 6c 61 73 73 00 00 02 10 00 00 00 01 00 04 00 09 00 00 00 0a 46 [101] 6f 6f 53 65 72 69 61 6c 30 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 07 [126] 70 61 63 6b 61 67 65 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 0a 2e 47 [151] 6c 6f 62 61 6c 45 6e 76 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); mc <- setClass('FooSerial0', representation(a = 'call')); obj <- new('FooSerial0'); serialize(obj, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 01 [26] 03 19 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 06 00 00 [51] 00 01 00 04 00 09 00 00 00 07 3c 75 6e 64 65 66 3e 00 00 00 fe 00 00 04 02 [76] 00 00 00 01 00 04 00 09 00 00 00 05 63 6c 61 73 73 00 00 02 10 00 00 00 01 [101] 00 04 00 09 00 00 00 0a 46 6f 6f 53 65 72 69 61 6c 30 00 00 04 02 00 00 00 [126] 01 00 04 00 09 00 00 00 07 70 61 63 6b 61 67 65 00 00 00 10 00 00 00 01 00 [151] 04 00 09 00 00 00 0a 2e 47 6c 6f 62 61 6c 45 6e 76 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize('asdf', connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 10 00 00 00 01 00 04 00 [26] 09 00 00 00 04 61 73 64 66 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize('asdf', connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 10 00 00 00 01 00 04 00 09 00 00 00 04 61 73 64 66 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(111+8i, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0f 00 00 00 01 40 5b c0 [26] 00 00 00 00 00 40 20 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(111+8i, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0f 00 00 00 01 40 5b c0 00 00 00 00 00 40 20 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(111, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0e 00 00 00 01 40 5b c0 [26] 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(111, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0e 00 00 00 01 40 5b c0 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(111L, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 01 00 00 00 [26] 6f ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(111L, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0d 00 00 00 01 00 00 00 6f ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(FALSE, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0a 00 00 00 01 00 00 00 [26] 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(FALSE, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0a 00 00 00 01 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(NA_character_, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 10 00 00 00 01 00 00 00 [26] 09 ff ff ff ff ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(NA_character_, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 10 00 00 00 01 00 00 00 09 ff ff ff ff ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(NA_complex_, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0f 00 00 00 01 7f f0 00 [26] 00 00 00 07 a2 7f f0 00 00 00 00 07 a2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(NA_complex_, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0f 00 00 00 01 7f f0 00 00 00 00 07 a2 7f f0 00 00 00 00 07 a2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(NA_integer_, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 01 80 00 00 [26] 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(NA_integer_, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0d 00 00 00 01 80 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(NA_real_, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0e 00 00 00 01 7f f0 00 [26] 00 00 00 07 a2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(NA_real_, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0e 00 00 00 01 7f f0 00 00 00 00 07 a2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(TRUE, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0a 00 00 00 01 00 00 00 [26] 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(TRUE, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0a 00 00 00 01 00 00 00 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(as.raw(10), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 18 00 00 00 01 0a ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(as.raw(10), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 18 00 00 00 01 0a ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(as.raw(210), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 18 00 00 00 01 d2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(as.raw(210), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 18 00 00 00 01 d2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(as.raw(c(1, 55, 210)), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 18 00 00 00 03 01 37 d2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(as.raw(c(1, 55, 210)), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 18 00 00 00 03 01 37 d2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(c(111+8i, 55+9i, NA), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0f 00 00 00 03 40 5b c0 [26] 00 00 00 00 00 40 20 00 00 00 00 00 00 40 4b 80 00 00 00 00 00 40 22 00 00 [51] 00 00 00 00 7f f0 00 00 00 00 07 a2 7f f0 00 00 00 00 07 a2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(c(111+8i, 55+9i, NA), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0f 00 00 00 03 40 5b c0 00 00 00 00 00 40 20 00 00 00 00 00 00 40 4b 80 [51] 00 00 00 00 00 40 22 00 00 00 00 00 00 7f f0 00 00 00 00 07 a2 7f f0 00 00 [76] 00 00 07 a2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(c(111, 99, NA, 44), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0e 00 00 00 04 40 5b c0 [26] 00 00 00 00 00 40 58 c0 00 00 00 00 00 7f f0 00 00 00 00 07 a2 40 46 00 00 [51] 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(c(111, 99, NA, 44), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0e 00 00 00 04 40 5b c0 00 00 00 00 00 40 58 c0 00 00 00 00 00 7f f0 00 [51] 00 00 00 07 a2 40 46 00 00 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(c(111L, 11L, 990000L, NA_integer_), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 04 00 00 00 [26] 6f 00 00 00 0b 00 0f 1b 30 80 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(c(111L, 11L, 990000L, NA_integer_), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0d 00 00 00 04 00 00 00 6f 00 00 00 0b 00 0f 1b 30 80 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(c(TRUE, FALSE, TRUE, NA, TRUE), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0a 00 00 00 05 00 00 00 [26] 01 00 00 00 00 00 00 00 01 80 00 00 00 00 00 00 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(c(TRUE, FALSE, TRUE, NA, TRUE), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0a 00 00 00 05 00 00 00 01 00 00 00 00 00 00 00 01 80 00 00 00 00 00 00 [51] 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote("bar"), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 10 00 00 00 01 00 04 00 [26] 09 00 00 00 03 62 61 72 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote("bar"), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 10 00 00 00 01 00 04 00 09 00 00 00 03 62 61 72 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote('asdf'), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 10 00 00 00 01 00 04 00 [26] 09 00 00 00 04 61 73 64 66 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote('asdf'), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 10 00 00 00 01 00 04 00 09 00 00 00 04 61 73 64 66 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote('baz'), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 10 00 00 00 01 00 04 00 [26] 09 00 00 00 03 62 61 7a ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote('baz'), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 10 00 00 00 01 00 04 00 09 00 00 00 03 62 61 7a ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote((a %asdf% b)), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 01 28 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 [51] 06 25 61 73 64 66 25 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 [76] 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote((a %asdf% b)), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 01 28 00 00 00 02 00 00 00 06 00 00 [51] 00 01 00 04 00 09 00 00 00 06 25 61 73 64 66 25 00 00 00 02 00 00 00 01 00 [76] 04 00 09 00 00 00 01 61 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 [101] 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote((a+b)), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 01 28 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 [51] 01 2b 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 02 00 00 [76] 00 01 00 04 00 09 00 00 00 01 62 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote((a+b)), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 01 28 00 00 00 02 00 00 00 06 00 00 [51] 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 02 00 00 00 01 00 04 00 09 00 00 [76] 00 01 61 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 fe 00 [101] 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(111+11), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 01 2b 00 00 00 02 00 00 00 0e 00 00 00 01 40 5b c0 00 00 00 00 [51] 00 00 00 00 02 00 00 00 0e 00 00 00 01 40 26 00 00 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(111+11), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 02 00 00 00 0e 00 00 [51] 00 01 40 5b c0 00 00 00 00 00 00 00 00 02 00 00 00 0e 00 00 00 01 40 26 00 [76] 00 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(111+8i), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 01 2b 00 00 00 02 00 00 00 0e 00 00 00 01 40 5b c0 00 00 00 00 [51] 00 00 00 00 02 00 00 00 0f 00 00 00 01 00 00 00 00 00 00 00 00 40 20 00 00 [76] 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(111+8i), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 02 00 00 00 0e 00 00 [51] 00 01 40 5b c0 00 00 00 00 00 00 00 00 02 00 00 00 0f 00 00 00 01 00 00 00 [76] 00 00 00 00 00 40 20 00 00 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(111L), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 01 00 00 00 [26] 6f ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(111L), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0d 00 00 00 01 00 00 00 6f ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(FALSE), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0a 00 00 00 01 00 00 00 [26] 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(FALSE), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0a 00 00 00 01 00 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(NA_character_ + NA_complex_ + NA_integer_ + NA_real_), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 01 2b 00 00 00 02 00 00 00 06 00 00 01 ff 00 00 00 02 00 00 00 [51] 06 00 00 01 ff 00 00 00 02 00 00 00 10 00 00 00 01 00 00 00 09 ff ff ff ff [76] 00 00 00 02 00 00 00 0f 00 00 00 01 7f f0 00 00 00 00 07 a2 7f f0 00 00 00 [101] 00 07 a2 00 00 00 fe 00 00 00 02 00 00 00 0d 00 00 00 01 80 00 00 00 00 00 [126] 00 fe 00 00 00 02 00 00 00 0e 00 00 00 01 7f f0 00 00 00 00 07 a2 00 00 00 [151] fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(NA_character_ + NA_complex_ + NA_integer_ + NA_real_), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 02 00 00 00 06 00 00 [51] 01 ff 00 00 00 02 00 00 00 06 00 00 01 ff 00 00 00 02 00 00 00 10 00 00 00 [76] 01 00 00 00 09 ff ff ff ff 00 00 00 02 00 00 00 0f 00 00 00 01 7f f0 00 00 [101] 00 00 07 a2 7f f0 00 00 00 00 07 a2 00 00 00 fe 00 00 00 02 00 00 00 0d 00 [126] 00 00 01 80 00 00 00 00 00 00 fe 00 00 00 02 00 00 00 0e 00 00 00 01 7f f0 [151] 00 00 00 00 07 a2 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(NA_character_), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 10 00 00 00 01 00 00 00 [26] 09 ff ff ff ff ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(NA_character_), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 10 00 00 00 01 00 00 00 09 ff ff ff ff ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(NA_complex_), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0f 00 00 00 01 7f f0 00 [26] 00 00 00 07 a2 7f f0 00 00 00 00 07 a2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(NA_complex_), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0f 00 00 00 01 7f f0 00 00 00 00 07 a2 7f f0 00 00 00 00 07 a2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(NA_integer_), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 01 80 00 00 [26] 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(NA_integer_), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0d 00 00 00 01 80 00 00 00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(NA_real_), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0e 00 00 00 01 7f f0 00 [26] 00 00 00 07 a2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(NA_real_), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0e 00 00 00 01 7f f0 00 00 00 00 07 a2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(TRUE), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0a 00 00 00 01 00 00 00 [26] 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(TRUE), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0a 00 00 00 01 00 00 00 01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(a(b(c(d(function (e, ...) { f(g)$h.i}))))), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 01 61 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 [51] 01 62 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 63 00 00 [76] 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 64 00 00 00 02 00 00 [101] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [126] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 65 00 00 00 fb 00 00 04 [151] 02 00 00 00 01 00 04 00 09 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 [176] 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 [201] 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 24 00 00 00 02 00 00 00 06 00 [226] 00 00 01 00 04 00 09 00 00 00 01 66 00 00 00 02 00 00 00 01 00 04 00 09 00 [251] 00 00 01 67 00 00 00 fe 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 03 68 [276] 2e 69 00 00 00 fe 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe 00 00 00 [301] fe 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(a(b(c(d(function (e, ...) { f(g)$h.i}))))), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 02 00 00 00 06 00 00 [51] 00 01 00 04 00 09 00 00 00 01 62 00 00 00 02 00 00 00 06 00 00 00 01 00 04 [76] 00 09 00 00 00 01 63 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 [101] 00 01 64 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 [126] 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [151] 01 65 00 00 00 fb 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 03 2e 2e 2e [176] 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 [201] 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 24 [226] 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 66 00 00 00 02 [251] 00 00 00 01 00 04 00 09 00 00 00 01 67 00 00 00 fe 00 00 00 02 00 00 00 01 [276] 00 04 00 09 00 00 00 03 68 2e 69 00 00 00 fe 00 00 00 fe 00 00 00 02 00 00 [301] 00 fe 00 00 00 fe 00 00 00 fe 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(a+b), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 01 2b 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 [51] 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(a+b), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 02 00 00 00 01 00 04 [51] 00 09 00 00 00 01 61 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 [76] 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(b + xxxx(yyyy=1)), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 01 2b 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 [51] 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 04 78 78 78 78 00 00 04 [76] 02 00 00 00 01 00 04 00 09 00 00 00 04 79 79 79 79 00 00 00 0e 00 00 00 01 [101] 3f f0 00 00 00 00 00 00 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(b + xxxx(yyyy=1)), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 02 00 00 00 01 00 04 [51] 00 09 00 00 00 01 62 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 [76] 00 04 78 78 78 78 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 04 79 79 79 [101] 79 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(f(g)$h.i), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 01 24 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 [51] 01 66 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 67 00 00 00 fe 00 00 [76] 00 02 00 00 00 01 00 04 00 09 00 00 00 03 68 2e 69 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(f(g)$h.i), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 01 24 00 00 00 02 00 00 00 06 00 00 [51] 00 01 00 04 00 09 00 00 00 01 66 00 00 00 02 00 00 00 01 00 04 00 09 00 00 [76] 00 01 67 00 00 00 fe 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 03 68 2e [101] 69 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(foo(a,b,c)), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 03 66 6f 6f 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 [51] 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 02 00 00 00 01 [76] 00 04 00 09 00 00 00 01 63 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(foo(a,b,c)), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 03 66 6f 6f 00 00 00 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 61 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 [76] 62 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 63 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function() new("foo", x)), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 00 fe 00 00 00 02 [51] 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 03 6e 65 77 00 00 00 02 00 00 [76] 00 10 00 00 00 01 00 04 00 09 00 00 00 03 66 6f 6f 00 00 00 02 00 00 00 01 [101] 00 04 00 09 00 00 00 01 78 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function() new("foo", x)), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 03 [76] 6e 65 77 00 00 00 02 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 03 66 6f [101] 6f 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 fe 00 00 00 [126] 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x) { `+`(`(`("BAR"), x) }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 [76] 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 00 01 [101] 00 04 00 09 00 00 00 01 2b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 [126] 00 00 00 01 28 00 00 00 02 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 03 [151] 42 41 52 00 00 00 fe 00 00 00 02 00 00 02 ff 00 00 00 fe 00 00 00 fe 00 00 [176] 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x) { `+`(`(`("BAR"), x) }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 00 [76] fe 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 [101] 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 02 00 00 00 [126] 06 00 00 00 01 00 04 00 09 00 00 00 01 28 00 00 00 02 00 00 00 10 00 00 00 [151] 01 00 04 00 09 00 00 00 03 42 41 52 00 00 00 fe 00 00 00 02 00 00 02 ff 00 [176] 00 00 fe 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x) { new("BAR", x) }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 [76] 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 00 01 [101] 00 04 00 09 00 00 00 03 6e 65 77 00 00 00 02 00 00 00 10 00 00 00 01 00 04 [126] 00 09 00 00 00 03 42 41 52 00 00 00 02 00 00 02 ff 00 00 00 fe 00 00 00 fe [151] 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x) { new("BAR", x) }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 00 [76] fe 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 [101] 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 03 6e 65 77 00 00 00 02 00 [126] 00 00 10 00 00 00 01 00 04 00 09 00 00 00 03 42 41 52 00 00 00 02 00 00 02 [151] ff 00 00 00 fe 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x, ...) { new("BAR", x) }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 04 02 00 00 00 01 00 04 00 09 [76] 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 [101] 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 [126] 00 09 00 00 00 03 6e 65 77 00 00 00 02 00 00 00 10 00 00 00 01 00 04 00 09 [151] 00 00 00 03 42 41 52 00 00 00 02 00 00 02 ff 00 00 00 fe 00 00 00 fe 00 00 [176] 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x, ...) { new("BAR", x) }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 04 [76] 02 00 00 00 01 00 04 00 09 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 [101] 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 [126] 00 00 06 00 00 00 01 00 04 00 09 00 00 00 03 6e 65 77 00 00 00 02 00 00 00 [151] 10 00 00 00 01 00 04 00 09 00 00 00 03 42 41 52 00 00 00 02 00 00 02 ff 00 [176] 00 00 fe 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x,y) { TRUE }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 04 02 00 00 00 01 00 04 00 09 [76] 00 00 00 01 79 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 00 01 [101] 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 0a 00 00 00 01 00 00 00 01 [126] 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x,y) { TRUE }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 04 [76] 02 00 00 00 01 00 04 00 09 00 00 00 01 79 00 00 00 fb 00 00 00 fe 00 00 00 [101] 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 [126] 0a 00 00 00 01 00 00 00 01 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x,y) { new("BAR", x) }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 04 02 00 00 00 01 00 04 00 09 [76] 00 00 00 01 79 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 00 01 [101] 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 [126] 00 00 00 03 6e 65 77 00 00 00 02 00 00 00 10 00 00 00 01 00 04 00 09 00 00 [151] 00 03 42 41 52 00 00 00 02 00 00 02 ff 00 00 00 fe 00 00 00 fe 00 00 00 02 [176] 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x,y) { new("BAR", x) }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 04 [76] 02 00 00 00 01 00 04 00 09 00 00 00 01 79 00 00 00 fb 00 00 00 fe 00 00 00 [101] 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 [126] 06 00 00 00 01 00 04 00 09 00 00 00 03 6e 65 77 00 00 00 02 00 00 00 10 00 [151] 00 00 01 00 04 00 09 00 00 00 03 42 41 52 00 00 00 02 00 00 02 ff 00 00 00 [176] fe 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x,y,...) { 1 }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 04 02 00 00 00 01 00 04 00 09 [76] 00 00 00 01 79 00 00 00 fb 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 03 [101] 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 00 01 00 04 [126] 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 [151] 00 00 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x,y,...) { 1 }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 04 [76] 02 00 00 00 01 00 04 00 09 00 00 00 01 79 00 00 00 fb 00 00 04 02 00 00 00 [101] 01 00 04 00 09 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 00 00 02 00 [126] 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 0e 00 [151] 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 [176] 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x,y=1,...) { NA }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 04 02 00 00 00 01 00 04 00 09 [76] 00 00 00 01 79 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 04 02 [101] 00 00 00 01 00 04 00 09 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 00 [126] 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 [151] 00 0a 00 00 00 01 80 00 00 00 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 [176] fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x,y=1,...) { NA }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 04 [76] 02 00 00 00 01 00 04 00 09 00 00 00 01 79 00 00 00 0e 00 00 00 01 3f f0 00 [101] 00 00 00 00 00 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 03 2e 2e 2e 00 [126] 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 [151] 00 01 7b 00 00 00 02 00 00 00 0a 00 00 00 01 80 00 00 00 00 00 00 fe 00 00 [176] 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x={1 + a},y,...) { !!NA }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 [76] 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 [101] 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 02 00 00 00 01 [126] 00 04 00 09 00 00 00 01 61 00 00 00 fe 00 00 00 fe 00 00 04 02 00 00 00 01 [151] 00 04 00 09 00 00 00 01 79 00 00 00 fb 00 00 04 02 00 00 00 01 00 04 00 09 [176] 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 [201] 03 ff 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 21 00 00 [226] 00 02 00 00 00 06 00 00 08 ff 00 00 00 02 00 00 00 0a 00 00 00 01 80 00 00 [251] 00 00 00 00 fe 00 00 00 fe 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x={1 + a},y,...) { !!NA }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 06 00 00 00 [76] 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 [101] 09 00 00 00 01 2b 00 00 00 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 [126] 00 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 fe 00 00 00 [151] fe 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 79 00 00 00 fb 00 00 04 [176] 02 00 00 00 01 00 04 00 09 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 [201] 00 00 02 00 00 00 06 00 00 03 ff 00 00 00 02 00 00 00 06 00 00 00 01 00 04 [226] 00 09 00 00 00 01 21 00 00 00 02 00 00 00 06 00 00 08 ff 00 00 00 02 00 00 [251] 00 0a 00 00 00 01 80 00 00 00 00 00 00 fe 00 00 00 fe 00 00 00 fe 00 00 00 [276] 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x={1 + a},y,...) { !1+5i }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 [76] 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 [101] 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 02 00 00 00 01 [126] 00 04 00 09 00 00 00 01 61 00 00 00 fe 00 00 00 fe 00 00 04 02 00 00 00 01 [151] 00 04 00 09 00 00 00 01 79 00 00 00 fb 00 00 04 02 00 00 00 01 00 04 00 09 [176] 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 [201] 03 ff 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 21 00 00 [226] 00 02 00 00 00 06 00 00 04 ff 00 00 00 02 00 00 00 0e 00 00 00 01 3f f0 00 [251] 00 00 00 00 00 00 00 00 02 00 00 00 0f 00 00 00 01 00 00 00 00 00 00 00 00 [276] 40 14 00 00 00 00 00 00 00 00 00 fe 00 00 00 fe 00 00 00 fe 00 00 00 02 00 [301] 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x={1 + a},y,...) { !1+5i }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 06 00 00 00 [76] 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 [101] 09 00 00 00 01 2b 00 00 00 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 [126] 00 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 fe 00 00 00 [151] fe 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 79 00 00 00 fb 00 00 04 [176] 02 00 00 00 01 00 04 00 09 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 [201] 00 00 02 00 00 00 06 00 00 03 ff 00 00 00 02 00 00 00 06 00 00 00 01 00 04 [226] 00 09 00 00 00 01 21 00 00 00 02 00 00 00 06 00 00 04 ff 00 00 00 02 00 00 [251] 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 02 00 00 00 0f 00 00 00 [276] 01 00 00 00 00 00 00 00 00 40 14 00 00 00 00 00 00 00 00 00 fe 00 00 00 fe [301] 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x={1 + a},y,...) { NA }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 [76] 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 [101] 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 02 00 00 00 01 [126] 00 04 00 09 00 00 00 01 61 00 00 00 fe 00 00 00 fe 00 00 04 02 00 00 00 01 [151] 00 04 00 09 00 00 00 01 79 00 00 00 fb 00 00 04 02 00 00 00 01 00 04 00 09 [176] 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 [201] 03 ff 00 00 00 02 00 00 00 0a 00 00 00 01 80 00 00 00 00 00 00 fe 00 00 00 [226] 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x={1 + a},y,...) { NA }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 06 00 00 00 [76] 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 [101] 09 00 00 00 01 2b 00 00 00 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 [126] 00 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 fe 00 00 00 [151] fe 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 79 00 00 00 fb 00 00 04 [176] 02 00 00 00 01 00 04 00 09 00 00 00 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 [201] 00 00 02 00 00 00 06 00 00 03 ff 00 00 00 02 00 00 00 0a 00 00 00 01 80 00 [226] 00 00 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x={1 + a},y=c(1,2,3),z="foo",...) { !1+5i }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 02 00 00 04 02 00 00 00 01 [51] 00 04 00 09 00 00 00 01 78 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 [76] 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 [101] 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 02 00 00 00 01 [126] 00 04 00 09 00 00 00 01 61 00 00 00 fe 00 00 00 fe 00 00 04 02 00 00 00 01 [151] 00 04 00 09 00 00 00 01 79 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 [176] 63 00 00 00 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 02 [201] 00 00 00 0e 00 00 00 01 40 00 00 00 00 00 00 00 00 00 00 02 00 00 00 0e 00 [226] 00 00 01 40 08 00 00 00 00 00 00 00 00 00 fe 00 00 04 02 00 00 00 01 00 04 [251] 00 09 00 00 00 01 7a 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 03 66 6f [276] 6f 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 03 2e 2e 2e 00 00 00 fb 00 [301] 00 00 fe 00 00 00 02 00 00 00 06 00 00 03 ff 00 00 00 02 00 00 00 06 00 00 [326] 00 01 00 04 00 09 00 00 00 01 21 00 00 00 02 00 00 00 06 00 00 04 ff 00 00 [351] 00 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 02 00 00 00 [376] 0f 00 00 00 01 00 00 00 00 00 00 00 00 40 14 00 00 00 00 00 00 00 00 00 fe [401] 00 00 00 fe 00 00 00 fe 00 00 00 02 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(function(x={1 + a},y=c(1,2,3),z="foo",...) { !1+5i }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 08 66 75 6e 63 74 69 6f 6e 00 00 00 [51] 02 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 06 00 00 00 [76] 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 [101] 09 00 00 00 01 2b 00 00 00 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 [126] 00 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 fe 00 00 00 [151] fe 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 79 00 00 00 06 00 00 00 [176] 01 00 04 00 09 00 00 00 01 63 00 00 00 02 00 00 00 0e 00 00 00 01 3f f0 00 [201] 00 00 00 00 00 00 00 00 02 00 00 00 0e 00 00 00 01 40 00 00 00 00 00 00 00 [226] 00 00 00 02 00 00 00 0e 00 00 00 01 40 08 00 00 00 00 00 00 00 00 00 fe 00 [251] 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 7a 00 00 00 10 00 00 00 01 00 [276] 04 00 09 00 00 00 03 66 6f 6f 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [301] 03 2e 2e 2e 00 00 00 fb 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 03 ff 00 [326] 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 21 00 00 00 02 00 [351] 00 00 06 00 00 04 ff 00 00 00 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 [376] 00 00 00 00 00 02 00 00 00 0f 00 00 00 01 00 00 00 00 00 00 00 00 40 14 00 [401] 00 00 00 00 00 00 00 00 fe 00 00 00 fe 00 00 00 fe 00 00 00 02 00 00 00 fe [426] 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(if (a * 2 < 199) b + foo(x,y,foo=z+1,bar=)), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 02 69 66 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 [51] 00 01 3c 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2a 00 [76] 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 02 00 00 00 0e 00 [101] 00 00 01 40 00 00 00 00 00 00 00 00 00 00 fe 00 00 00 02 00 00 00 0e 00 00 [126] 00 01 40 68 e0 00 00 00 00 00 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 00 [151] 01 00 04 00 09 00 00 00 01 2b 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 [176] 01 62 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 03 66 6f 6f [201] 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 02 00 00 00 01 [226] 00 04 00 09 00 00 00 01 79 00 00 04 02 00 00 07 ff 00 00 00 06 00 00 05 ff [251] 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 7a 00 00 00 02 00 00 00 0e [276] 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 fe 00 00 04 02 00 00 00 01 00 [301] 04 00 09 00 00 00 03 62 61 72 00 00 00 fb 00 00 00 fe 00 00 00 fe 00 00 00 [326] fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(if (a * 2 < 199) b + foo(x,y,foo=z+1,bar=)), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 02 69 66 00 00 00 02 00 00 00 06 00 [51] 00 00 01 00 04 00 09 00 00 00 01 3c 00 00 00 02 00 00 00 06 00 00 00 01 00 [76] 04 00 09 00 00 00 01 2a 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 [101] 00 00 00 02 00 00 00 0e 00 00 00 01 40 00 00 00 00 00 00 00 00 00 00 fe 00 [126] 00 00 02 00 00 00 0e 00 00 00 01 40 68 e0 00 00 00 00 00 00 00 00 fe 00 00 [151] 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 2b 00 00 00 02 00 00 [176] 00 01 00 04 00 09 00 00 00 01 62 00 00 00 02 00 00 00 06 00 00 00 01 00 04 [201] 00 09 00 00 00 03 66 6f 6f 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 [226] 78 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 79 00 00 04 02 00 00 07 [251] ff 00 00 00 06 00 00 05 ff 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 [276] 7a 00 00 00 02 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 fe [301] 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 03 62 61 72 00 00 00 fb 00 00 [326] 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(if (a) b else c), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 02 69 66 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 [51] 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 02 00 00 00 01 00 [76] 04 00 09 00 00 00 01 63 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(if (a) b else c), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 02 69 66 00 00 00 02 00 00 00 01 00 [51] 04 00 09 00 00 00 01 61 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 [76] 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 63 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(if (a) {b} else {c}), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 02 69 66 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 [51] 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 [76] 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 fe 00 00 00 02 00 00 00 06 00 [101] 00 03 ff 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 63 00 00 00 fe 00 [126] 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(if (a) {b} else {c}), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 02 69 66 00 00 00 02 00 00 00 01 00 [51] 04 00 09 00 00 00 01 61 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 [76] 00 00 01 7b 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 fe [101] 00 00 00 02 00 00 00 06 00 00 03 ff 00 00 00 02 00 00 00 01 00 04 00 09 00 [126] 00 00 01 63 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(if ({a}) {b} else {c}), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 02 69 66 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 [51] 00 01 7b 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 fe 00 [76] 00 00 02 00 00 00 06 00 00 02 ff 00 00 00 02 00 00 00 01 00 04 00 09 00 00 [101] 00 01 62 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 02 ff 00 00 00 02 00 00 [126] 00 01 00 04 00 09 00 00 00 01 63 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(if ({a}) {b} else {c}), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 02 69 66 00 00 00 02 00 00 00 06 00 [51] 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 01 00 04 00 09 00 [76] 00 00 01 61 00 00 00 fe 00 00 00 02 00 00 00 06 00 00 02 ff 00 00 00 02 00 [101] 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 fe 00 00 00 02 00 00 00 06 00 [126] 00 02 ff 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 63 00 00 00 fe 00 [151] 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(repeat {b; if (c) next else break}), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 06 72 65 70 65 61 74 00 00 00 02 00 00 00 06 00 00 00 01 00 04 [51] 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 [76] 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 02 69 66 00 00 00 02 [101] 00 00 00 01 00 04 00 09 00 00 00 01 63 00 00 00 02 00 00 00 06 00 00 00 01 [126] 00 04 00 09 00 00 00 04 6e 65 78 74 00 00 00 fe 00 00 00 02 00 00 00 06 00 [151] 00 00 01 00 04 00 09 00 00 00 05 62 72 65 61 6b 00 00 00 fe 00 00 00 fe 00 [176] 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(repeat {b; if (c) next else break}), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 06 72 65 70 65 61 74 00 00 00 02 00 [51] 00 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 01 00 [76] 04 00 09 00 00 00 01 62 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 [101] 00 00 02 69 66 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 63 00 00 00 [126] 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 04 6e 65 78 74 00 00 00 fe [151] 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 05 62 72 65 61 6b [176] 00 00 00 fe 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(while (a) b), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 05 77 68 69 6c 65 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 [51] 01 61 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(while (a) b), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 05 77 68 69 6c 65 00 00 00 02 00 00 [51] 00 01 00 04 00 09 00 00 00 01 61 00 00 00 02 00 00 00 01 00 04 00 09 00 00 [76] 00 01 62 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(x), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 01 00 04 00 09 00 00 00 [26] 01 78 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(x), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 01 00 04 00 09 00 00 00 01 78 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(xxxx(yyyy=1)), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 04 78 78 78 78 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 04 [51] 79 79 79 79 00 00 00 0e 00 00 00 01 3f f0 00 00 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote(xxxx(yyyy=1)), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 04 78 78 78 78 00 00 04 02 00 00 00 [51] 01 00 04 00 09 00 00 00 04 79 79 79 79 00 00 00 0e 00 00 00 01 3f f0 00 00 [76] 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote({ foo(a,b,c) }), connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 06 00 00 00 01 00 04 00 [26] 09 00 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 [51] 03 66 6f 6f 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 02 [76] 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 02 00 00 00 01 00 04 00 09 [101] 00 00 00 01 63 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); serialize(quote({ foo(a,b,c) }), connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 06 00 00 00 01 00 04 00 09 00 00 00 01 7b 00 00 00 02 00 00 00 06 00 00 [51] 00 01 00 04 00 09 00 00 00 03 66 6f 6f 00 00 00 02 00 00 00 01 00 04 00 09 [76] 00 00 00 01 61 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 [101] 02 00 00 00 01 00 04 00 09 00 00 00 01 63 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- defaultPrototype(); serialize(val, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 01 00 19 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- defaultPrototype(); serialize(val, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 01 [26] 00 19 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- list(enclos = new.env(hash=FALSE)); serialize(val, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 02 13 00 00 00 01 00 00 00 [26] 04 00 00 00 00 00 00 00 fd 00 00 00 fe 00 00 00 fe 00 00 00 fe 00 00 04 02 [51] 00 00 00 01 00 04 00 09 00 00 00 05 6e 61 6d 65 73 00 00 00 10 00 00 00 01 [76] 00 04 00 09 00 00 00 06 65 6e 63 6c 6f 73 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- list(enclos = new.env(hash=FALSE)); serialize(val, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 02 13 00 00 00 01 00 00 00 04 00 00 00 00 00 00 00 fd 00 00 00 fe 00 00 00 [51] fe 00 00 00 fe 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 05 6e 61 6d 65 [76] 73 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 06 65 6e 63 6c 6f 73 00 00 [101] 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); makeActiveBinding('a', function(x) print('hello'), val); data <- serialize(val, connection=NULL, version=2); newenv <- unserialize(rawConnection(data)); newenv$a [1] "hello" [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); makeActiveBinding('a', function(x) print('hello'), val); data <- serialize(val, connection=NULL, version=3); newenv <- unserialize(rawConnection(data)); newenv$a [1] "hello" [1] "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); makeActiveBinding('a', function(x) print('hello'), val); serialize(val, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 04 00 00 00 00 00 00 00 [26] fd 08 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 04 03 00 00 00 [51] fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 fb 00 00 00 [76] fe 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 05 70 72 69 6e 74 00 00 00 [101] 02 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 05 68 65 6c 6c 6f 00 00 00 [126] fe 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); makeActiveBinding('a', function(x) print('hello'), val); serialize(val, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 04 00 00 00 00 00 00 00 fd 08 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [51] 01 61 00 00 04 03 00 00 00 fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [76] 01 78 00 00 00 fb 00 00 00 fe 00 00 00 06 00 00 00 01 00 04 00 09 00 00 00 [101] 05 70 72 69 6e 74 00 00 00 02 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 [126] 05 68 65 6c 6c 6f 00 00 00 fe 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); serialize(val, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 04 00 00 00 00 00 00 00 [26] fd 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); serialize(val, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 04 00 00 00 00 00 00 00 fd 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$a <- 'foo'; serialize(val, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 04 00 00 00 00 00 00 00 [26] fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 61 00 00 00 10 00 00 00 [51] 01 00 04 00 09 00 00 00 03 66 6f 6f 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$a <- 'foo'; serialize(val, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 04 00 00 00 00 00 00 00 fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [51] 01 61 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 03 66 6f 6f 00 00 00 fe [76] 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$b <- 123; serialize(val, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 04 00 00 00 00 00 00 00 [26] fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 62 00 00 00 0e 00 00 00 [51] 01 40 5e c0 00 00 00 00 00 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$b <- 123; serialize(val, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 04 00 00 00 00 00 00 00 fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [51] 01 62 00 00 00 0e 00 00 00 01 40 5e c0 00 00 00 00 00 00 00 00 fe 00 00 00 [76] fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$c <- 1233L; serialize(val, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 04 00 00 00 00 00 00 00 [26] fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 63 00 00 00 0d 00 00 00 [51] 01 00 00 04 d1 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$c <- 1233L; serialize(val, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 04 00 00 00 00 00 00 00 fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [51] 01 63 00 00 00 0d 00 00 00 01 00 00 04 d1 00 00 00 fe 00 00 00 fe 00 00 00 [76] fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$d <- TRUE; serialize(val, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 04 00 00 00 00 00 00 00 [26] fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 64 00 00 00 0a 00 00 00 [51] 01 00 00 00 01 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$d <- TRUE; serialize(val, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 04 00 00 00 00 00 00 00 fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [51] 01 64 00 00 00 0a 00 00 00 01 00 00 00 01 00 00 00 fe 00 00 00 fe 00 00 00 [76] fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$e <- 5+9i; serialize(val, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 04 00 00 00 00 00 00 00 [26] fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 65 00 00 00 0f 00 00 00 [51] 01 40 14 00 00 00 00 00 00 40 22 00 00 00 00 00 00 00 00 00 fe 00 00 00 fe [76] 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$e <- 5+9i; serialize(val, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 04 00 00 00 00 00 00 00 fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [51] 01 65 00 00 00 0f 00 00 00 01 40 14 00 00 00 00 00 00 40 22 00 00 00 00 00 [76] 00 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$f <- NA; serialize(val, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 04 00 00 00 00 00 00 00 [26] fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 66 00 00 00 0a 00 00 00 [51] 01 80 00 00 00 00 00 00 fe 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$f <- NA; serialize(val, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 04 00 00 00 00 00 00 00 fd 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [51] 01 66 00 00 00 0a 00 00 00 01 80 00 00 00 00 00 00 fe 00 00 00 fe 00 00 00 [76] fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #s <- 1.1:10.1; attr(s, 'testattr') <- 'attrvalue'; serialize(s, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 02 0e 00 00 00 0a 3f f1 99 [26] 99 99 99 99 9a 40 00 cc cc cc cc cc cd 40 08 cc cc cc cc cc cd 40 10 66 66 [51] 66 66 66 66 40 14 66 66 66 66 66 66 40 18 66 66 66 66 66 66 40 1c 66 66 66 [76] 66 66 66 40 20 33 33 33 33 33 33 40 22 33 33 33 33 33 33 40 24 33 33 33 33 [101] 33 33 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 08 74 65 73 74 61 74 74 [126] 72 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 09 61 74 74 72 76 61 6c 75 [151] 65 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #s <- 1.1:10.1; attr(s, 'testattr') <- 'attrvalue'; serialize(s, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 02 0e 00 00 00 0a 3f f1 99 99 99 99 99 9a 40 00 cc cc cc cc cc cd 40 08 cc [51] cc cc cc cc cd 40 10 66 66 66 66 66 66 40 14 66 66 66 66 66 66 40 18 66 66 [76] 66 66 66 66 40 1c 66 66 66 66 66 66 40 20 33 33 33 33 33 33 40 22 33 33 33 [101] 33 33 33 40 24 33 33 33 33 33 33 00 00 04 02 00 00 00 01 00 04 00 09 00 00 [126] 00 08 74 65 73 74 61 74 74 72 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 [151] 09 61 74 74 72 76 61 6c 75 65 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #s <- 1:10; attr(s, 'testattr') <- 'attrvalue'; serialize(s, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 02 0d 00 00 00 0a 00 00 00 [26] 01 00 00 00 02 00 00 00 03 00 00 00 04 00 00 00 05 00 00 00 06 00 00 00 07 [51] 00 00 00 08 00 00 00 09 00 00 00 0a 00 00 04 02 00 00 00 01 00 04 00 09 00 [76] 00 00 08 74 65 73 74 61 74 74 72 00 00 00 10 00 00 00 01 00 04 00 09 00 00 [101] 00 09 61 74 74 72 76 61 6c 75 65 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #s <- 1:10; attr(s, 'testattr') <- 'attrvalue'; serialize(s, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 02 0d 00 00 00 0a 00 00 00 01 00 00 00 02 00 00 00 03 00 00 00 04 00 00 00 [51] 05 00 00 00 06 00 00 00 07 00 00 00 08 00 00 00 09 00 00 00 0a 00 00 04 02 [76] 00 00 00 01 00 04 00 09 00 00 00 08 74 65 73 74 61 74 74 72 00 00 00 10 00 [101] 00 00 01 00 04 00 09 00 00 00 09 61 74 74 72 76 61 6c 75 65 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #s <- 1L:10L; attr(s, 'testattr') <- 'attrvalue'; serialize(s, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 02 0d 00 00 00 0a 00 00 00 [26] 01 00 00 00 02 00 00 00 03 00 00 00 04 00 00 00 05 00 00 00 06 00 00 00 07 [51] 00 00 00 08 00 00 00 09 00 00 00 0a 00 00 04 02 00 00 00 01 00 04 00 09 00 [76] 00 00 08 74 65 73 74 61 74 74 72 00 00 00 10 00 00 00 01 00 04 00 09 00 00 [101] 00 09 61 74 74 72 76 61 6c 75 65 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #s <- 1L:10L; attr(s, 'testattr') <- 'attrvalue'; serialize(s, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 02 0d 00 00 00 0a 00 00 00 01 00 00 00 02 00 00 00 03 00 00 00 04 00 00 00 [51] 05 00 00 00 06 00 00 00 07 00 00 00 08 00 00 00 09 00 00 00 0a 00 00 04 02 [76] 00 00 00 01 00 04 00 09 00 00 00 08 74 65 73 74 61 74 74 72 00 00 00 10 00 [101] 00 00 01 00 04 00 09 00 00 00 09 61 74 74 72 76 61 6c 75 65 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #serialize('foo', NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 10 00 00 00 01 00 04 00 [26] 09 00 00 00 03 66 6f 6f ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #serialize('foo', NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 10 00 00 00 01 00 04 00 09 00 00 00 03 66 6f 6f ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #serialize(1.1:10.1, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0e 00 00 00 0a 3f f1 99 [26] 99 99 99 99 9a 40 00 cc cc cc cc cc cd 40 08 cc cc cc cc cc cd 40 10 66 66 [51] 66 66 66 66 40 14 66 66 66 66 66 66 40 18 66 66 66 66 66 66 40 1c 66 66 66 [76] 66 66 66 40 20 33 33 33 33 33 33 40 22 33 33 33 33 33 33 40 24 33 33 33 33 [101] 33 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #serialize(1.1:10.1, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0e 00 00 00 0a 3f f1 99 99 99 99 99 9a 40 00 cc cc cc cc cc cd 40 08 cc [51] cc cc cc cc cd 40 10 66 66 66 66 66 66 40 14 66 66 66 66 66 66 40 18 66 66 [76] 66 66 66 66 40 1c 66 66 66 66 66 66 40 20 33 33 33 33 33 33 40 22 33 33 33 [101] 33 33 33 40 24 33 33 33 33 33 33 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #serialize(1:10, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 0a 00 00 00 [26] 01 00 00 00 02 00 00 00 03 00 00 00 04 00 00 00 05 00 00 00 06 00 00 00 07 [51] 00 00 00 08 00 00 00 09 00 00 00 0a ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #serialize(1:10, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 ee 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 0e 63 6f 6d 70 61 63 74 [51] 5f 69 6e 74 73 65 71 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 04 62 61 [76] 73 65 00 00 00 02 00 00 00 0d 00 00 00 01 00 00 00 0d 00 00 00 fe 00 00 00 [101] 0e 00 00 00 03 40 24 00 00 00 00 00 00 3f f0 00 00 00 00 00 00 3f f0 00 00 [126] 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize#Ignored.Unimplemented# #serialize(1:2147483649, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 ee 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 0f 63 6f 6d 70 61 63 74 [51] 5f 72 65 61 6c 73 65 71 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 04 62 [76] 61 73 65 00 00 00 02 00 00 00 0d 00 00 00 01 00 00 00 0e 00 00 00 fe 00 00 [101] 00 0e 00 00 00 03 41 e0 00 00 00 20 00 00 3f f0 00 00 00 00 00 00 3f f0 00 [126] 00 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #serialize(1L:10L, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 0a 00 00 00 [26] 01 00 00 00 02 00 00 00 03 00 00 00 04 00 00 00 05 00 00 00 06 00 00 00 07 [51] 00 00 00 08 00 00 00 09 00 00 00 0a ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #serialize(1L:10L, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 ee 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 0e 63 6f 6d 70 61 63 74 [51] 5f 69 6e 74 73 65 71 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 04 62 61 [76] 73 65 00 00 00 02 00 00 00 0d 00 00 00 01 00 00 00 0d 00 00 00 fe 00 00 00 [101] 0e 00 00 00 03 40 24 00 00 00 00 00 00 3f f0 00 00 00 00 00 00 3f f0 00 00 [126] 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #setClass('foo', slots = c(x='numeric', y='numeric')); t1 <- new('foo', x=4, y=c(77,88)); options(keep.source=FALSE); serialize(t1, connection=NULL, version=2) [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 01 03 19 00 00 04 02 00 00 00 [26] 01 00 04 00 09 00 00 00 01 78 00 00 00 0e 00 00 00 01 40 10 00 00 00 00 00 [51] 00 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 79 00 00 00 0e 00 00 00 [76] 02 40 53 40 00 00 00 00 00 40 56 00 00 00 00 00 00 00 00 04 02 00 00 00 01 [101] 00 04 00 09 00 00 00 05 63 6c 61 73 73 00 00 02 10 00 00 00 01 00 04 00 09 [126] 00 00 00 03 66 6f 6f 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 07 70 61 [151] 63 6b 61 67 65 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 0a 2e 47 6c 6f [176] 62 61 6c 45 6e 76 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #setClass('foo', slots = c(x='numeric', y='numeric')); t1 <- new('foo', x=4, y=c(77,88)); options(keep.source=FALSE); serialize(t1, connection=NULL, version=3) [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 01 [26] 03 19 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 01 78 00 00 00 0e 00 00 [51] 00 01 40 10 00 00 00 00 00 00 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 [76] 01 79 00 00 00 0e 00 00 00 02 40 53 40 00 00 00 00 00 40 56 00 00 00 00 00 [101] 00 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 05 63 6c 61 73 73 00 00 02 [126] 10 00 00 00 01 00 04 00 09 00 00 00 03 66 6f 6f 00 00 04 02 00 00 00 01 00 [151] 04 00 09 00 00 00 07 70 61 63 6b 61 67 65 00 00 00 10 00 00 00 01 00 04 00 [176] 09 00 00 00 0a 2e 47 6c 6f 62 61 6c 45 6e 76 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #{ options(keep.source=FALSE); f <- function() NULL; attributes(f) <- list(skeleton=quote(``())); data <- serialize(f, conn=NULL, version=2); unserialize(conn=data) } function () NULL attr(,"skeleton") ``() ##com.oracle.truffle.r.test.builtins.TestBuiltin_serialize.testserialize# #{ options(keep.source=FALSE); f <- function() NULL; attributes(f) <- list(skeleton=quote(``())); data <- serialize(f, conn=NULL, version=3); unserialize(conn=data) } function () NULL attr(,"skeleton") ``() ##com.oracle.truffle.r.test.builtins.TestBuiltin_serializeInfoFromConn.testLoadInfoFromConn2# #vi <- .Internal(serializeInfoFromConn(rawConnection(serialize(42, connection=NULL, version=2)))); vi$version; vi$writer_version; vi$min_reader_version; vi$format; vi$native_encoding; [1] 2 [1] "4.0.3" [1] "2.3.0" [1] "xdr" NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_serializeInfoFromConn.testLoadInfoFromConn2# #vi <- .Internal(serializeInfoFromConn(rawConnection(serialize(42, connection=NULL, version=3)))); vi$version; vi$writer_version; vi$min_reader_version; vi$format; vi$native_encoding; [1] 3 [1] "4.0.3" [1] "3.5.0" [1] "xdr" [1] "UTF-8" ##com.oracle.truffle.r.test.builtins.TestBuiltin_serializeInfoFromConn.testToolsGetSerializationVersion# #{ f <- tempfile(fileext = '.rds'); a <- 42; con <- file(f,'wb'); serialize('a', connection=con, version=2); close(con); as.integer(tools:::get_serialization_version(f)); } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_serializeInfoFromConn.testToolsGetSerializationVersion# #{ f <- tempfile(fileext = '.rds'); a <- 42; con <- file(f,'wb'); serialize('a', connection=con, version=3); close(con); as.integer(tools:::get_serialization_version(f)); } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_setEncoding.testsetEncoding1# #argv <- list('abc', 'UTF-8'); .Internal(setEncoding(argv[[1]], argv[[2]])) [1] "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_setEncoding.testsetEncoding2# #argv <- list('', 'unknown'); .Internal(setEncoding(argv[[1]], argv[[2]])) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_setEncoding.testsetEncoding3# #argv <- list('3.0.1', 'unknown'); .Internal(setEncoding(argv[[1]], argv[[2]])) [1] "3.0.1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_setEncoding.testsetEncoding4# #argv <- list(structure(c('Matrix', '1.0-12', '2013-03-26', 'recommended', 'Sparse and Dense Matrix Classes and Methods', 'Douglas Bates and Martin Maechler\n ', 'Martin Maechler ', 'Doug and Martin ', 'Classes and methods for dense and sparse matrices and\n operations on them using Lapack and SuiteSparse.', 'R (>= 2.15.0), stats, methods, utils, lattice', 'graphics, grid', 'expm, MASS', 'MatrixModels, graph, SparseM, sfsmisc', 'UTF-8', 'no', 'no longer available, since we use data/*.R *and* our\nclasses', 'yes', 'no', 'GPL (>= 2)', 'The Matrix package includes libraries AMD, CHOLMOD,\nCOLAMD, CSparse and SPQR from the SuiteSparse collection of Tim\nDavis. All sections of that code are covered by the GPL or\nLGPL licenses. See the directory doc/UFsparse for details.', 'http://Matrix.R-forge.R-project.org/', '2013-03-26 15:38:54 UTC; maechler', 'yes', 'CRAN', '2013-03-26 19:25:05', 'R 3.0.1; x86_64-unknown-linux-gnu; 2013-12-07 03:52:11 UTC; unix'), .Names = c('Package', 'Version', 'Date', 'Priority', 'Title', 'Author', 'Maintainer', 'Contact', 'Description', 'Depends', 'Imports', 'Suggests', 'Enhances', 'Encoding', 'LazyData', 'LazyDataNote', 'ByteCompile', 'BuildResaveData', 'License', 'LicenseDetails', 'URL', 'Packaged', 'NeedsCompilation', 'Repository', 'Date/Publication', 'Built')), structure('UTF-8', .Names = 'Encoding')); .Internal(setEncoding(argv[[1]], argv[[2]])) Package "Matrix" Version "1.0-12" Date "2013-03-26" Priority "recommended" Title "Sparse and Dense Matrix Classes and Methods" Author "Douglas Bates and Martin Maechler\n " Maintainer "Martin Maechler " Contact "Doug and Martin " Description "Classes and methods for dense and sparse matrices and\n operations on them using Lapack and SuiteSparse." Depends "R (>= 2.15.0), stats, methods, utils, lattice" Imports "graphics, grid" Suggests "expm, MASS" Enhances "MatrixModels, graph, SparseM, sfsmisc" Encoding "UTF-8" LazyData "no" LazyDataNote "no longer available, since we use data/*.R *and* our\nclasses" ByteCompile "yes" BuildResaveData "no" License "GPL (>= 2)" LicenseDetails "The Matrix package includes libraries AMD, CHOLMOD,\nCOLAMD, CSparse and SPQR from the SuiteSparse collection of Tim\nDavis. All sections of that code are covered by the GPL or\nLGPL licenses. See the directory doc/UFsparse for details." URL "http://Matrix.R-forge.R-project.org/" Packaged "2013-03-26 15:38:54 UTC; maechler" NeedsCompilation "yes" Repository "CRAN" Date/Publication "2013-03-26 19:25:05" Built "R 3.0.1; x86_64-unknown-linux-gnu; 2013-12-07 03:52:11 UTC; unix" ##com.oracle.truffle.r.test.builtins.TestBuiltin_setHook.testsetHook1#Ignored.SideEffects# #argv <- structure(list(hookName = 'UserHook::stats4::onUnload', value = function(pkgname, ...) cat('onUnload', sQuote(pkgname), 'B', '\n')), .Names = c('hookName', 'value'));do.call('setHook', argv) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testSetS4Object# #{ x<-42; asS4(, TRUE, 1)) } Error: unexpected ')' in "{ x<-42; asS4(, TRUE, 1))" ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testSetS4Object# #{ x<-42; asS4(x, "TRUE") } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testSetS4Object# #{ x<-42; asS4(x, TRUE, "1") } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testSetS4Object# #{ x<-42; asS4(x, TRUE, c(1,2)) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testSetS4Object# #{ x<-42; asS4(x, TRUE, logical()) } Error in asS4(x, TRUE, logical()) : invalid 'complete' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testSetS4Object# #{ x<-42; asS4(x, c(TRUE, FALSE)) } Error in asS4(x, c(TRUE, FALSE)) : invalid 'flag' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testSetS4Object# #{ x<-42; asS4(x, logical()) } Error in asS4(x, logical()) : invalid 'flag' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object1#Ignored.Unstable# #argv <- list(structure('ObjectsWithPackage', class = structure('signature', package = 'methods'), .Names = '.Object', package = 'methods'), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) An object of class “signature” .Object "ObjectsWithPackage" ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object10#Ignored.ImplementationError# #argv <- list(structure(function (object) cat('I am a \'foo\'\n'), target = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), defined = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), generic = character(0), class = structure('MethodDefinition', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) Method Definition: function (object) cat("I am a 'foo'\n") Signatures: target defined ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object11#Ignored.OutputFormatting# #argv <- list(structure(function (x = 1, nrow, ncol) standardGeneric('diag'), generic = character(0), package = character(0), group = list(), valueClass = character(0), signature = character(0), default = quote(`\001NULL\001`), skeleton = quote(``()), class = structure('standardGeneric', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) standardGeneric for "" defined from package "" function (x = 1, nrow, ncol) standardGeneric("diag") Methods may be defined for arguments: Use showMethods("") for currently available ones. ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object12#Ignored.ImplementationError# #argv <- list(structure(list(`NA` = structure(function (object) cat('I am a \'foo\'\n'), target = structure('foo', .Names = 'object', package = 'myTst', class = structure('signature', package = 'methods')), defined = structure('foo', .Names = 'object', package = 'myTst', class = structure('signature', package = 'methods')), generic = structure('show', package = 'methods'), class = structure('MethodDefinition', package = 'methods'))), .Names = NA_character_, arguments = structure('object', simpleOnly = TRUE), signatures = list(), generic = structure(function (object) standardGeneric('show'), generic = structure('show', package = 'methods'), package = 'methods', group = list(), valueClass = character(0), signature = structure('object', simpleOnly = TRUE), default = structure(function (object) showDefault(object, FALSE), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'object', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'object', package = 'methods'), generic = structure('show', package = 'methods'), class = structure('derivedDefaultMethod', package = 'methods')), skeleton = quote((function (object) showDefault(object, FALSE))(object)), class = structure('standardGeneric', package = 'methods')), class = structure('listOfMethods', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) An object of class “listOfMethods” $ function (object) cat('I am a \'foo\'\n') attr(,"target") object "foo" attr(,"package") [1] "myTst" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"defined") object "foo" attr(,"package") [1] "myTst" attr(,"class") [1] "signature" attr(,"class")attr(,"package") [1] "methods" attr(,"generic") [1] "show" attr(,"generic")attr(,"package") [1] "methods" attr(,"class") [1] "MethodDefinition" attr(,"class")attr(,"package") [1] "methods" Slot arguments: [1] "object" attr(,"simpleOnly") [1] TRUE Slot signatures: list() Slot generic: Error in cat(class(object), " for \"", object@generic, "\" defined from package \"", : trying to get slot "generic" from an object (class "standardGeneric") that is not an S4 object ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object13#Ignored.OutputFormatting# #argv <- list(structure(function (x, type = c('O', 'I', 'F', 'M', '2')) { if (identical('2', type)) { svd(x, nu = 0L, nv = 0L)$d[1L] } else .Internal(La_dlange(x, type))}, target = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), defined = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), generic = character(0), class = structure('derivedDefaultMethod', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) Method Definition (Class "derivedDefaultMethod"): function (x, type = c("O", "I", "F", "M", "2")) { if (identical("2", type)) { svd(x, nu = 0L, nv = 0L)$d[1L] } else .Internal(La_dlange(x, type)) } Signatures: target defined ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object14#Ignored.OutputFormatting# #argv <- list(structure(function (x, y, ...) UseMethod('plot'), target = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), defined = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), generic = character(0), class = structure('derivedDefaultMethod', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) Method Definition (Class "derivedDefaultMethod"): function (x, y, ...) UseMethod("plot") Signatures: target defined ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object2#Ignored.OutputFormatting# #argv <- list(structure(function (x, ...) standardGeneric('toeplitz'), generic = character(0), package = character(0), group = list(), valueClass = character(0), signature = character(0), default = quote(`\001NULL\001`), skeleton = quote(``()), class = structure('standardGeneric', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) standardGeneric for "" defined from package "" function (x, ...) standardGeneric("toeplitz") Methods may be defined for arguments: Use showMethods("") for currently available ones. ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object3# #argv <- list(structure(character(0), package = character(0), class = structure('ObjectsWithPackage', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) An object of class "ObjectsWithPackage": Object: Package: ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object4#Ignored.OutputFormatting# #argv <- list(structure(function (qr, complete = FALSE, Dvec) standardGeneric('qr.Q'), generic = character(0), package = character(0), group = list(), valueClass = character(0), signature = character(0), default = quote(`\001NULL\001`), skeleton = quote(``()), class = structure('standardGeneric', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) standardGeneric for "" defined from package "" function (qr, complete = FALSE, Dvec) standardGeneric("qr.Q") Methods may be defined for arguments: Use showMethods("") for currently available ones. ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object5# #argv <- list(structure(c('nonStructure', 'ANY', 'ANY', 'ANY'), .Names = c(NA_character_, NA_character_, NA_character_, NA_character_), package = character(0), class = structure('signature', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) An object of class “signature” "nonStructure" "ANY" "ANY" "ANY" ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object6#Ignored.ImplementationError# #argv <- list(structure(function (x) .Internal(drop(x)), target = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), defined = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), generic = character(0), class = structure('derivedDefaultMethod', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) Method Definition (Class "derivedDefaultMethod"): function (x) .Internal(drop(x)) Signatures: target defined ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object7#Ignored.ImplementationError# #argv <- list(structure(function (x, y = NULL) .Internal(crossprod(x, y)), target = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), defined = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), generic = character(0), class = structure('derivedDefaultMethod', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) Method Definition (Class "derivedDefaultMethod"): function (x, y = NULL) .Internal(crossprod(x, y)) Signatures: target defined ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object8#Ignored.ImplementationError# #argv <- list(structure(function (x, i, j, ...) x@aa[[i]], target = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), defined = structure(character(0), .Names = character(0), package = character(0), class = structure('signature', package = 'methods')), generic = character(0), class = structure('MethodDefinition', package = 'methods')), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) Method Definition: function (x, i, j, ...) x@aa[[i]] Signatures: target defined ##com.oracle.truffle.r.test.builtins.TestBuiltin_setS4Object.testsetS4Object9# #argv <- list(numeric(0), TRUE, 0L); .Internal(setS4Object(argv[[1]], argv[[2]], argv[[3]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setSessionTimeLimit.testsetSessionTimeLimit1#Ignored.Unimplemented# #argv <- list(NULL, NULL); .Internal(setSessionTimeLimit(argv[[1]], argv[[2]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setSessionTimeLimit.testsetSessionTimeLimit2#Ignored.Unimplemented# #argv <- list(FALSE, Inf); .Internal(setSessionTimeLimit(argv[[1]], argv[[2]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setTimeLimit.testsetTimeLimit1# #argv <- list(FALSE, Inf, FALSE); .Internal(setTimeLimit(argv[[1]], argv[[2]], argv[[3]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setdiff.setdiff# #x <- c('a', 'b', 'x'); y <- c('a', 'y', 'z', 'x'); setdiff(x, y) [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_setdiff.testsetdiff1# #argv <- structure(list(x = c('bibtex', 'tex'), y = '.svn'), .Names = c('x', 'y'));do.call('setdiff', argv) [1] "bibtex" "tex" ##com.oracle.truffle.r.test.builtins.TestBuiltin_seterrmessage.testseterrmessage1# #argv <- list('Error in cor(rnorm(10), NULL) : \n supply both \'x\' and \'y\' or a matrix-like \'x\'\n'); .Internal(seterrmessage(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seterrmessage.testseterrmessage2# #argv <- list('Error in as.POSIXlt.character(x, tz, ...) : \n character string is not in a standard unambiguous format\n'); .Internal(seterrmessage(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_seterrmessage.testseterrmessage3# #argv <- list('Error in validObject(.Object) : \n invalid class “trackCurve” object: Unequal x,y lengths: 20, 10\n'); .Internal(seterrmessage(argv[[1]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testArgCasts# #set.seed('1234'); runif(1) [1] 0.1137034 ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testArgCasts#Output.IgnoreErrorMessage# #set.seed('hello world') Error in set.seed("hello world") : supplied seed is not a valid integer In addition: Warning message: In set.seed("hello world") : NAs introduced by coercion ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testArgCasts# #set.seed(FALSE) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testsetseed1#Ignored.Unimplemented# #argv <- list(1000, 0L, NULL); .Internal(set.seed(argv[[1]], argv[[2]], argv[[3]], NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testsetseed2#Ignored.Unimplemented# #argv <- list(77, 2L, NULL); .Internal(set.seed(argv[[1]], argv[[2]], argv[[3]], NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testsetseed3#Ignored.Unimplemented# #argv <- list(123, 6L, NULL); .Internal(set.seed(argv[[1]], argv[[2]], argv[[3]], NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testsetseed4#Ignored.Unimplemented# #argv <- list(77, 4L, NULL); .Internal(set.seed(argv[[1]], argv[[2]], argv[[3]], NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testsetseed5# #argv <- list(1000, 1L, NULL); .Internal(set.seed(argv[[1]], argv[[2]], argv[[3]], NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testsetseed6# #argv <- list(0, NULL, NULL); .Internal(set.seed(argv[[1]], argv[[2]], argv[[3]], NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testsetseed7#Ignored.Unimplemented# #argv <- list(123, 7L, NULL); .Internal(set.seed(argv[[1]], argv[[2]], argv[[3]], NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_setseed.testsetseed8# #argv <- list(NULL, NULL, NULL); .Internal(set.seed(argv[[1]], argv[[2]], argv[[3]], NULL)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_shQuote.testshQuote1# #argv <- structure(list(string = c('ABC', '\'123\'', 'a\'b'), type = 'cmd'), .Names = c('string', 'type'));do.call('shQuote', argv) [1] "\"ABC\"" "\"'123'\"" "\"a'b\"" ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testArgCasts# #.Internal(shortRowNames(42, '1')) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testArgCasts# #.Internal(shortRowNames(42, -2)) Error: invalid 'type' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testArgCasts# #.Internal(shortRowNames(42, 0)) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testArgCasts# #.Internal(shortRowNames(42, 1)) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testArgCasts# #.Internal(shortRowNames(42, 2)) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testArgCasts# #.Internal(shortRowNames(NULL, '0')) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testArgCasts# #.Internal(shortRowNames(NULL, '1')) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testArgCasts# #.Internal(shortRowNames(NULL, 0)) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testArgCasts# #.Internal(shortRowNames(NULL, 1)) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testArgCasts# #.Internal(shortRowNames(NULL, 2)) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames1# #argv <- list(structure(list(c(8.44399377410362, 28.4640218366572, 12.2441566485997)), row.names = c(NA, -3L), class = 'data.frame'), 1L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames11# #argv <- list(structure(list(age = c(40, 60, 80)), .Names = 'age', row.names = c(NA, -3L), class = 'data.frame'), 0L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] NA -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames12# #argv <- list(structure(list(surname = structure(integer(0), .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(integer(0), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(integer(0), .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = integer(0), class = 'data.frame'), 2L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames13# #argv <- list(structure(list(age = 1:65), .Names = 'age'), 0L); .Internal(shortRowNames(argv[[1]], argv[[2]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames14# #argv <- list(structure(list(variog = c(0.000474498531874882, 0.00702969158809408, 0.00702969158809408, 0.00398874346479977, 0.000383788683835002, 1.20172224431796e-06, 1.20172224431796e-06, 0.122905372955376, 0.378939119261529, 0.00604112083775904, 0.0365586576304611, 2.52242766079251e-05, 0.100345142776916, 0.00940165099100291, 0.149441544291522, 0.0295722090612792), dist = c(36, 36, 36, 36, 36, 36, 36, 36, 36, 36, 36, 36, 36, 36, 36, 36)), .Names = c('variog', 'dist'), row.names = c('2.16', '3.16', '4.16', '1.16', '8.16', '5.16', '6.16', '7.16', '11.16', '9.16', '10.16', '12.16', '13.16', '15.16', '14.16', '16.16'), class = c('Variogram', 'data.frame')), 2L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames15# #argv <- list(structure(list(age = c(-1, -0.959071428571429, -0.918142857142857, -0.877214285714286, -0.836285714285714, -0.795357142857143, -0.754428571428571, -0.7135, -0.672571428571429, -0.631642857142857, -0.590714285714286, -0.549785714285714, -0.508857142857143, -0.467928571428571, -0.427, -0.386071428571429, -0.345142857142857, -0.304214285714286, -0.263285714285714, -0.222357142857143, -0.181428571428571, -0.1405, -0.0995714285714285, -0.0586428571428571, -0.0177142857142856, 0.0232142857142859, 0.0641428571428573, 0.105071428571429, 0.146, 0.186928571428572, 0.227857142857143, 0.268785714285714, 0.309714285714286, 0.350642857142857, 0.391571428571429, 0.4325, 0.473428571428572, 0.514357142857143, 0.555285714285714, 0.596214285714286, 0.637142857142857, 0.678071428571429, 0.719, 0.759928571428572, 0.800857142857143, 0.841785714285714, 0.882714285714286, 0.923642857142857, 0.964571428571429, 1.0055), Subject = structure(c(25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L, 25L), .Label = c('10', '26', '25', '9', '2', '6', '7', '17', '16', '15', '8', '20', '1', '18', '5', '23', '11', '21', '3', '24', '22', '12', '13', '14', '19', '4'), class = 'factor')), .Names = c('age', 'Subject'), out.attrs = structure(list(dim = structure(c(50L, 26L), .Names = c('age', 'Subject')), dimnames = structure(list( age = c('age=-1.00000000', 'age=-0.95907143', 'age=-0.91814286', 'age=-0.87721429', 'age=-0.83628571', 'age=-0.79535714', 'age=-0.75442857', 'age=-0.71350000', 'age=-0.67257143', 'age=-0.63164286', 'age=-0.59071429', 'age=-0.54978571', 'age=-0.50885714', 'age=-0.46792857', 'age=-0.42700000', 'age=-0.38607143', 'age=-0.34514286', 'age=-0.30421429', 'age=-0.26328571', 'age=-0.22235714', 'age=-0.18142857', 'age=-0.14050000', 'age=-0.09957143', 'age=-0.05864286', 'age=-0.01771429', 'age= 0.02321429', 'age= 0.06414286', 'age= 0.10507143', 'age= 0.14600000', 'age= 0.18692857', 'age= 0.22785714', 'age= 0.26878571', 'age= 0.30971429', 'age= 0.35064286', 'age= 0.39157143', 'age= 0.43250000', 'age= 0.47342857', 'age= 0.51435714', 'age= 0.55528571', 'age= 0.59621429', 'age= 0.63714286', 'age= 0.67807143', 'age= 0.71900000', 'age= 0.75992857', 'age= 0.80085714', 'age= 0.84178571', 'age= 0.88271429', 'age= 0.92364286', 'age= 0.96457143', 'age= 1.00550000'), Subject = c('Subject=10', 'Subject=26', 'Subject=25', 'Subject=9', 'Subject=2', 'Subject=6', 'Subject=7', 'Subject=17', 'Subject=16', 'Subject=15', 'Subject=8', 'Subject=20', 'Subject=1', 'Subject=18', 'Subject=5', 'Subject=23', 'Subject=11', 'Subject=21', 'Subject=3', 'Subject=24', 'Subject=22', 'Subject=12', 'Subject=13', 'Subject=14', 'Subject=19', 'Subject=4')), .Names = c('age', 'Subject'))), .Names = c('dim', 'dimnames')), row.names = 1201:1250, class = 'data.frame'), 2L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 50 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames16# #argv <- list(structure(list(variog = structure(c('0.007239522', '0.014584634', '0.014207936', '0.018442267', '0.011128505', '0.019910082', '0.027072311', '0.034140379', '0.028320657', '0.037525507'), class = 'AsIs'), dist = structure(c(' 1', ' 6', ' 7', ' 8', '13', '14', '15', '20', '21', '22'), class = 'AsIs'), n.pairs = structure(c(' 16', ' 16', '144', ' 16', ' 16', '128', ' 16', ' 16', '112', ' 16'), .Dim = 10L, .Dimnames = structure(list(c('1', '6', '7', '8', '13', '14', '15', '20', '21', '22')), .Names = ''))), .Names = c('variog', 'dist', 'n.pairs'), row.names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10'), class = 'data.frame'), 2L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames17# #argv <- list(structure(list(GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962, Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551)), .Names = c('GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year', 'Employed'), row.names = 1947:1962, class = 'data.frame'), 0L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 1947 1948 1949 1950 1951 1952 1953 1954 1955 1956 1957 1958 1959 1960 1961 [16] 1962 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames18# #argv <- list(structure(list(surname = structure(c('McNeil', 'Ripley', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'AsIs'), nationality = structure(c('Australia', 'UK', 'UK', 'US', 'US', 'Australia'), class = 'AsIs'), deceased = structure(c('no', 'no', 'no', 'no', 'yes', 'no'), class = 'AsIs'), title = structure(c('Interactive Data Analysis', 'Spatial Statistics', 'Stochastic Simulation', 'LISP-STAT', 'Exploratory Data Analysis', 'Modern Applied Statistics ...'), class = 'AsIs'), other.author = structure(c(NA, NA, NA, NA, NA, 'Ripley'), class = 'AsIs')), .Names = c('surname', 'nationality', 'deceased', 'title', 'other.author'), row.names = c('1', '2', '3', '4', '5', '6'), class = 'data.frame'), 1L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames19# #argv <- list(structure(list(`cbind(X, M)` = structure(c(68, 42, 37, 24, 66, 33, 47, 23, 63, 29, 57, 19, 42, 30, 52, 43, 50, 23, 55, 47, 53, 27, 49, 29), .Dim = c(12L, 2L), .Dimnames = list(NULL, c('X', 'M'))), M.user = structure(c(1L, 1L, 2L, 2L, 1L, 1L, 2L, 2L, 1L, 1L, 2L, 2L), .Label = c('N', 'Y'), class = 'factor', contrasts = 'contr.treatment'), Temp = structure(c(2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L), .Label = c('High', 'Low'), class = 'factor', contrasts = 'contr.treatment')), .Names = c('cbind(X, M)', 'M.user', 'Temp'), terms = quote(cbind(X, M) ~ M.user + Temp + M.user:Temp), row.names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')), 2L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames2# #argv <- list(structure(list(y = c(-0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861), x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE), z = 1:10), .Names = c('y', 'x', 'z'), terms = quote(y ~ x * z - 1), row.names = c(NA, 10L), class = 'data.frame'), 2L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames20# #argv <- list(structure(list(height = numeric(0), weight = numeric(0)), .Names = c('height', 'weight'), row.names = integer(0), class = 'data.frame'), 0L); .Internal(shortRowNames(argv[[1]], argv[[2]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames21# #argv <- list(structure(list(A = c(1, NA, 1), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA_integer_, NA_integer_, NA_integer_), E = c(FALSE, NA, TRUE), F = c('abc', NA, 'def')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')), 2L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames22# #argv <- list(structure(list(Hair = structure(c(1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('Black', 'Brown', 'Red', 'Blond'), class = 'factor'), Eye = structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L), .Label = c('Brown', 'Blue', 'Hazel', 'Green'), class = 'factor'), Sex = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Male', 'Female'), class = 'factor')), .Names = c('Hair', 'Eye', 'Sex'), out.attrs = structure(list(dim = structure(c(4L, 4L, 2L), .Names = c('Hair', 'Eye', 'Sex')), dimnames = structure(list(Hair = c('Hair=Black', 'Hair=Brown', 'Hair=Red', 'Hair=Blond'), Eye = c('Eye=Brown', 'Eye=Blue', 'Eye=Hazel', 'Eye=Green'), Sex = c('Sex=Male', 'Sex=Female')), .Names = c('Hair', 'Eye', 'Sex'))), .Names = c('dim', 'dimnames')), class = 'data.frame', row.names = c(NA, -32L)), 1L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] -32 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames23# #argv <- list(structure(list(Df = c(NA, 1, 2), Deviance = c(12.2441566485997, 8.44399377410362, 11.9670615295804), AIC = c(73.9421143635373, 72.1419514890412, 77.665019244518)), .Names = c('Df', 'Deviance', 'AIC'), row.names = c('', 'Temp', 'Soft'), class = c('anova', 'data.frame'), heading = c('Single term additions', '\nModel:', 'cbind(X, M) ~ M.user')), 2L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames3# #argv <- list(structure(list(weight = c(4.17, 5.58), group = structure(c(1L, 1L), .Label = c('Ctl', 'Trt'), class = 'factor')), .Names = c('weight', 'group'), row.names = 1:2, class = 'data.frame'), 0L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames4# #argv <- list(structure(list(x = 1:3, y = structure(1:3, .Label = c('A', 'D', 'E'), class = 'factor'), z = c(6, 9, 10)), .Names = c('x', 'y', 'z'), row.names = c(NA, -3L), class = 'data.frame'), 0L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] NA -3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames5# #argv <- list(structure(list(c('4.1-0', '4.1-0', '4.1-0', '4.1-0', '4.1-0', '4.1-0', '4.0-3', '4.0-3', '4.0-3', '4.0-3', '4.0-3', '4.0-2', '4.0-2', '4.0-1', '4.0-1', '4.0-1', '4.0-1', '4.0-1', '4.0-1', '4.0-1', '4.0-1', '3.1-55', '3.1-55', '3.1-55', '3.1-54', '3.1-53', '3.1-53', '3.1-52', '3.1-51'), c(NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_), c(NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_), c('The C and R code has been reformatted for legibility.', 'The old compatibility function rpconvert() has been removed.', 'The cross-validation functions allow for user interrupt at the end\nof evaluating each split.', 'Variable Reliability in data set car90 is corrected to be an\nordered factor, as documented.', 'Surrogate splits are now considered only if they send two or more\ncases _with non-zero weight_ each way. For numeric/ordinal\nvariables the restriction to non-zero weights is new: for\ncategorical variables this is a new restriction.', 'Surrogate splits which improve only by rounding error over the\ndefault split are no longer returned. Where weights and missing\nvalues are present, the splits component for some of these was not\nreturned correctly.', 'A fit of class \'rpart\' now contains a component for variable\n‘importance’, which is reported by the summary() method.', 'The text() method gains a minlength argument, like the labels()\nmethod. This adds finer control: the default remains pretty =\nNULL, minlength = 1L.', 'The handling of fits with zero and fractional weights has been\ncorrected: the results may be slightly different (or even\nsubstantially different when the proportion of zero weights is\nlarge).', 'Some memory leaks have been plugged.', 'There is a second vignette, longintro.Rnw, a version of the\noriginal Mayo Tecnical Report on rpart.', 'Added dataset car90, a corrected version of the S-PLUS dataset\ncar.all (used with permission).', 'This version does not use paste0{} and so works with R 2.14.x.', 'Merged in a set of Splus code changes that had accumulated at Mayo\nover the course of a decade. The primary one is a change in how\nindexing is done in the underlying C code, which leads to a major\nspeed increase for large data sets. Essentially, for the lower\nleaves all our time used to be eaten up by bookkeeping, and this\nwas replaced by a different approach. The primary routine also\nuses .Call{} so as to be more memory efficient.', 'The other major change was an error for asymmetric loss matrices,\nprompted by a user query. With L=loss asymmetric, the altered\npriors were computed incorrectly - they were using L\' instead of L.\nUpshot - the tree would not not necessarily choose optimal splits\nfor the given loss matrix. Once chosen, splits were evaluated\ncorrectly. The printed “improvement” values are of course the\nwrong ones as well. It is interesting that for my little test\ncase, with L quite asymmetric, the early splits in the tree are\nunchanged - a good split still looks good.', 'Add the return.all argument to xpred.rpart().', 'Added a set of formal tests, i.e., cases with known answers to\nwhich we can compare.', 'Add a usercode vignette, explaining how to add user defined\nsplitting functions.', 'The class method now also returns the node probability.', 'Add the stagec data set, used in some tests.', 'The plot.rpart routine needs to store a value that will be visible\nto the rpartco routine at a later time. This is now done in an\nenvironment in the namespace.', 'Force use of registered symbols in R >= 2.16.0', 'Update Polish translations.', 'Work on message formats.', 'Add Polish translations', 'rpart, rpart.matrix: allow backticks in formulae.', 'tests/backtick.R: regession test', 'src/xval.c: ensure unused code is not compiled in.', 'Change description of margin in ?plot.rpart as suggested by Bill\nVenables.')), row.names = c(NA, -29L), class = 'data.frame'), 1L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] -29 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames6# #argv <- list(structure(list(c(101, 32741, 2147483621, 1.70141183460469e+38, 8.98846567431158e+307)), row.names = c(NA, -5L), class = 'data.frame'), 1L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] -5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames7# #argv <- list(structure(list(srcfile = '/home/lzhao/hg/r-instrumented/library/stats/R/stats', frow = 5139L, lrow = 5139L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L), class = 'data.frame'), 2L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames8# #argv <- list(structure(list(y = structure(c(8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536, 9.79424), .Tsp = c(1962.25, 1971.75, 4), class = 'ts'), lag.quarterly.revenue = c(8.79636, 8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536), price.index = c(4.70997, 4.70217, 4.68944, 4.68558, 4.64019, 4.62553, 4.61991, 4.61654, 4.61407, 4.60766, 4.60227, 4.5896, 4.57592, 4.58661, 4.57997, 4.57176, 4.56104, 4.54906, 4.53957, 4.51018, 4.50352, 4.4936, 4.46505, 4.44924, 4.43966, 4.42025, 4.4106, 4.41151, 4.3981, 4.38513, 4.3732, 4.3277, 4.32023, 4.30909, 4.30909, 4.30552, 4.29627, 4.27839, 4.27789), income.level = c(5.8211, 5.82558, 5.83112, 5.84046, 5.85036, 5.86464, 5.87769, 5.89763, 5.92574, 5.94232, 5.95365, 5.9612, 5.97805, 6.00377, 6.02829, 6.03475, 6.03906, 6.05046, 6.05563, 6.06093, 6.07103, 6.08018, 6.08858, 6.10199, 6.11207, 6.11596, 6.12129, 6.122, 6.13119, 6.14705, 6.15336, 6.15627, 6.16274, 6.17369, 6.16135, 6.18231, 6.18768, 6.19377, 6.2003), market.potential = c(12.9699, 12.9733, 12.9774, 12.9806, 12.9831, 12.9854, 12.99, 12.9943, 12.9992, 13.0033, 13.0099, 13.0159, 13.0212, 13.0265, 13.0351, 13.0429, 13.0497, 13.0551, 13.0634, 13.0693, 13.0737, 13.077, 13.0849, 13.0918, 13.095, 13.0984, 13.1089, 13.1169, 13.1222, 13.1266, 13.1356, 13.1415, 13.1444, 13.1459, 13.152, 13.1593, 13.1579, 13.1625, 13.1664)), .Names = c('y', 'lag.quarterly.revenue', 'price.index', 'income.level', 'market.potential'), row.names = c('1962.25', '1962.5', '1962.75', '1963', '1963.25', '1963.5', '1963.75', '1964', '1964.25', '1964.5', '1964.75', '1965', '1965.25', '1965.5', '1965.75', '1966', '1966.25', '1966.5', '1966.75', '1967', '1967.25', '1967.5', '1967.75', '1968', '1968.25', '1968.5', '1968.75', '1969', '1969.25', '1969.5', '1969.75', '1970', '1970.25', '1970.5', '1970.75', '1971', '1971.25', '1971.5', '1971.75'), class = 'data.frame'), 2L); .Internal(shortRowNames(argv[[1]], argv[[2]])) [1] 39 ##com.oracle.truffle.r.test.builtins.TestBuiltin_shortRowNames.testshortRowNames9# #argv <- list(structure(list(Topic = character(0), File = character(0), Title = character(0), Internal = character(0)), .Names = c('Topic', 'File', 'Title', 'Internal'), row.names = integer(0), class = 'data.frame'), 0L); .Internal(shortRowNames(argv[[1]], argv[[2]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign1# #argv <- list(29);sign(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign('1') Error in sign("1") : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign('1L') Error in sign("1L") : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign('a') Error in sign("a") : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign(1i) Error in sign(0+1i) : unimplemented complex function ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign(NA_real_) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign(NULL) Error in sign(NULL) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign(NaN) [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign(c(1, -1, FALSE)) [1] 1 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign(c(1, -1, FALSE, 1i)) Error in sign(c(1, -1, FALSE, 0+1i)) : unimplemented complex function ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign(c(FALSE)) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign(c(FALSE, TRUE)) [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign10# #sign(list(c(1, -1, FALSE))[[1]]) [1] 1 -1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign2# #argv <- list(-29);sign(argv[[1]]); [1] -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign3# #argv <- list(structure(-29.5, .Names = 'W'));sign(argv[[1]]); W -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign4# #argv <- list(c(2, 1.5));sign(argv[[1]]); [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign5# #argv <- list(structure(c(0.880860525591375, 0.639733585162877, 0.698114489497201, -0.163771828170666, 0.644716815673843, 0.434938037582636, -1.02532598809559, -0.414997803714266, 0.314897800466685, 0.824285322485286, 0.771220667991526, -1.0213685325144, 0.928795080183842, 0.819280413726459, -1.81676447087493, 0.750354069620072, 0.445075757764079, -0.708114061379466, 0.824862990562917, -0.538393491087728, 0.974198118249183, -1.44391305877857, -0.0570136982996023, -0.0628620473044737, 0.00599485749367468, 0.397443892596693, -0.670529694022941, -0.443694007369259, -1.60185734774623, -0.125754544304519, 0.726126214864875, -0.0167895964097286, -0.306643229540329, -0.216330373334122, -0.903891452322388, 0.326172148813803, -0.13510345952301, -0.897613228123322, 0.845413917001047, -0.831631251080141, 0.487109758044019, -2.39537135767952, -1.00899546383701, -0.15086268042785, 0.817762526779461, -0.0500097005975852, 0.489115737630558, -0.570402758036241, 0.837693310865448, 0.128079053272328, -0.543417844555625, -0.372441278809232, 0.0566412271335022, -0.292618377937407, 0.331718074329116, 0.424938499372394, 0.976537923557996, 0.463868773879129, -0.204612235294409, 0.635623103866607, 0.563790796039522, 0.102279312881195, -0.0139544456391161, 0.319200502078835, -0.348934065906413, 0.553375167400346, -0.448280809644608, -0.00983940055010783, -0.259698968965015, 0.919652420667434, -0.47355400612706, -0.135894354949879, -0.0129965646298911, 0.162878599329267, 0.243328472793848, -0.0718304876664265), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76')));sign(argv[[1]]); 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 26 1 1 1 -1 1 1 -1 -1 1 1 1 -1 1 1 -1 1 1 -1 1 -1 1 -1 -1 -1 1 1 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 -1 -1 -1 -1 1 -1 -1 -1 -1 1 -1 -1 1 -1 1 -1 -1 -1 1 -1 1 -1 1 1 -1 -1 53 54 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 73 74 75 76 1 -1 1 1 1 1 -1 1 1 1 -1 1 -1 1 -1 -1 -1 1 -1 -1 -1 1 1 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign6# #argv <- list(structure(c(-Inf, Inf, -Inf), .Dim = 3L, .Dimnames = list(c('73', '312', '674'))));sign(argv[[1]]); 73 312 674 -1 1 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign7# #argv <- list(c(NA, 2L, 2L));sign(argv[[1]]); [1] NA 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign8# #argv <- list(c(-2.3, -0.9, -0.0666666666666667, 0.275, 0.12, 0.216666666666667, -0.228571428571429, -0.35, -0.188888888888889, -1.77635683940025e-16, 0.0272727272727272, -0.108333333333333, -0.246153846153846));sign(argv[[1]]); [1] -1 -1 -1 1 1 1 -1 -1 -1 -1 1 -1 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sign.testsign9# #argv <- list(numeric(0));sign(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif("42.1234", 2) } Error in signif("42.1234", 2) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(0.0005551, 2) } [1] 0.00056 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(0.5549, 2) } [1] 0.55 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(0.555, -1) } [1] 0.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(0.555, 0) } [1] 0.6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(0.555, 2) } [1] 0.56 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(0.5551, 2) } [1] 0.56 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(1.234+2.345i, 2) } [1] 1.2+2.3i ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(42.1234, "2") } Error in signif(42.1234, "2") : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(42.1234, 1:2) } [1] 40 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(42.1234, 42+7i) } Error in signif(42.1234, 42 + (0+7i)) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(42.1234, as.raw(2)) } Error in signif(42.1234, as.raw(2)) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif#Output.IgnoreErrorMessage# #{ signif(42.1234, character()) } Error in signif(42.1234, character()) : invalid second argument of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(42.1234, matrix(1:2, nrow=1)) } [,1] [,2] [1,] 40 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(8.125, 3) } [1] 8.12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(8.175, 3) } [1] 8.18 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(Inf+2.345i, 2) } [1] Inf+2.3i ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(c(1.234, 2.345, 3.456, 4.567), c(1, NA)); } [1] 1 NA 3 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(c(1.234, NA, 3.456, 4.567), c(1, NA)); } [1] 1 NA 3 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(c(42.1234, 7.1234), 1) } [1] 40 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(c(42.1234, 7.1234), 1:2) } [1] 40.0 7.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(c(42.1234, 7.1234, 42.1234), c(1,2)) } [1] 40.0 7.1 40.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ signif(complex(re=1.234, im=2.345), 2) } [1] 1.2+2.3i ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ x<-42.1234; attr(x, "foo")<-"foo"; signif(x, 2) } [1] 42 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testSignif# #{ x<-FALSE; attr(x, "foo")<-"foo"; signif(x, 2) } [1] 0 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_signif.testsignif1#Ignored.ImplementationError# #argv <- list(structure(c(0, NaN, 0, 4.94065645841247e-324), class = 'integer64'));do.call('signif', argv) [1] 0.000000e+00 NaN 0.000000e+00 4.940656e-324 attr(,"class") [1] "integer64" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testTrigExp# #{ sin() } Error in sin() : 0 arguments passed to 'sin' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testTrigExp# #{ sin(1+1i) } [1] 1.298458+0.634964i ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testTrigExp# #{ sin(1.2) } [1] 0.9320391 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testTrigExp# #{ sin(c(0.3,0.6,0.9)) } [1] 0.2955202 0.5646425 0.7833269 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testsin1# #argv <- list(c(-6.28318530717959, -6.1261056745001, -5.96902604182061, -5.81194640914112, -5.65486677646163, -5.49778714378214, -5.34070751110265, -5.18362787842316, -5.02654824574367, -4.86946861306418, -4.71238898038469, -4.5553093477052, -4.39822971502571, -4.24115008234622, -4.08407044966673, -3.92699081698724, -3.76991118430775, -3.61283155162826, -3.45575191894877, -3.29867228626928, -3.14159265358979, -2.9845130209103, -2.82743338823081, -2.67035375555132, -2.51327412287183, -2.35619449019234, -2.19911485751286, -2.04203522483337, -1.88495559215388, -1.72787595947439, -1.5707963267949, -1.41371669411541, -1.25663706143592, -1.09955742875643, -0.942477796076938, -0.785398163397448, -0.628318530717959, -0.471238898038469, -0.314159265358979, -0.15707963267949, 0, 0.15707963267949, 0.314159265358979, 0.471238898038469, 0.628318530717959, 0.785398163397448, 0.942477796076938, 1.09955742875643, 1.25663706143592, 1.41371669411541, 1.5707963267949, 1.72787595947439, 1.88495559215388, 2.04203522483337, 2.19911485751286, 2.35619449019234, 2.51327412287183, 2.67035375555133, 2.82743338823081, 2.9845130209103, 3.14159265358979, 3.29867228626928, 3.45575191894877, 3.61283155162826, 3.76991118430775, 3.92699081698724, 4.08407044966673, 4.24115008234622, 4.39822971502571, 4.5553093477052, 4.71238898038469, 4.86946861306418, 5.02654824574367, 5.18362787842316, 5.34070751110265, 5.49778714378214, 5.65486677646163, 5.81194640914112, 5.96902604182061, 6.1261056745001, 6.28318530717959, 6.44026493985908, 6.59734457253857, 6.75442420521805, 6.91150383789754, 7.06858347057704, 7.22566310325652, 7.38274273593601, 7.5398223686155, 7.69690200129499, 7.85398163397448, 8.01106126665397, 8.16814089933346, 8.32522053201295, 8.48230016469244, 8.63937979737193, 8.79645943005142, 8.95353906273091, 9.1106186954104, 9.26769832808989, 9.42477796076938));sin(argv[[1]]); [1] -3.307784e-15 1.564345e-01 3.090170e-01 4.539905e-01 5.877853e-01 [6] 7.071068e-01 8.090170e-01 8.910065e-01 9.510565e-01 9.876883e-01 [11] 1.000000e+00 9.876883e-01 9.510565e-01 8.910065e-01 8.090170e-01 [16] 7.071068e-01 5.877853e-01 4.539905e-01 3.090170e-01 1.564345e-01 [21] -3.231089e-15 -1.564345e-01 -3.090170e-01 -4.539905e-01 -5.877853e-01 [26] -7.071068e-01 -8.090170e-01 -8.910065e-01 -9.510565e-01 -9.876883e-01 [31] -1.000000e+00 -9.876883e-01 -9.510565e-01 -8.910065e-01 -8.090170e-01 [36] -7.071068e-01 -5.877853e-01 -4.539905e-01 -3.090170e-01 -1.564345e-01 [41] 0.000000e+00 1.564345e-01 3.090170e-01 4.539905e-01 5.877853e-01 [46] 7.071068e-01 8.090170e-01 8.910065e-01 9.510565e-01 9.876883e-01 [51] 1.000000e+00 9.876883e-01 9.510565e-01 8.910065e-01 8.090170e-01 [56] 7.071068e-01 5.877853e-01 4.539905e-01 3.090170e-01 1.564345e-01 [61] 3.231089e-15 -1.564345e-01 -3.090170e-01 -4.539905e-01 -5.877853e-01 [66] -7.071068e-01 -8.090170e-01 -8.910065e-01 -9.510565e-01 -9.876883e-01 [71] -1.000000e+00 -9.876883e-01 -9.510565e-01 -8.910065e-01 -8.090170e-01 [76] -7.071068e-01 -5.877853e-01 -4.539905e-01 -3.090170e-01 -1.564345e-01 [81] 3.307784e-15 1.564345e-01 3.090170e-01 4.539905e-01 5.877853e-01 [86] 7.071068e-01 8.090170e-01 8.910065e-01 9.510565e-01 9.876883e-01 [91] 1.000000e+00 9.876883e-01 9.510565e-01 8.910065e-01 8.090170e-01 [96] 7.071068e-01 5.877853e-01 4.539905e-01 3.090170e-01 1.564345e-01 [101] 3.673940e-16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testsin2# #argv <- list(c(0.0156298141969641, 0.0312596283939283, 0.0468894425908924, 0.0625192567878566, 0.0781490709848207, 0.0937788851817849, 0.109408699378749, 0.125038513575713, 0.140668327772677, 0.156298141969641, 0.171927956166606, 0.18755777036357, 0.203187584560534, 0.218817398757498, 0.234447212954462, 0.250077027151426, 0.26570684134839, 0.281336655545355, 0.296966469742319, 0.312596283939283, 0.328226098136247, 0.343855912333211, 0.359485726530175, 0.375115540727139, 0.390745354924104, 0.406375169121068, 0.422004983318032, 0.437634797514996, 0.45326461171196, 0.468894425908924, 0.484524240105888, 0.500154054302853, 0.515783868499817, 0.531413682696781, 0.547043496893745, 0.562673311090709, 0.578303125287673, 0.593932939484637, 0.609562753681602, 0.625192567878566, 0.64082238207553, 0.656452196272494, 0.672082010469458, 0.687711824666422, 0.703341638863387, 0.718971453060351, 0.734601267257315, 0.750231081454279, 0.765860895651243, 0.781490709848207, 0.797120524045171, 0.812750338242136, 0.8283801524391, 0.844009966636064, 0.859639780833028, 0.875269595029992, 0.890899409226956, 0.90652922342392, 0.922159037620885, 0.937788851817849, 0.953418666014813, 0.969048480211777, 0.984678294408741, 1.00030810860571, 1.01593792280267, 1.03156773699963, 1.0471975511966, 1.06282736539356, 1.07845717959053, 1.09408699378749, 1.10971680798445, 1.12534662218142, 1.14097643637838, 1.15660625057535, 1.17223606477231, 1.18786587896927, 1.20349569316624, 1.2191255073632, 1.23475532156017, 1.25038513575713, 1.2660149499541, 1.28164476415106, 1.29727457834802, 1.31290439254499, 1.32853420674195, 1.34416402093892, 1.35979383513588, 1.37542364933284, 1.39105346352981, 1.40668327772677, 1.42231309192374, 1.4379429061207, 1.45357272031767, 1.46920253451463, 1.48483234871159, 1.50046216290856, 1.51609197710552, 1.53172179130249, 1.54735160549945, 1.56298141969641));sin(argv[[1]]); [1] 0.01562918 0.03125454 0.04687226 0.06247854 0.07806955 0.09364149 [7] 0.10919055 0.12471295 0.14020487 0.15566255 0.17108220 0.18646005 [13] 0.20179236 0.21707537 0.23230536 0.24747859 0.26259137 0.27764000 [19] 0.29262081 0.30753013 0.32236433 0.33711978 0.35179288 0.36638004 [25] 0.38087769 0.39528231 0.40959036 0.42379835 0.43790282 0.45190031 [31] 0.46578741 0.47956073 0.49321689 0.50675257 0.52016446 0.53344927 [37] 0.54660378 0.55962475 0.57250902 0.58525343 0.59785487 0.61031026 [43] 0.62261656 0.63477077 0.64676991 0.65861106 0.67029131 0.68180782 [49] 0.69315778 0.70433840 0.71534697 0.72618079 0.73683721 0.74731363 [55] 0.75760749 0.76771628 0.77763753 0.78736881 0.79690775 0.80625202 [61] 0.81539933 0.82434745 0.83309419 0.84163742 0.84997504 0.85810504 [67] 0.86602540 0.87373421 0.88122958 0.88850968 0.89557273 0.90241700 [73] 0.90904082 0.91544257 0.92162070 0.92757369 0.93330008 0.93879848 [79] 0.94406755 0.94910599 0.95391258 0.95848614 0.96282556 0.96692977 [85] 0.97079778 0.97442863 0.97782144 0.98097539 0.98388970 0.98656365 [91] 0.98899660 0.99118796 0.99313718 0.99484379 0.99630737 0.99752757 [97] 0.99850409 0.99923669 0.99972519 0.99996946 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testsin3# #argv <- list(c(0.560475646552213, 0.23017748948328, -1.55870831414912, -0.070508391424576, -0.129287735160946, -1.71506498688328, -0.460916205989202, 1.26506123460653, 0.686852851893526, 0.445661970099958, -1.22408179743946, -0.359813827057364, -0.400771450594052, -0.11068271594512, 0.555841134754075, -1.78691313680308, -0.497850478229239, 1.96661715662964, -0.701355901563686, 0.472791407727934, 1.06782370598685, 0.217974914658295, 1.02600444830724, 0.72889122929114, 0.625039267849257, 1.68669331074241, -0.837787044494525, -0.153373117836515, 1.13813693701195, -1.25381492106993, -0.426464221476814, 0.295071482992271, -0.895125661045022, -0.878133487533042, -0.821581081637487, -0.688640254100091, -0.553917653537589, 0.0619117105767217, 0.305962663739917, 0.380471001012383, 0.694706978920513, 0.207917278019599, 1.26539635156826, -2.16895596533851, -1.20796199830499, 1.12310858320335, 0.402884835299076, 0.466655353623219, -0.779965118336318, 0.0833690664718293, -0.253318513994755, 0.028546755348703, 0.0428704572913161, -1.36860228401446, 0.225770985659268, -1.51647060442954, 1.54875280423022, -0.584613749636069, -0.123854243844614, -0.215941568743973, -0.379639482759882, 0.502323453109302, 0.33320738366942, 1.01857538310709, 1.07179122647558, -0.303528641404258, -0.448209778629426, -0.0530042267305041, -0.922267467879738, -2.05008468562714, 0.491031166056535, 2.30916887564081, -1.00573852446226, 0.709200762582393, 0.688008616467358, -1.0255713696967, 0.284773007051009, 1.22071771225454, -0.18130347974915, 0.138891362439045, -0.00576418589988693, -0.38528040112633, 0.370660031792409, -0.644376548518833, 0.220486561818751, -0.331781963915697, -1.09683901314935, -0.435181490833803, 0.325931585531227, -1.14880761845109, -0.993503855962119, -0.54839695950807, -0.238731735111441, 0.627906076039371, -1.36065244853001, 0.600259587147127, -2.18733299301658, -1.53261062618519, 0.235700359100477));sin(argv[[1]]); [1] 0.531589132 0.228150335 -0.999926941 -0.070449985 -0.128927855 [6] -0.989611314 -0.444768889 0.953625952 0.634106808 0.431055287 [11] -0.940494222 -0.352099989 -0.390128779 -0.110456865 0.527657995 [16] -0.976737516 -0.477538050 0.922680391 -0.645254145 0.455373248 [21] 0.876153536 0.216252901 0.855235166 0.666042998 0.585129117 [26] 0.993291459 -0.743164232 -0.152772517 0.907853915 -0.950180641 [31] -0.413654302 0.290808244 -0.780287678 -0.769548286 -0.732223563 [36] -0.635487895 -0.526023105 0.061872166 0.301211270 0.371357830 [41] 0.640160356 0.206422483 0.953726766 -0.826373363 -0.934894605 [46] 0.901450446 0.392073827 0.449901777 -0.703254621 0.083272525 [51] -0.250617941 0.028542878 0.042857327 -0.979628330 0.223857848 [56] -0.998524721 0.999757051 -0.551877320 -0.123537835 -0.214267224 [61] -0.370585646 0.481463265 0.327075677 0.851361562 0.878059108 [66] -0.298889400 -0.433352838 -0.052979411 -0.796973251 -0.887323319 [71] 0.471535469 0.739564951 -0.844557651 0.651227452 0.635000074 [76] -0.855010647 0.280939608 0.939345753 -0.180311841 0.138445238 [81] -0.005764154 -0.375818997 0.362230719 -0.600700122 0.218704432 [86] -0.325728326 -0.889769099 -0.421574983 0.320191465 -0.912276219 [91] -0.837943373 -0.521319927 -0.236470522 0.587451519 -0.978000912 [96] 0.564856701 -0.815885890 -0.999271015 0.233524038 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testsin4# #argv <- list(c(-1.88495559215388, 0.628318530717959, -2.51327412287183, 5.02654824574367, 0.942477796076938, -2.51327412287183, 1.5707963267949, 2.19911485751286, 1.88495559215388, -0.942477796076938, 4.71238898038469, 1.25663706143592, -1.88495559215388, -6.91150383789755, 3.45575191894877, 0, 0, 2.82743338823081, 2.51327412287183, 1.88495559215388, 2.82743338823081, 2.51327412287183, 0.314159265358979, -6.28318530717959, 1.88495559215388, -0.314159265358979, -0.628318530717959, -4.71238898038469, -1.5707963267949, 1.25663706143592));sin(argv[[1]]); [1] -9.510565e-01 5.877853e-01 -5.877853e-01 -9.510565e-01 8.090170e-01 [6] -5.877853e-01 1.000000e+00 8.090170e-01 9.510565e-01 -8.090170e-01 [11] -1.000000e+00 9.510565e-01 -9.510565e-01 -5.877853e-01 -3.090170e-01 [16] 0.000000e+00 0.000000e+00 3.090170e-01 5.877853e-01 9.510565e-01 [21] 3.090170e-01 5.877853e-01 3.090170e-01 -3.307784e-15 9.510565e-01 [26] -3.090170e-01 -5.877853e-01 1.000000e+00 -1.000000e+00 9.510565e-01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testsin5# #argv <- list(structure(c(-0.416146836547142, -0.989992496600445, -0.653643620863612, 0.283662185463226, 0.960170286650366, -0.416146836547142, 0.283662185463226, -0.839071529076452, -0.275163338051597, 0.64691932232864, 0.283662185463226, -0.759687912858821, 0.914742357804531, -0.918282786212119, 0.776685982021631), .Dim = c(5L, 3L)));sin(argv[[1]]); [,1] [,2] [,3] [1,] -0.4042392 -0.4042392 0.2798734 [2,] -0.8360219 0.2798734 -0.6886952 [3,] -0.6080830 -0.7440231 0.7924055 [4,] 0.2798734 -0.2717041 -0.7945601 [5,] 0.8192892 0.6027311 0.7009196 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testsin6# #argv <- list(c(-0.560475646552213-0.710406563699301i, -0.23017748948328+0.25688370915653i, 1.55870831414912-0.24669187846237i, 0.070508391424576-0.347542599397733i, 0.129287735160946-0.951618567265016i, 1.71506498688328-0.04502772480892i, 0.460916205989202-0.784904469457076i, -1.26506123460653-1.66794193658814i, -0.686852851893526-0.380226520287762i, -0.445661970099958+0.918996609060766i, 1.22408179743946-0.57534696260839i, 0.359813827057364+0.607964322225033i, 0.40077145059405-1.61788270828916i, 0.11068271594512-0.055561965524539i, -0.555841134754075+0.519407203943462i, 1.78691313680308+0.30115336216671i, 0.497850478229239+0.105676194148943i, -1.96661715662964-0.64070600830538i, 0.701355901563686-0.849704346033582i, -0.47279140772793-1.02412879060491i, -1.06782370598685+0.11764659710013i, -0.217974914658295-0.947474614184802i, -1.02600444830724-0.49055744370067i, -0.72889122929114-0.256092192198247i, -0.62503926784926+1.84386200523221i, -1.68669331074241-0.65194990169546i, 0.837787044494525+0.235386572284857i, 0.153373117836515+0.077960849563711i, -1.13813693701195-0.96185663413013i, 1.25381492106993-0.0713080861236i, 0.42646422147681+1.44455085842335i, -0.295071482992271+0.451504053079215i, 0.895125661045022+0.04123292199294i, 0.878133487533042-0.422496832339625i, 0.82158108163749-2.05324722154052i, 0.68864025410009+1.13133721341418i, 0.55391765353759-1.46064007092482i, -0.061911710576722+0.739947510877334i, -0.30596266373992+1.90910356921748i, -0.38047100101238-1.4438931609718i, -0.694706978920513+0.701784335374711i, -0.207917278019599-0.262197489402468i, -1.26539635156826-1.57214415914549i, 2.16895596533851-1.51466765378175i, 1.20796199830499-1.60153617357459i, -1.12310858320335-0.5309065221703i, -0.40288483529908-1.4617555849959i, -0.466655353623219+0.687916772975828i, 0.77996511833632+2.10010894052567i, -0.08336906647183-1.28703047603518i, 0.253318513994755+0.787738847475178i, -0.028546755348703+0.76904224100091i, -0.042870457291316+0.332202578950118i, 1.36860228401446-1.00837660827701i, -0.225770985659268-0.119452606630659i, 1.51647060442954-0.28039533517025i, -1.54875280423022+0.56298953322048i, 0.584613749636069-0.372438756103829i, 0.123854243844614+0.976973386685621i, 0.215941568743973-0.374580857767014i, 0.37963948275988+1.05271146557933i, -0.5023234531093-1.04917700666607i, -0.33320738366942-1.26015524475811i, -1.01857538310709+3.2410399349424i, -1.07179122647558-0.41685758816043i, 0.303528641404258+0.298227591540715i, 0.448209778629426+0.636569674033849i, 0.053004226730504-0.483780625708744i, 0.922267467879738+0.516862044313609i, 2.05008468562714+0.36896452738509i, -0.491031166056535-0.215380507641693i, -2.30916887564081+0.06529303352532i, 1.00573852446226-0.03406725373846i, -0.70920076258239+2.12845189901618i, -0.688008616467358-0.741336096272828i, 1.0255713696967-1.09599626707466i, -0.284773007051009+0.037788399171079i, -1.22071771225454+0.31048074944314i, 0.18130347974915+0.436523478910183i, -0.138891362439045-0.458365332711106i, 0.00576418589989-1.06332613397119i, 0.38528040112633+1.26318517608949i, -0.370660031792409-0.349650387953555i, 0.644376548518833-0.865512862653374i, -0.220486561818751-0.236279568941097i, 0.331781963915697-0.197175894348552i, 1.09683901314935+1.10992028971364i, 0.435181490833803+0.084737292197196i, -0.325931585531227+0.754053785184521i, 1.14880761845109-0.49929201717226i, 0.993503855962119+0.214445309581601i, 0.54839695950807-0.324685911490835i, 0.238731735111441+0.094583528173571i, -0.627906076039371-0.895363357977542i, 1.36065244853001-1.31080153332797i, -0.60025958714713+1.99721338474797i, 2.18733299301658+0.60070882367242i, 1.53261062618519-1.25127136162494i, -0.235700359100477-0.611165916680421i, -1.02642090030678-1.18548008459731i));sin(argv[[1]]); [1] -0.6714669-0.6536207i -0.2357196+0.2528685i 1.0305078-0.0030123i [4] 0.0747477-0.3537003i 0.1918455-1.0926949i 0.9906147+0.0064758i [7] 0.5889542-0.7774355i -2.6176466-0.7694333i -0.6804988-0.3011441i [10] -0.6262572+0.9509856i 1.1004990-0.2064747i 0.4192009+0.6047396i [13] 1.0222780-2.2301204i 0.1106274-0.0552504i -0.6004495+0.4613221i [16] 1.0213651-0.0655594i 0.4802070+0.0930212i -1.1186303+0.2642860i [19] 0.8925467-0.7301295i -0.7157961-1.0797384i -0.8822238+0.0568403i [22] -0.3208011-1.0698066i -0.9602202-0.2645464i -0.6880032-0.1931174i [25] -1.8955573+2.4987893i -1.2119688+0.0808453i 0.7638477+0.1589577i [28] 0.1532370+0.0771238i -1.3612056-0.4684202i 0.9525974-0.0222456i [31] 0.9257168+1.8227323i -0.3209567+0.4468183i 0.7809511+0.0257952i [34] 0.8392596-0.2779004i 2.9001485-2.6101276i 1.0874470+1.0721520i [37] 1.1942840-1.7335258i -0.0795974+0.8077926i -1.0384637+3.1461791i [40] -0.8305728-1.8575147i -0.8043772+0.5844969i -0.2135587-0.2595002i [43] -2.3960311-0.6929598i 1.9699876+1.2186052i 2.4130722-0.8445558i [46] -1.0315048-0.2407695i -0.8910573-1.8774453i -0.5606200+0.6639787i [49] 2.9148155+2.8596121i -0.1623025-1.6671522i 0.3324813+0.8439521i [52] -0.0374077+0.8467758i -0.0452440+0.3380357i 1.5213423-0.2386070i [55] -0.2254569-0.1166982i 1.0380353-0.0154255i -1.1624265+0.0130753i [58] 0.5905974-0.3178163i 0.1873360+1.1312453i 0.2294758-0.3744977i [61] 0.5956053+1.1686232i -0.7716715-1.0978066i -0.6230103-1.5320116i [64] -10.8971778+6.6939382i -0.9554605-0.2053160i 0.3122798+0.2888324i [67] 0.5241599+0.6132301i 0.0593010-0.5021674i 0.9058186+0.3262792i [70] 0.9484094-0.1740340i -0.4825148-0.1914045i -0.7411420-0.0439790i [73] 0.8450478-0.0182453i -2.7745126+3.1428472i -0.8176307-0.6266081i [76] 1.4220403-0.6892218i -0.2811402+0.0362751i -0.9849863+0.1082052i [79] 0.1977658+0.4431354i -0.1532452-0.4700149i 0.0093417-1.2753198i [82] 0.7177054+1.5076910i -0.3845996-0.3325864i 0.8400972-0.7816417i [85] -0.2248378-0.2327108i 0.3320808-0.1876329i 1.4964589+0.6171888i [88] 0.4230894+0.0769312i -0.4156173+0.7840026i 1.0283700-0.2131010i [91] 0.8572845+0.1179341i 0.5490412-0.2819684i 0.2375290+0.0920381i [94] -0.8390818-0.8253499i 1.9456103-0.3587453i -2.1194009+2.9842059i [97] 0.9675728-0.3686073i 1.8890839-0.0612472i -0.2785120-0.6319604i [100] -1.5303405-0.7681922i ##com.oracle.truffle.r.test.builtins.TestBuiltin_sin.testsin7#Output.MissingWarning# #argv <- list(Inf);sin(argv[[1]]); [1] NaN Warning message: In sin(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinh.testsinh1# #argv <- list(FALSE);sinh(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinh.testsinh2# #argv <- list(c(-3, -2.96984924623116, -2.93969849246231, -2.90954773869347, -2.87939698492462, -2.84924623115578, -2.81909547738693, -2.78894472361809, -2.75879396984925, -2.7286432160804, -2.69849246231156, -2.66834170854271, -2.63819095477387, -2.60804020100502, -2.57788944723618, -2.54773869346734, -2.51758793969849, -2.48743718592965, -2.4572864321608, -2.42713567839196, -2.39698492462312, -2.36683417085427, -2.33668341708543, -2.30653266331658, -2.27638190954774, -2.24623115577889, -2.21608040201005, -2.18592964824121, -2.15577889447236, -2.12562814070352, -2.09547738693467, -2.06532663316583, -2.03517587939699, -2.00502512562814, -1.9748743718593, -1.94472361809045, -1.91457286432161, -1.88442211055276, -1.85427135678392, -1.82412060301508, -1.79396984924623, -1.76381909547739, -1.73366834170854, -1.7035175879397, -1.67336683417085, -1.64321608040201, -1.61306532663317, -1.58291457286432, -1.55276381909548, -1.52261306532663, -1.49246231155779, -1.46231155778894, -1.4321608040201, -1.40201005025126, -1.37185929648241, -1.34170854271357, -1.31155778894472, -1.28140703517588, -1.25125628140704, -1.22110552763819, -1.19095477386935, -1.1608040201005, -1.13065326633166, -1.10050251256281, -1.07035175879397, -1.04020100502513, -1.01005025125628, -0.979899497487437, -0.949748743718593, -0.919597989949749, -0.889447236180905, -0.859296482412061, -0.829145728643216, -0.798994974874372, -0.768844221105528, -0.738693467336684, -0.708542713567839, -0.678391959798995, -0.648241206030151, -0.618090452261307, -0.587939698492463, -0.557788944723618, -0.527638190954774, -0.49748743718593, -0.467336683417086, -0.437185929648241, -0.407035175879397, -0.376884422110553, -0.346733668341709, -0.316582914572864, -0.28643216080402, -0.256281407035176, -0.226130653266332, -0.195979899497488, -0.165829145728643, -0.135678391959799, -0.105527638190955, -0.0753768844221105, -0.0452261306532664, -0.0150753768844223, 0.0150753768844218, 0.0452261306532664, 0.0753768844221105, 0.105527638190955, 0.135678391959799, 0.165829145728643, 0.195979899497488, 0.226130653266332, 0.256281407035176, 0.28643216080402, 0.316582914572864, 0.346733668341709, 0.376884422110553, 0.407035175879397, 0.437185929648241, 0.467336683417085, 0.49748743718593, 0.527638190954774, 0.557788944723618, 0.587939698492462, 0.618090452261306, 0.648241206030151, 0.678391959798995, 0.708542713567839, 0.738693467336683, 0.768844221105527, 0.798994974874372, 0.829145728643216, 0.85929648241206, 0.889447236180904, 0.919597989949748, 0.949748743718593, 0.979899497487437, 1.01005025125628, 1.04020100502513, 1.07035175879397, 1.10050251256281, 1.13065326633166, 1.1608040201005, 1.19095477386935, 1.22110552763819, 1.25125628140704, 1.28140703517588, 1.31155778894472, 1.34170854271357, 1.37185929648241, 1.40201005025126, 1.4321608040201, 1.46231155778894, 1.49246231155779, 1.52261306532663, 1.55276381909548, 1.58291457286432, 1.61306532663317, 1.64321608040201, 1.67336683417085, 1.7035175879397, 1.73366834170854, 1.76381909547739, 1.79396984924623, 1.82412060301507, 1.85427135678392, 1.88442211055276, 1.91457286432161, 1.94472361809045, 1.9748743718593, 2.00502512562814, 2.03517587939698, 2.06532663316583, 2.09547738693467, 2.12562814070352, 2.15577889447236, 2.18592964824121, 2.21608040201005, 2.24623115577889, 2.27638190954774, 2.30653266331658, 2.33668341708543, 2.36683417085427, 2.39698492462312, 2.42713567839196, 2.4572864321608, 2.48743718592965, 2.51758793969849, 2.54773869346734, 2.57788944723618, 2.60804020100502, 2.63819095477387, 2.66834170854271, 2.69849246231156, 2.7286432160804, 2.75879396984925, 2.78894472361809, 2.81909547738693, 2.84924623115578, 2.87939698492462, 2.90954773869347, 2.93969849246231, 2.96984924623116, 3));sinh(argv[[1]]); [1] -10.01787493 -9.71883515 -9.42863112 -9.14699900 -8.87368276 [6] -8.60843391 -8.35101131 -8.10118091 -7.85871560 -7.62339494 [11] -7.39500498 -7.17333810 -6.95819276 -6.74937337 -6.54669009 [16] -6.34995864 -6.15900018 -5.97364108 -5.79371285 -5.61905189 [21] -5.44949942 -5.28490129 -5.12510786 -4.96997385 -4.81935823 [26] -4.67312406 -4.53113841 -4.39327218 -4.25940003 -4.12940026 [31] -4.00315469 -3.88054852 -3.76147031 -3.64581179 -3.53346781 [36] -3.42433623 -3.31831785 -3.21531627 -3.11523785 -3.01799161 [41] -2.92348914 -2.83164451 -2.74237425 -2.65559717 -2.57123440 [46] -2.48920923 -2.40944709 -2.33187547 -2.25642384 -2.18302361 [51] -2.11160805 -2.04211222 -1.97447296 -1.90862877 -1.84451977 [56] -1.78208770 -1.72127579 -1.66202876 -1.60429274 -1.54801524 [61] -1.49314509 -1.43963242 -1.38742858 -1.33648609 -1.28675865 [66] -1.23820106 -1.19076916 -1.14441983 -1.09911093 -1.05480128 [71] -1.01145058 -0.96901943 -0.92746926 -0.88676227 -0.84686148 [76] -0.80773060 -0.76933406 -0.73163695 -0.69460500 -0.65820453 [81] -0.62240247 -0.58716625 -0.55246385 -0.51826372 -0.48453475 [86] -0.45124630 -0.41836809 -0.38587023 -0.35372318 -0.32189772 [91] -0.29036490 -0.25909607 -0.22806279 -0.19723685 -0.16659022 [96] -0.13609505 -0.10572361 -0.07544828 -0.04524155 -0.01507595 [101] 0.01507595 0.04524155 0.07544828 0.10572361 0.13609505 [106] 0.16659022 0.19723685 0.22806279 0.25909607 0.29036490 [111] 0.32189772 0.35372318 0.38587023 0.41836809 0.45124630 [116] 0.48453475 0.51826372 0.55246385 0.58716625 0.62240247 [121] 0.65820453 0.69460500 0.73163695 0.76933406 0.80773060 [126] 0.84686148 0.88676227 0.92746926 0.96901943 1.01145058 [131] 1.05480128 1.09911093 1.14441983 1.19076916 1.23820106 [136] 1.28675865 1.33648609 1.38742858 1.43963242 1.49314509 [141] 1.54801524 1.60429274 1.66202876 1.72127579 1.78208770 [146] 1.84451977 1.90862877 1.97447296 2.04211222 2.11160805 [151] 2.18302361 2.25642384 2.33187547 2.40944709 2.48920923 [156] 2.57123440 2.65559717 2.74237425 2.83164451 2.92348914 [161] 3.01799161 3.11523785 3.21531627 3.31831785 3.42433623 [166] 3.53346781 3.64581179 3.76147031 3.88054852 4.00315469 [171] 4.12940026 4.25940003 4.39327218 4.53113841 4.67312406 [176] 4.81935823 4.96997385 5.12510786 5.28490129 5.44949942 [181] 5.61905189 5.79371285 5.97364108 6.15900018 6.34995864 [186] 6.54669009 6.74937337 6.95819276 7.17333810 7.39500498 [191] 7.62339494 7.85871560 8.10118091 8.35101131 8.60843391 [196] 8.87368276 9.14699900 9.42863112 9.71883515 10.01787493 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinh.testsinh3# #argv <- list(c(-0.560475646552213-0.710406563699301i, -0.23017748948328+0.25688370915653i, 1.55870831414912-0.24669187846237i, 0.070508391424576-0.347542599397733i, 0.129287735160946-0.951618567265016i, 1.71506498688328-0.04502772480892i, 0.460916205989202-0.784904469457076i, -1.26506123460653-1.66794193658814i, -0.686852851893526-0.380226520287762i, -0.445661970099958+0.918996609060766i, 1.22408179743946-0.57534696260839i, 0.359813827057364+0.607964322225033i, 0.40077145059405-1.61788270828916i, 0.11068271594512-0.055561965524539i, -0.555841134754075+0.519407203943462i, 1.78691313680308+0.30115336216671i, 0.497850478229239+0.105676194148943i, -1.96661715662964-0.64070600830538i, 0.701355901563686-0.849704346033582i, -0.47279140772793-1.02412879060491i, -1.06782370598685+0.11764659710013i, -0.217974914658295-0.947474614184802i, -1.02600444830724-0.49055744370067i, -0.72889122929114-0.256092192198247i, -0.62503926784926+1.84386200523221i, -1.68669331074241-0.65194990169546i, 0.837787044494525+0.235386572284857i, 0.153373117836515+0.077960849563711i, -1.13813693701195-0.96185663413013i, 1.25381492106993-0.0713080861236i, 0.42646422147681+1.44455085842335i, -0.295071482992271+0.451504053079215i, 0.895125661045022+0.04123292199294i, 0.878133487533042-0.422496832339625i, 0.82158108163749-2.05324722154052i, 0.68864025410009+1.13133721341418i, 0.55391765353759-1.46064007092482i, -0.061911710576722+0.739947510877334i, -0.30596266373992+1.90910356921748i, -0.38047100101238-1.4438931609718i, -0.694706978920513+0.701784335374711i, -0.207917278019599-0.262197489402468i, -1.26539635156826-1.57214415914549i, 2.16895596533851-1.51466765378175i, 1.20796199830499-1.60153617357459i, -1.12310858320335-0.5309065221703i, -0.40288483529908-1.4617555849959i, -0.466655353623219+0.687916772975828i, 0.77996511833632+2.10010894052567i, -0.08336906647183-1.28703047603518i, 0.253318513994755+0.787738847475178i, -0.028546755348703+0.76904224100091i, -0.042870457291316+0.332202578950118i, 1.36860228401446-1.00837660827701i, -0.225770985659268-0.119452606630659i, 1.51647060442954-0.28039533517025i, -1.54875280423022+0.56298953322048i, 0.584613749636069-0.372438756103829i, 0.123854243844614+0.976973386685621i, 0.215941568743973-0.374580857767014i, 0.37963948275988+1.05271146557933i, -0.5023234531093-1.04917700666607i, -0.33320738366942-1.26015524475811i, -1.01857538310709+3.2410399349424i, -1.07179122647558-0.41685758816043i, 0.303528641404258+0.298227591540715i, 0.448209778629426+0.636569674033849i, 0.053004226730504-0.483780625708744i, 0.922267467879738+0.516862044313609i, 2.05008468562714+0.36896452738509i, -0.491031166056535-0.215380507641693i, -2.30916887564081+0.06529303352532i, 1.00573852446226-0.03406725373846i, -0.70920076258239+2.12845189901618i, -0.688008616467358-0.741336096272828i, 1.0255713696967-1.09599626707466i, -0.284773007051009+0.037788399171079i, -1.22071771225454+0.31048074944314i, 0.18130347974915+0.436523478910183i, -0.138891362439045-0.458365332711106i, 0.00576418589989-1.06332613397119i, 0.38528040112633+1.26318517608949i, -0.370660031792409-0.349650387953555i, 0.644376548518833-0.865512862653374i, -0.220486561818751-0.236279568941097i, 0.331781963915697-0.197175894348552i, 1.09683901314935+1.10992028971364i, 0.435181490833803+0.084737292197196i, -0.325931585531227+0.754053785184521i, 1.14880761845109-0.49929201717226i, 0.993503855962119+0.214445309581601i, 0.54839695950807-0.324685911490835i, 0.238731735111441+0.094583528173571i, -0.627906076039371-0.895363357977542i, 1.36065244853001-1.31080153332797i, -0.60025958714713+1.99721338474797i, 2.18733299301658+0.60070882367242i, 1.53261062618519-1.25127136162494i, -0.235700359100477-0.611165916680421i, -1.02642090030678-1.18548008459731i));sinh(argv[[1]]); [1] -0.4474924-0.7572813i -0.2245956+0.2608280i 2.2023780-0.6059862i [4] 0.0663478-0.3414353i 0.0752434-0.8211715i 2.6858173-0.1291181i [7] 0.3377466-0.7831692i 0.1581511-1.9037473i -0.6891432-0.4621707i [10] -0.2793851+0.8752574i 1.3033980-1.0052915i 0.3017538+0.6085737i [13] -0.0193730-1.0801910i 0.1107377-0.0558739i -0.5077671+0.5750387i [16] 2.7711644+0.9104020i 0.5157792+0.1188237i -2.8084765-2.1777619i [19] 0.5019450-0.9435123i -0.2550369-0.9515307i -1.2737768+0.1908992i [22] -0.1282497-0.8313094i -1.0723595-0.7416176i -0.7692361-0.3236219i [25] 0.1797556+1.1572523i -2.0732875-1.6948365i 0.9133882+0.3199663i [28] 0.1535074+0.0787997i -0.8009497-1.4113979i 1.6050456-0.1349822i [31] 0.0553388+1.0836294i -0.2693725+0.4554521i 1.0186770+0.0588680i [34] 0.9078935-0.5785572i -0.4255265-1.2020367i 0.3166939+1.1281799i [37] 0.0640563-1.1503604i -0.0457513+0.6755418i 0.1031380+0.9878168i [40] -0.0493237-1.0646259i -0.5742583+0.8077330i -0.2022612-0.2648264i [43] 0.0021986-1.9133107i 0.2422041-4.4247418i -0.0468379-1.8218703i [46] -1.1853537-0.8606508i -0.0450396-1.0758342i -0.3737524+0.7053262i [49] -0.4349994+1.1392853i -0.0233681-0.9633461i 0.1806209+0.7316225i [52] -0.0205158+0.6957307i -0.0405390+0.3264257i 0.9799233-1.7698975i [55] -0.2260714-0.1222188i 2.0836345-0.6607894i -1.8998186+1.3124389i [58] 0.5760865-0.4278630i 0.0694779+0.8351727i 0.2025339-0.3744464i [61] 0.1925527+0.9321309i -0.2609601-0.9787192i -0.1037464-1.0054852i [64] 1.1981198-0.1553963i -1.1787142-0.6605768i 0.2946060+0.3074658i [67] 0.3726127+0.6551560i 0.0469436-0.4657828i 0.9203934+0.7196380i [70] 3.5628420+1.4240769i -0.4991960-0.2400061i -4.9727369+0.3316291i [73] 1.1833886-0.0527889i 0.4075698+1.0709758i -0.5484450-0.8415011i [76] 0.5554723-1.3995704i -0.2884316+0.0393217i -1.4733192+0.5628587i [79] 0.1652037+0.4297593i -0.1249554-0.4467576i 0.0028012-0.8739912i [82] 0.1195639+1.0246755i -0.3562612-0.3663726i 0.4472305-0.9250544i [85] -0.2161015-0.2398003i 0.3313553-0.2067823i 0.5916638+1.4906567i [88] 0.4474369+0.0927775i -0.2418067+0.7212853i 1.2455141-0.8310708i [91] 1.1385124+0.3267583i 0.5461895-0.3681950i 0.2399287+0.0971466i [94] -0.4188998-0.9394078i 0.4681657-2.0077889i 0.2634544+1.0794615i [97] 3.6293844+2.5502013i 0.6932968-2.3004637i -0.1948261-0.5898359i [100] -0.4571813-1.4592171i ##com.oracle.truffle.r.test.builtins.TestBuiltin_sink.testsink1#Ignored.SideEffects# #argv <- list(structure(2L, class = c('terminal', 'connection')), FALSE, FALSE, FALSE); .Internal(sink(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sink.testsink3#Ignored.SideEffects# #argv <- list(-1L, FALSE, FALSE, FALSE); .Internal(sink(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) Warning message: no sink to remove ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinknumber.testsinknumber1# #argv <- list(FALSE); .Internal(sink.number(argv[[1]])) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testTrigExp# #{ sinpi() } Error in sinpi() : 0 arguments passed to 'sinpi' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testTrigExp# #{ sinpi(1.2) } [1] -0.5877853 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testTrigExp# #{ sinpi(c(0,0.5,-0.5,1,-1,1.5,-1.5)) } [1] 0 1 -1 0 0 -1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testTrigExp# #{ sinpi(c(0.3,0.6,0.9)) } [1] 0.8090170 0.9510565 0.3090170 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testsin1# #argv <- list(c(-6.28318530717959, -6.1261056745001, -5.96902604182061, -5.81194640914112, -5.65486677646163, -5.49778714378214, -5.34070751110265, -5.18362787842316, -5.02654824574367, -4.86946861306418, -4.71238898038469, -4.5553093477052, -4.39822971502571, -4.24115008234622, -4.08407044966673, -3.92699081698724, -3.76991118430775, -3.61283155162826, -3.45575191894877, -3.29867228626928, -3.14159265358979, -2.9845130209103, -2.82743338823081, -2.67035375555132, -2.51327412287183, -2.35619449019234, -2.19911485751286, -2.04203522483337, -1.88495559215388, -1.72787595947439, -1.5707963267949, -1.41371669411541, -1.25663706143592, -1.09955742875643, -0.942477796076938, -0.785398163397448, -0.628318530717959, -0.471238898038469, -0.314159265358979, -0.15707963267949, 0, 0.15707963267949, 0.314159265358979, 0.471238898038469, 0.628318530717959, 0.785398163397448, 0.942477796076938, 1.09955742875643, 1.25663706143592, 1.41371669411541, 1.5707963267949, 1.72787595947439, 1.88495559215388, 2.04203522483337, 2.19911485751286, 2.35619449019234, 2.51327412287183, 2.67035375555133, 2.82743338823081, 2.9845130209103, 3.14159265358979, 3.29867228626928, 3.45575191894877, 3.61283155162826, 3.76991118430775, 3.92699081698724, 4.08407044966673, 4.24115008234622, 4.39822971502571, 4.5553093477052, 4.71238898038469, 4.86946861306418, 5.02654824574367, 5.18362787842316, 5.34070751110265, 5.49778714378214, 5.65486677646163, 5.81194640914112, 5.96902604182061, 6.1261056745001, 6.28318530717959, 6.44026493985908, 6.59734457253857, 6.75442420521805, 6.91150383789754, 7.06858347057704, 7.22566310325652, 7.38274273593601, 7.5398223686155, 7.69690200129499, 7.85398163397448, 8.01106126665397, 8.16814089933346, 8.32522053201295, 8.48230016469244, 8.63937979737193, 8.79645943005142, 8.95353906273091, 9.1106186954104, 9.26769832808989, 9.42477796076938));sinpi(argv[[1]]); [1] -0.77685322 -0.38589029 0.09715407 0.55701545 0.88396140 0.99997584 [7] 0.87737531 0.54541486 0.08330711 -0.39867944 -0.78553281 -0.98494177 [13] -0.94932321 -0.68717646 -0.26105516 0.22735931 0.66152114 0.93783031 [19] 0.99035374 0.80655823 0.43030122 -0.04863459 -0.51596517 -0.86017577 [25] -0.99913060 -0.89967217 -0.58553330 -0.13167406 0.35360535 0.75450718 [31] 0.97536797 0.96348575 0.72169585 0.30769437 -0.17972937 -0.62426595 [37] -0.91983974 -0.99592070 -0.83435434 -0.47369374 0.00000000 0.47369374 [43] 0.83435434 0.99592070 0.91983974 0.62426595 0.17972937 -0.30769437 [49] -0.72169585 -0.96348575 -0.97536797 -0.75450718 -0.35360535 0.13167406 [55] 0.58553330 0.89967217 0.99913060 0.86017577 0.51596517 0.04863459 [61] -0.43030122 -0.80655823 -0.99035374 -0.93783031 -0.66152114 -0.22735931 [67] 0.26105516 0.68717646 0.94932321 0.98494177 0.78553281 0.39867944 [73] -0.08330711 -0.54541486 -0.87737531 -0.99997584 -0.88396140 -0.55701545 [79] -0.09715407 0.38589029 0.77685322 0.98244287 0.95360130 0.69721069 [85] 0.27445115 -0.21379811 -0.65103072 -0.93291390 -0.99218449 -0.81469930 [91] -0.44280997 0.03474300 0.50400557 0.85300196 0.99845440 0.90565493 [97] 0.59674743 0.14544361 -0.34056606 -0.74530961 -0.97220684 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testsin2# #argv <- list(c(0.0156298141969641, 0.0312596283939283, 0.0468894425908924, 0.0625192567878566, 0.0781490709848207, 0.0937788851817849, 0.109408699378749, 0.125038513575713, 0.140668327772677, 0.156298141969641, 0.171927956166606, 0.18755777036357, 0.203187584560534, 0.218817398757498, 0.234447212954462, 0.250077027151426, 0.26570684134839, 0.281336655545355, 0.296966469742319, 0.312596283939283, 0.328226098136247, 0.343855912333211, 0.359485726530175, 0.375115540727139, 0.390745354924104, 0.406375169121068, 0.422004983318032, 0.437634797514996, 0.45326461171196, 0.468894425908924, 0.484524240105888, 0.500154054302853, 0.515783868499817, 0.531413682696781, 0.547043496893745, 0.562673311090709, 0.578303125287673, 0.593932939484637, 0.609562753681602, 0.625192567878566, 0.64082238207553, 0.656452196272494, 0.672082010469458, 0.687711824666422, 0.703341638863387, 0.718971453060351, 0.734601267257315, 0.750231081454279, 0.765860895651243, 0.781490709848207, 0.797120524045171, 0.812750338242136, 0.8283801524391, 0.844009966636064, 0.859639780833028, 0.875269595029992, 0.890899409226956, 0.90652922342392, 0.922159037620885, 0.937788851817849, 0.953418666014813, 0.969048480211777, 0.984678294408741, 1.00030810860571, 1.01593792280267, 1.03156773699963, 1.0471975511966, 1.06282736539356, 1.07845717959053, 1.09408699378749, 1.10971680798445, 1.12534662218142, 1.14097643637838, 1.15660625057535, 1.17223606477231, 1.18786587896927, 1.20349569316624, 1.2191255073632, 1.23475532156017, 1.25038513575713, 1.2660149499541, 1.28164476415106, 1.29727457834802, 1.31290439254499, 1.32853420674195, 1.34416402093892, 1.35979383513588, 1.37542364933284, 1.39105346352981, 1.40668327772677, 1.42231309192374, 1.4379429061207, 1.45357272031767, 1.46920253451463, 1.48483234871159, 1.50046216290856, 1.51609197710552, 1.53172179130249, 1.54735160549945, 1.56298141969641));sinpi(argv[[1]]); [1] 0.0490827803 0.0980472431 0.1467753560 0.1951496562 0.2430535342 [6] 0.2903715141 0.3369895325 0.3827952134 0.4276781389 0.4715301154 [11] 0.5142454346 0.5557211281 0.5958572158 0.6345569467 0.6717270325 [16] 0.7072778718 0.7411237668 0.7731831297 0.8033786789 0.8316376259 [21] 0.8578918505 0.8820780650 0.9041379667 0.9240183788 0.9416713780 [26] 0.9570544105 0.9701303944 0.9808678091 0.9892407713 0.9952290973 [31] 0.9988183519 0.9999998829 0.9987708421 0.9951341923 0.9890986998 [36] 0.9806789136 0.9698951303 0.9567733449 0.9413451884 0.9236478515 [41] 0.9037239950 0.8816216466 0.8573940857 0.8310997147 0.8028019179 [46] 0.7725689092 0.7404735675 0.7065932610 0.6710096605 0.6338085428 [51] 0.5950795840 0.5549161430 0.5134150367 0.4706763064 0.4268029770 [56] 0.3819008083 0.3360780401 0.2894451316 0.2421144948 0.1942002236 [61] 0.1458178187 0.0970839094 0.0481159724 -0.0009679516 -0.0500495423 [66] -0.0990104849 -0.1477327557 -0.1960989060 -0.2439923458 -0.2912976244 [71] -0.3379007092 -0.3836892599 -0.4285529000 -0.4723834825 -0.5150753506 [76] -0.5565255925 -0.5966342893 -0.6353047561 -0.6724437751 -0.7079618199 [81] -0.7417732718 -0.7737966257 -0.8039546872 -0.8321747579 -0.8583888114 [86] -0.8825336569 -0.9045510914 -0.9243880403 -0.9419966853 -0.9573345794 [91] -0.9703647495 -0.9810557855 -0.9893819159 -0.9953230698 -0.9988649258 [96] -0.9999989460 -0.9987223966 -0.9950383549 -0.9889557016 -0.9804890994 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testsin3# #argv <- list(c(0.560475646552213, 0.23017748948328, -1.55870831414912, -0.070508391424576, -0.129287735160946, -1.71506498688328, -0.460916205989202, 1.26506123460653, 0.686852851893526, 0.445661970099958, -1.22408179743946, -0.359813827057364, -0.400771450594052, -0.11068271594512, 0.555841134754075, -1.78691313680308, -0.497850478229239, 1.96661715662964, -0.701355901563686, 0.472791407727934, 1.06782370598685, 0.217974914658295, 1.02600444830724, 0.72889122929114, 0.625039267849257, 1.68669331074241, -0.837787044494525, -0.153373117836515, 1.13813693701195, -1.25381492106993, -0.426464221476814, 0.295071482992271, -0.895125661045022, -0.878133487533042, -0.821581081637487, -0.688640254100091, -0.553917653537589, 0.0619117105767217, 0.305962663739917, 0.380471001012383, 0.694706978920513, 0.207917278019599, 1.26539635156826, -2.16895596533851, -1.20796199830499, 1.12310858320335, 0.402884835299076, 0.466655353623219, -0.779965118336318, 0.0833690664718293, -0.253318513994755, 0.028546755348703, 0.0428704572913161, -1.36860228401446, 0.225770985659268, -1.51647060442954, 1.54875280423022, -0.584613749636069, -0.123854243844614, -0.215941568743973, -0.379639482759882, 0.502323453109302, 0.33320738366942, 1.01857538310709, 1.07179122647558, -0.303528641404258, -0.448209778629426, -0.0530042267305041, -0.922267467879738, -2.05008468562714, 0.491031166056535, 2.30916887564081, -1.00573852446226, 0.709200762582393, 0.688008616467358, -1.0255713696967, 0.284773007051009, 1.22071771225454, -0.18130347974915, 0.138891362439045, -0.00576418589988693, -0.38528040112633, 0.370660031792409, -0.644376548518833, 0.220486561818751, -0.331781963915697, -1.09683901314935, -0.435181490833803, 0.325931585531227, -1.14880761845109, -0.993503855962119, -0.54839695950807, -0.238731735111441, 0.627906076039371, -1.36065244853001, 0.600259587147127, -2.18733299301658, -1.53261062618519, 0.235700359100477));sinpi(argv[[1]]); [1] 0.98200615 0.66173002 0.98303955 -0.21970166 -0.39509329 0.78030274 [7] -0.99247134 -0.73976055 0.83259741 0.98546475 0.64725187 -0.90457787 [13] -0.95180265 -0.34075516 0.98465156 0.62054077 -0.99997720 -0.10468315 [19] -0.80650588 0.99634895 -0.21146582 0.63250912 -0.08160454 0.75241007 [25] 0.92383232 -0.83287492 -0.48783425 -0.46340680 -0.42047609 0.71553042 [31] -0.97343347 0.79981947 -0.32354390 -0.37357024 -0.53162633 -0.82947411 [37] -0.98568824 0.19327734 0.81988496 0.93032018 0.81867869 0.60772394 [43] -0.74046854 -0.50621551 0.60783550 -0.37718696 0.95381803 0.99451818 [49] -0.63750842 0.25892748 -0.71444011 0.08956211 0.13427472 0.91600189 [55] 0.65128794 0.99866158 -0.98829370 -0.96487690 -0.37935546 -0.62754845 [61] -0.92935895 0.99997336 0.86582749 -0.05832317 -0.22363154 -0.81548308 [67] -0.98679291 -0.16574922 -0.24178397 -0.15669723 0.99960307 0.82561013 [73] 0.01802713 0.79169146 0.83058082 0.08024845 0.77998434 -0.63915969 [79] -0.53927982 0.42262530 -0.01810773 -0.93575505 0.91857616 -0.89888753 [85] 0.63860103 -0.86357824 0.29955741 -0.97933827 0.85416569 0.45064963 [91] -0.02040682 -0.98846363 -0.68163720 0.92034729 0.90569788 0.95080419 [97] -0.55513391 0.99475666 0.67463825 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testsin4# #argv <- list(c(-1.88495559215388, 0.628318530717959, -2.51327412287183, 5.02654824574367, 0.942477796076938, -2.51327412287183, 1.5707963267949, 2.19911485751286, 1.88495559215388, -0.942477796076938, 4.71238898038469, 1.25663706143592, -1.88495559215388, -6.91150383789755, 3.45575191894877, 0, 0, 2.82743338823081, 2.51327412287183, 1.88495559215388, 2.82743338823081, 2.51327412287183, 0.314159265358979, -6.28318530717959, 1.88495559215388, -0.314159265358979, -0.628318530717959, -4.71238898038469, -1.5707963267949, 1.25663706143592));sinpi(argv[[1]]); [1] 0.35360535 0.91983974 -0.99913060 -0.08330711 0.17972937 -0.99913060 [7] -0.97536797 0.58553330 -0.35360535 -0.17972937 0.78553281 -0.72169585 [13] 0.35360535 -0.27445115 -0.99035374 0.00000000 0.00000000 0.51596517 [19] 0.99913060 -0.35360535 0.51596517 0.99913060 0.83435434 -0.77685322 [25] -0.35360535 -0.83435434 -0.91983974 -0.78553281 0.97536797 -0.72169585 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testsin5# #argv <- list(structure(c(-0.416146836547142, -0.989992496600445, -0.653643620863612, 0.283662185463226, 0.960170286650366, -0.416146836547142, 0.283662185463226, -0.839071529076452, -0.275163338051597, 0.64691932232864, 0.283662185463226, -0.759687912858821, 0.914742357804531, -0.918282786212119, 0.776685982021631), .Dim = c(5L, 3L)));sinpi(argv[[1]]); [,1] [,2] [,3] [1,] -0.96550186 -0.9655019 0.7777957 [2,] -0.03143432 0.7777957 -0.6852615 [3,] -0.88575154 -0.4843077 0.2646537 [4,] 0.77779571 -0.7607391 -0.2539115 [5,] 0.12480246 0.8953586 0.6454113 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testsin6# #argv <- list(c(-0.560475646552213-0.710406563699301i, -0.23017748948328+0.25688370915653i, 1.55870831414912-0.24669187846237i, 0.070508391424576-0.347542599397733i, 0.129287735160946-0.951618567265016i, 1.71506498688328-0.04502772480892i, 0.460916205989202-0.784904469457076i, -1.26506123460653-1.66794193658814i, -0.686852851893526-0.380226520287762i, -0.445661970099958+0.918996609060766i, 1.22408179743946-0.57534696260839i, 0.359813827057364+0.607964322225033i, 0.40077145059405-1.61788270828916i, 0.11068271594512-0.055561965524539i, -0.555841134754075+0.519407203943462i, 1.78691313680308+0.30115336216671i, 0.497850478229239+0.105676194148943i, -1.96661715662964-0.64070600830538i, 0.701355901563686-0.849704346033582i, -0.47279140772793-1.02412879060491i, -1.06782370598685+0.11764659710013i, -0.217974914658295-0.947474614184802i, -1.02600444830724-0.49055744370067i, -0.72889122929114-0.256092192198247i, -0.62503926784926+1.84386200523221i, -1.68669331074241-0.65194990169546i, 0.837787044494525+0.235386572284857i, 0.153373117836515+0.077960849563711i, -1.13813693701195-0.96185663413013i, 1.25381492106993-0.0713080861236i, 0.42646422147681+1.44455085842335i, -0.295071482992271+0.451504053079215i, 0.895125661045022+0.04123292199294i, 0.878133487533042-0.422496832339625i, 0.82158108163749-2.05324722154052i, 0.68864025410009+1.13133721341418i, 0.55391765353759-1.46064007092482i, -0.061911710576722+0.739947510877334i, -0.30596266373992+1.90910356921748i, -0.38047100101238-1.4438931609718i, -0.694706978920513+0.701784335374711i, -0.207917278019599-0.262197489402468i, -1.26539635156826-1.57214415914549i, 2.16895596533851-1.51466765378175i, 1.20796199830499-1.60153617357459i, -1.12310858320335-0.5309065221703i, -0.40288483529908-1.4617555849959i, -0.466655353623219+0.687916772975828i, 0.77996511833632+2.10010894052567i, -0.08336906647183-1.28703047603518i, 0.253318513994755+0.787738847475178i, -0.028546755348703+0.76904224100091i, -0.042870457291316+0.332202578950118i, 1.36860228401446-1.00837660827701i, -0.225770985659268-0.119452606630659i, 1.51647060442954-0.28039533517025i, -1.54875280423022+0.56298953322048i, 0.584613749636069-0.372438756103829i, 0.123854243844614+0.976973386685621i, 0.215941568743973-0.374580857767014i, 0.37963948275988+1.05271146557933i, -0.5023234531093-1.04917700666607i, -0.33320738366942-1.26015524475811i, -1.01857538310709+3.2410399349424i, -1.07179122647558-0.41685758816043i, 0.303528641404258+0.298227591540715i, 0.448209778629426+0.636569674033849i, 0.053004226730504-0.483780625708744i, 0.922267467879738+0.516862044313609i, 2.05008468562714+0.36896452738509i, -0.491031166056535-0.215380507641693i, -2.30916887564081+0.06529303352532i, 1.00573852446226-0.03406725373846i, -0.70920076258239+2.12845189901618i, -0.688008616467358-0.741336096272828i, 1.0255713696967-1.09599626707466i, -0.284773007051009+0.037788399171079i, -1.22071771225454+0.31048074944314i, 0.18130347974915+0.436523478910183i, -0.138891362439045-0.458365332711106i, 0.00576418589989-1.06332613397119i, 0.38528040112633+1.26318517608949i, -0.370660031792409-0.349650387953555i, 0.644376548518833-0.865512862653374i, -0.220486561818751-0.236279568941097i, 0.331781963915697-0.197175894348552i, 1.09683901314935+1.10992028971364i, 0.435181490833803+0.084737292197196i, -0.325931585531227+0.754053785184521i, 1.14880761845109-0.49929201717226i, 0.993503855962119+0.214445309581601i, 0.54839695950807-0.324685911490835i, 0.238731735111441+0.094583528173571i, -0.627906076039371-0.895363357977542i, 1.36065244853001-1.31080153332797i, -0.60025958714713+1.99721338474797i, 2.18733299301658+0.60070882367242i, 1.53261062618519-1.25127136162494i, -0.235700359100477-0.611165916680421i, -1.02642090030678-1.18548008459731i));sinpi(argv[[1]]); Error in sinpi(argv[[1]]) : unimplemented complex function ##com.oracle.truffle.r.test.builtins.TestBuiltin_sinpi.testsin7#Output.MissingWarning# #argv <- list(Inf);sinpi(argv[[1]]); [1] NaN Warning message: In sinpi(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_solve.testsolve1# #argv <- structure(list(a = structure(c(1, 0.5, 0, 0, 0, 0.5, 1, 0.5, 0, 0, 0, 0.5, 1, 0.5, 0, 0, 0, 0.5, 1, 0.5, 0, 0, 0, 0.5, 1), .Dim = c(5L, 5L))), .Names = 'a');do.call('solve', argv) [,1] [,2] [,3] [,4] [,5] [1,] 1.6666667 -1.3333333 1 -0.6666667 0.3333333 [2,] -1.3333333 2.6666667 -2 1.3333333 -0.6666667 [3,] 1.0000000 -2.0000000 3 -2.0000000 1.0000000 [4,] -0.6666667 1.3333333 -2 2.6666667 -1.3333333 [5,] 0.3333333 -0.6666667 1 -1.3333333 1.6666667 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testArgsCasts# #{ .Internal(sort(NULL, FALSE)) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testArgsCasts# #{ .Internal(sort(as.raw(c(0x44,0x40)), FALSE)) } Error: raw vectors cannot be sorted ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testArgsCasts# #{ .Internal(sort(c(1L,10L,2L), 'not-numeric')) } Error: 'decreasing' must be TRUE or FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testArgsCasts# #{ .Internal(sort(c(1L,10L,2L), NULL)) } Error: 'decreasing' must be TRUE or FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testArgsCasts# #{ lv<-list(a=5,b=c(1,2)); .Internal(sort(lv,FALSE)) } Error: only atomic vectors can be sorted ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort#Ignored.ImplementationError# #sort(c('FUN', 'simplify', 'USENAMES', 'X')) [1] "FUN" "simplify" "USENAMES" "X" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort# #{ .Internal(qsort(1, F)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort#Ignored.ImplementationError# #{ .Internal(qsort(1, decreased=NULL)) } $x [1] 1 $ix [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort# #{ .Internal(qsort(NULL, F)) } Error: argument is not a numeric vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort# #{ .Internal(qsort(NULL, NULL)) } Error: argument is not a numeric vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort# #{ .Internal(qsort(c(1), F)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort#Ignored.ImplementationError# #{ .Internal(qsort(c(4, 2, 3), 'a')) } $x [1] 2 3 4 $ix [1] 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort#Ignored.ImplementationError# #{ .Internal(qsort(c(4, 2, 3), 1)) } $x [1] 2 3 4 $ix [1] 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort#Ignored.ImplementationError# #{ .Internal(qsort(c(4, 2, 3), T)) } $x [1] 2 3 4 $ix [1] 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort#Ignored.ImplementationError# #{ .Internal(qsort(c(4, 2, 3), c('a'))) } $x [1] 2 3 4 $ix [1] 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort#Ignored.ImplementationError# #{ .Internal(qsort(c(4, 2, 3), list('a'))) } $x [1] 2 3 4 $ix [1] 2 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testQSort# #{ .Internal(qsort(list(1), F)) } Error: argument is not a numeric vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(3:1, index.return=TRUE) } $x [1] 1 2 3 $ix [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c("abc", "aba", "aa")) } [1] "aa" "aba" "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(1,2,0/0,NA)) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(1L,10L,2L)) } [1] 1 2 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(1L,10L,2L), method="quick") } [1] 1 2 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(2,1,0/0,NA), na.last=NA) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(3,10,2)) } [1] 2 3 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(3,NA,0/0,2), na.last=FALSE) } [1] NA NaN 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(3,NA,1,d=10), decreasing=FALSE, index.return=TRUE) } $x d 1 3 10 $ix [1] 2 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(a=0/0,b=1/0,c=3,d=NA),na.last=TRUE, decreasing=FALSE) } c b a d 3 Inf NaN NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(a=NA,b=NA,c=3,d=1),na.last=FALSE, decreasing=FALSE) } a b d c NA NA 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(a=NA,b=NA,c=3,d=1),na.last=TRUE, decreasing=TRUE) } c d a b 3 1 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testSort# #{ sort(c(a=NA,b=NA,c=3L,d=-1L),na.last=TRUE, decreasing=FALSE) } d c a b -1 3 NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort1# #argv <- list('x1', FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] "x1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort10# #argv <- list(c(0, 1, 2, 3, 4, 5, 10, 20, 0.5, 1.5, 2.5, 3.5, 4.5, 5.5, 10.5, 20.5), FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] 0.0 0.5 1.0 1.5 2.0 2.5 3.0 3.5 4.0 4.5 5.0 5.5 10.0 10.5 20.0 [16] 20.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort11# #argv <- list(c(-2.19467484932178, -1.98568521098019, -1.77669557263859, -1.567705934297, -1.35871629595541, -1.14972665761382, -0.940737019272223, -0.73174738093063, -0.522757742589037, -0.313768104247444, -0.104778465905851, 0.104211172435742, 0.313200810777335, 0.522190449118928, 0.731180087460521, 0.940169725802114, 1.14915936414371), FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] -2.1946748 -1.9856852 -1.7766956 -1.5677059 -1.3587163 -1.1497267 [7] -0.9407370 -0.7317474 -0.5227577 -0.3137681 -0.1047785 0.1042112 [13] 0.3132008 0.5221904 0.7311801 0.9401697 1.1491594 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort12# #argv <- list(numeric(0), FALSE); .Internal(sort(argv[[1]], argv[[2]])) numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort13# #argv <- list(c(3.2170141852258, 1.05106928690785, 1.66357940564162, 2.06079422122964, 4.14833588122863, 2.06378765307826, 2.36276370659185, 3.24215147884243, 2.83953129834327, 3.30869483883634, 5.46733964221407, 2.03767398891014, 2.85680802025857, 2.64551821042465, 4.67467308700083, 2.3927927372781, 3.08019075639266, 3.94941127449109, 2.10368712421998, 4.81745347591039, 3.83804007564263, 2.08807105063803, 3.61685546922612, 2.94897051693531, 3.47550643216271, 3.07230246315272, 4.23279369694672, 1.81117727446505, 2.63966096297246, 2.91308698241298, 2.16647893531705, 2.12232261640219, 3.14429741959172, 3.03010252731164, 0.612934885417947, 4.20285111588776, 3.41200339615357, 5.57848503331671, 3.84747589821948, 2.71531835120639, 5.95966880712648, 5.99450368408389, 1.9435658438782, 3.6313096161238, 2.95103074153623, 3.34932880672239, 3.38982038873719, 1.90037719729933, 3.44786724041094, 4.91152502331018, 2.99818765603358, 2.99935094946993, 4.56084966650585, 4.06067390085133, 1.51378284178709, 3.39083463343057, 4.81582489484611, 4.57755401008752, 3.58222926398261, 3.88349846728127, 1.9653424479797, 3.46240922704975, 2.20782872498056, 2.70425959207144, 4.09788134394798, 2.02538454847724, 3.42919591104144, 3.59060969963992, 3.21718963000801, 4.98446648200379, 2.13993033159313, 3.76840792160398, 3.07334709271771, 2.90144541633446, 3.62636889402076, 2.14187706948445, 1.84882674364997, 2.66779678468496, 4.91403480992383, 3.2180424347809, 3.49371205839627, 2.97243102249084, 3.6327703921222, 2.21059811715123, 4.32018812673702, 3.74698292040973, 2.35582483747667, 3.21683090598037, 3.8786092796675, 3.72000864222298, 4.64421167604526, 2.54928990527353, 4.27841427565877, 4.1988256701096, 2.99979452826552, 2.18635096734649, 2.07313246928386, 3.62006461811335, 3.09115092644749, 4.94138032701983), FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] 0.6129349 1.0510693 1.5137828 1.6635794 1.8111773 1.8488267 1.9003772 [8] 1.9435658 1.9653424 2.0253845 2.0376740 2.0607942 2.0637877 2.0731325 [15] 2.0880711 2.1036871 2.1223226 2.1399303 2.1418771 2.1664789 2.1863510 [22] 2.2078287 2.2105981 2.3558248 2.3627637 2.3927927 2.5492899 2.6396610 [29] 2.6455182 2.6677968 2.7042596 2.7153184 2.8395313 2.8568080 2.9014454 [36] 2.9130870 2.9489705 2.9510307 2.9724310 2.9981877 2.9993509 2.9997945 [43] 3.0301025 3.0723025 3.0733471 3.0801908 3.0911509 3.1442974 3.2168309 [50] 3.2170142 3.2171896 3.2180424 3.2421515 3.3086948 3.3493288 3.3898204 [57] 3.3908346 3.4120034 3.4291959 3.4478672 3.4624092 3.4755064 3.4937121 [64] 3.5822293 3.5906097 3.6168555 3.6200646 3.6263689 3.6313096 3.6327704 [71] 3.7200086 3.7469829 3.7684079 3.8380401 3.8474759 3.8786093 3.8834985 [78] 3.9494113 4.0606739 4.0978813 4.1483359 4.1988257 4.2028511 4.2327937 [85] 4.2784143 4.3201881 4.5608497 4.5775540 4.6442117 4.6746731 4.8158249 [92] 4.8174535 4.9115250 4.9140348 4.9413803 4.9844665 5.4673396 5.5784850 [99] 5.9596688 5.9945037 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort14# #argv <- list(c(2.17292368994844e-311, 4.34584737989688e-311, 8.69169475979376e-311, 1.73833895195875e-310, 3.4766779039175e-310, 6.953355807835e-310, 1.390671161567e-309, 2.781342323134e-309, 5.562684646268e-309, 1.1125369292536e-308, 2.2250738585072e-308, 4.4501477170144e-308, 8.90029543402881e-308, 1.78005908680576e-307, 2.2250738585072e-303, 2.2250738585072e-298, 1.79769313486232e+298, 1.79769313486232e+303, 2.24711641857789e+307, 4.49423283715579e+307, 8.98846567431158e+307, 1.79769313486232e+308, Inf, -Inf, Inf), FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] -Inf 2.172924e-311 4.345847e-311 8.691695e-311 1.738339e-310 [6] 3.476678e-310 6.953356e-310 1.390671e-309 2.781342e-309 5.562685e-309 [11] 1.112537e-308 2.225074e-308 4.450148e-308 8.900295e-308 1.780059e-307 [16] 2.225074e-303 2.225074e-298 1.797693e+298 1.797693e+303 2.247116e+307 [21] 4.494233e+307 8.988466e+307 Inf Inf Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort15# #argv <- list(structure(c(74, 68, 56, 57, 60, 71, 53, 61, 67, 70, 63, 49, 50, 58, 72, 69, 73, 48, 62, 65, 66, 64, 59, 76, 75, 40, 51, 81, 55, 42, 44, 54, 80, 77, 47, 82, 46, 43, 39, 45, 52, 41), .Dim = c(42L, 1L), .Dimnames = list(c('1', '2', '3', '4', '5', '8', '9', '10', '16', '17', '18', '22', '23', '24', '25', '31', '32', '33', '36', '37', '38', '40', '43', '46', '61', '74', '77', '79', '82', '83', '84', '107', '113', '129', '133', '149', '168', '174', '182', '186', '192', '217'), 'age')), FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 55 56 57 58 59 60 61 62 63 [26] 64 65 66 67 68 69 70 71 72 73 74 75 76 77 80 81 82 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort17# #argv <- structure(list(x = c(2.14210348343477, 2.73273128271103, 2.99806873407215, -0.528692848049104, -2.21930913347751, 0.327189480420202, -0.761920109856874, -1.45133259287104, 2.58289965474978, 0.882365602534264, -0.678148102015257, 2.09740992262959, 1.11015366297215, 2.70643682219088, 0.185772243887186, -2.38685618760064, -2.97262442205101, 0.473321800120175, -1.20133379939944, 1.63897713040933, -1.89173630112782, 1.73645787220448, -0.0272455788217485, -0.0804266170598567, 2.78059691889212, -2.11383658647537, 0.0939270523376763, -0.390122111421078, -2.80329246399924, 1.61059647146612, 2.74780045822263, -0.0192620046436787, 0.0169407553039491, -1.57991883857176, 1.76223263237625, -2.21499892836437, 0.367137833498418, -0.284903160296381, 2.52876619063318, 0.633825332857668, 0.613207478541881, 2.08658177917823, -2.96446485584602, -2.07629728876054, 0.46877646446228, 1.88368982356042, 0.416373030748218, 1.91595612186939, -2.8897425387986, -0.625228523276746, 0.134519706945866, -0.416335945017636, -2.52922565164044, 0.17425535665825, -1.39055569516495, -0.423170546069741, 2.93497854005545, -1.64256255235523, 0.708815339952707, -2.20641956990585, 1.95717442128807, -2.05757057340816, 2.76040208246559, 2.2406962341629, -1.68299576221034, -1.50189629523084, 1.54184397496283, 0.0106206983327866, -0.644365496467799, 1.71497052256018, -2.21753972489387, -0.272966742049903, -0.0741098136641085, 2.63908819807693, 2.97978561837226, -1.19580693589523, -0.940262471325696, 0.556911027990282, -2.33519576629624, -0.223178054206073, 2.98530492978171, -2.27890933351591, 2.41673697670922, -2.31641680374742, -0.397401746828109, -1.83408120274544, -0.934458317700773, -2.91743992455304, -0.452570331282914, -1.79014129796997, -2.82882511569187, 1.8992390432395, 1.25369117455557, -2.21495646424592, -2.45502642402425, -2.67720098560676, -1.5648388476111, -0.0616166163235903, 2.89307818282396, -2.87064984021708)), .Names = 'x');do.call('sort', argv) [1] -2.97262442 -2.96446486 -2.91743992 -2.88974254 -2.87064984 -2.82882512 [7] -2.80329246 -2.67720099 -2.52922565 -2.45502642 -2.38685619 -2.33519577 [13] -2.31641680 -2.27890933 -2.21930913 -2.21753972 -2.21499893 -2.21495646 [19] -2.20641957 -2.11383659 -2.07629729 -2.05757057 -1.89173630 -1.83408120 [25] -1.79014130 -1.68299576 -1.64256255 -1.57991884 -1.56483885 -1.50189630 [31] -1.45133259 -1.39055570 -1.20133380 -1.19580694 -0.94026247 -0.93445832 [37] -0.76192011 -0.67814810 -0.64436550 -0.62522852 -0.52869285 -0.45257033 [43] -0.42317055 -0.41633595 -0.39740175 -0.39012211 -0.28490316 -0.27296674 [49] -0.22317805 -0.08042662 -0.07410981 -0.06161662 -0.02724558 -0.01926200 [55] 0.01062070 0.01694076 0.09392705 0.13451971 0.17425536 0.18577224 [61] 0.32718948 0.36713783 0.41637303 0.46877646 0.47332180 0.55691103 [67] 0.61320748 0.63382533 0.70881534 0.88236560 1.11015366 1.25369117 [73] 1.54184397 1.61059647 1.63897713 1.71497052 1.73645787 1.76223263 [79] 1.88368982 1.89923904 1.91595612 1.95717442 2.08658178 2.09740992 [85] 2.14210348 2.24069623 2.41673698 2.52876619 2.58289965 2.63908820 [91] 2.70643682 2.73273128 2.74780046 2.76040208 2.78059692 2.89307818 [97] 2.93497854 2.97978562 2.98530493 2.99806873 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort18# #argv <- structure(list(x = structure(c(8092, 8092, 8048, 8093, 8066), origin = structure(c(1, 1, 1970), .Names = c('month', 'day', 'year')), class = c('dates', 'times'))), .Names = 'x');do.call('sort', argv) [1] 8048 8066 8092 8092 8093 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort2# #argv <- list(1:10, TRUE); .Internal(sort(argv[[1]], argv[[2]])) [1] 10 9 8 7 6 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort3# #argv <- list(c(1L, 2L, 3L, 153L, 4L, 154L, 303L, 452L, 5L, 155L, 304L, 453L, 6L, 156L, 305L, 454L, 7L, 157L, 306L, 455L, 8L, 158L, 307L, 456L, 9L, 159L, 308L, 457L, 10L, 160L, 309L, 458L, 11L, 161L, 310L, 459L, 12L, 162L, 311L, 460L, 13L, 163L, 312L, 461L, 14L, 164L, 313L, 462L, 15L, 165L, 314L, 463L, 16L, 166L, 315L, 464L, 17L, 167L, 316L, 465L, 18L, 168L, 317L, 466L, 19L, 169L, 318L, 467L, 20L, 170L, 319L, 468L, 21L, 171L, 320L, 469L, 22L, 172L, 321L, 470L, 23L, 173L, 322L, 471L, 24L, 174L, 323L, 472L, 25L, 175L, 324L, 473L, 26L, 176L, 325L, 474L, 27L, 177L, 326L, 475L, 28L, 178L, 327L, 476L, 29L, 179L, 328L, 477L, 30L, 180L, 329L, 478L, 31L, 181L, 330L, 479L, 32L, 182L, 331L, 480L, 33L, 183L, 332L, 481L, 34L, 184L, 333L, 482L, 35L, 185L, 334L, 483L, 36L, 186L, 335L, 484L, 37L, 187L, 336L, 485L, 38L, 188L, 337L, 486L, 39L, 189L, 338L, 487L, 40L, 190L, 339L, 488L, 41L, 191L, 340L, 489L, 42L, 192L, 341L, 490L, 43L, 193L, 342L, 491L, 44L, 194L, 343L, 492L, 45L, 195L, 344L, 493L, 46L, 196L, 345L, 494L, 47L, 197L, 346L, 495L, 48L, 198L, 347L, 496L, 49L, 199L, 348L, 497L, 50L, 200L, 349L, 498L, 51L, 201L, 350L, 499L, 52L, 202L, 351L, 500L, 53L, 203L, 352L, 501L, 54L, 204L, 353L, 502L, 55L, 205L, 354L, 503L, 56L, 206L, 355L, 504L, 57L, 207L, 356L, 505L, 58L, 208L, 357L, 506L, 59L, 209L, 358L, 507L, 60L, 210L, 359L, 508L, 61L, 211L, 360L, 509L, 62L, 212L, 361L, 510L, 63L, 213L, 362L, 511L, 64L, 214L, 363L, 512L, 65L, 215L, 364L, 513L, 66L, 216L, 365L, 514L, 67L, 217L, 366L, 515L, 68L, 218L, 367L, 516L, 69L, 219L, 368L, 517L, 70L, 220L, 369L, 518L, 71L, 221L, 370L, 519L, 72L, 222L, 371L, 520L, 73L, 223L, 372L, 521L, 74L, 224L, 373L, 522L, 75L, 225L, 374L, 523L, 76L, 226L, 375L, 524L, 77L, 227L, 376L, 525L, 78L, 228L, 377L, 526L, 79L, 229L, 378L, 527L, 80L, 230L, 379L, 528L, 81L, 231L, 380L, 529L, 82L, 232L, 381L, 530L, 83L, 233L, 382L, 531L, 84L, 234L, 383L, 532L, 85L, 235L, 384L, 533L, 86L, 236L, 385L, 534L, 87L, 237L, 386L, 535L, 88L, 238L, 387L, 536L, 89L, 239L, 388L, 537L, 90L, 240L, 389L, 538L, 91L, 241L, 390L, 539L, 92L, 242L, 391L, 540L, 93L, 243L, 392L, 541L, 94L, 244L, 393L, 542L, 95L, 245L, 394L, 543L, 96L, 246L, 395L, 544L, 97L, 247L, 396L, 545L, 98L, 248L, 397L, 546L, 99L, 249L, 398L, 547L, 100L, 250L, 399L, 548L, 101L, 251L, 400L, 549L, 102L, 252L, 401L, 550L, 103L, 253L, 402L, 551L, 104L, 254L, 403L, 552L, 105L, 255L, 404L, 553L, 106L, 256L, 405L, 554L, 107L, 257L, 406L, 555L, 108L, 258L, 407L, 556L, 109L, 259L, 408L, 557L, 110L, 260L, 409L, 558L, 111L, 261L, 410L, 559L, 112L, 262L, 411L, 560L, 113L, 263L, 412L, 561L, 114L, 264L, 413L, 562L, 115L, 265L, 414L, 563L, 116L, 266L, 415L, 564L, 117L, 267L, 416L, 565L, 118L, 268L, 417L, 566L, 119L, 269L, 418L, 567L, 120L, 270L, 419L, 568L, 121L, 271L, 420L, 569L, 122L, 272L, 421L, 570L, 123L, 273L, 422L, 571L, 124L, 274L, 423L, 572L, 125L, 275L, 424L, 573L, 126L, 276L, 425L, 574L, 127L, 277L, 426L, 575L, 128L, 278L, 427L, 576L, 129L, 279L, 428L, 577L, 130L, 280L, 429L, 578L, 131L, 281L, 430L, 579L, 132L, 282L, 431L, 580L, 133L, 283L, 432L, 581L, 134L, 284L, 433L, 582L, 135L, 285L, 434L, 583L, 136L, 286L, 435L, 584L, 137L, 287L, 436L, 585L, 138L, 288L, 437L, 586L, 139L, 289L, 438L, 587L, 140L, 290L, 439L, 588L, 141L, 291L, 440L, 589L, 142L, 292L, 441L, 590L, 143L, 293L, 442L, 591L, 144L, 294L, 443L, 592L, 145L, 295L, 444L, 593L, 146L, 296L, 445L, 594L, 147L, 297L, 446L, 595L, 148L, 298L, 447L, 596L, 149L, 299L, 448L, 597L, 150L, 300L, 449L, 598L, 151L, 301L, 450L, 599L, 152L, 302L, 451L, 600L), FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 [19] 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 [37] 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 [55] 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 [73] 73 74 75 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 [91] 91 92 93 94 95 96 97 98 99 100 101 102 103 104 105 106 107 108 [109] 109 110 111 112 113 114 115 116 117 118 119 120 121 122 123 124 125 126 [127] 127 128 129 130 131 132 133 134 135 136 137 138 139 140 141 142 143 144 [145] 145 146 147 148 149 150 151 152 153 154 155 156 157 158 159 160 161 162 [163] 163 164 165 166 167 168 169 170 171 172 173 174 175 176 177 178 179 180 [181] 181 182 183 184 185 186 187 188 189 190 191 192 193 194 195 196 197 198 [199] 199 200 201 202 203 204 205 206 207 208 209 210 211 212 213 214 215 216 [217] 217 218 219 220 221 222 223 224 225 226 227 228 229 230 231 232 233 234 [235] 235 236 237 238 239 240 241 242 243 244 245 246 247 248 249 250 251 252 [253] 253 254 255 256 257 258 259 260 261 262 263 264 265 266 267 268 269 270 [271] 271 272 273 274 275 276 277 278 279 280 281 282 283 284 285 286 287 288 [289] 289 290 291 292 293 294 295 296 297 298 299 300 301 302 303 304 305 306 [307] 307 308 309 310 311 312 313 314 315 316 317 318 319 320 321 322 323 324 [325] 325 326 327 328 329 330 331 332 333 334 335 336 337 338 339 340 341 342 [343] 343 344 345 346 347 348 349 350 351 352 353 354 355 356 357 358 359 360 [361] 361 362 363 364 365 366 367 368 369 370 371 372 373 374 375 376 377 378 [379] 379 380 381 382 383 384 385 386 387 388 389 390 391 392 393 394 395 396 [397] 397 398 399 400 401 402 403 404 405 406 407 408 409 410 411 412 413 414 [415] 415 416 417 418 419 420 421 422 423 424 425 426 427 428 429 430 431 432 [433] 433 434 435 436 437 438 439 440 441 442 443 444 445 446 447 448 449 450 [451] 451 452 453 454 455 456 457 458 459 460 461 462 463 464 465 466 467 468 [469] 469 470 471 472 473 474 475 476 477 478 479 480 481 482 483 484 485 486 [487] 487 488 489 490 491 492 493 494 495 496 497 498 499 500 501 502 503 504 [505] 505 506 507 508 509 510 511 512 513 514 515 516 517 518 519 520 521 522 [523] 523 524 525 526 527 528 529 530 531 532 533 534 535 536 537 538 539 540 [541] 541 542 543 544 545 546 547 548 549 550 551 552 553 554 555 556 557 558 [559] 559 560 561 562 563 564 565 566 567 568 569 570 571 572 573 574 575 576 [577] 577 578 579 580 581 582 583 584 585 586 587 588 589 590 591 592 593 594 [595] 595 596 597 598 599 600 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort4# #argv <- list(c('graphics', 'lattice', 'stats'), FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] "graphics" "lattice" "stats" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort5# #argv <- list(1:54, FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 [51] 51 52 53 54 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort6# #argv <- list(c(8.41842881182087, 0.633658419345243, 0.55014003120899, 0.264811823419969, 2.45100807149625e-16, 1.4406901715276e-16), TRUE); .Internal(sort(argv[[1]], argv[[2]])) [1] 8.418429e+00 6.336584e-01 5.501400e-01 2.648118e-01 2.451008e-16 [6] 1.440690e-16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort7# #argv <- list(FALSE, FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort8# #argv <- list(c(12784, 12815, 12843, 12874, 12904, 12935, 12965, 12996, 13027, 13057, 13088, 13118, 13149, 13180, 13208, 13239, 13269, 13300, 13330, 13361, 13392, 13422, 13453, 13483, 13514, 13545, 13573, 13604, 13634, 13665, 13695, 13726, 13757, 13787, 13818, 13848, 13879, 13910, 13939, 13970, 14000, 14031, 14061, 14092, 14123, 14153, 14184, 14214, 14245, 14276), FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] 12784 12815 12843 12874 12904 12935 12965 12996 13027 13057 13088 13118 [13] 13149 13180 13208 13239 13269 13300 13330 13361 13392 13422 13453 13483 [25] 13514 13545 13573 13604 13634 13665 13695 13726 13757 13787 13818 13848 [37] 13879 13910 13939 13970 14000 14031 14061 14092 14123 14153 14184 14214 [49] 14245 14276 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sort.testsort9# #argv <- list(c('M.user', 'Soft'), FALSE); .Internal(sort(argv[[1]], argv[[2]])) [1] "M.user" "Soft" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(1, FALSE, FALSE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(1.5, FALSE, FALSE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(1.5:5.5, FALSE, FALSE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(1:5, FALSE, FALSE)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(1:5, FALSE, TRUE)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(1:5, TRUE, FALSE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(1:5, TRUE, TRUE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(NA, FALSE, FALSE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(NULL, FALSE, FALSE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(c(), FALSE, FALSE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(paste('hello',1:10,'.'), FALSE, FALSE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #.Internal(sorted_fpass(seq(1.5,5.5,0.5), FALSE, FALSE)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #argv <- list(1:10, FALSE, FALSE); argv2 <- argv[[1]] + 1; .Internal(sorted_fpass(argv2[[1]], argv2[[2]], argv2[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sortfastpass.testsortfastpass# #argv <- list(c(1,2,3,4,5,6,7,8), FALSE, FALSE); argv2 <- argv[[1]] + 1; .Internal(sorted_fpass(argv2[[1]], argv2[[2]], argv2[[3]])) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ fu <- c("a","b") ; split(1:8,fu) } $a [1] 1 3 5 7 $b [1] 2 4 6 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ fu <- c(1,2,2,1,2,2,1,2,2,1,2,2,1,2,2,1,2,2,1,1) ; split(1:20,fu) } $`1` [1] 1 4 7 10 13 16 19 20 $`2` [1] 2 3 5 6 8 9 11 12 14 15 17 18 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ g <- factor(round(c(0.4,1.3,0.6,1.8,2.5,4.1,2.2,1.0))) ; x <- c(0.1,3.2,1,0.6,1.9,3.3,1.6,1.7) + sqrt(as.numeric(g)) ; xg <- split(x, g) ; xg } $`0` [1] 1.1 $`1` [1] 4.614214 2.414214 3.114214 $`2` [1] 2.332051 3.632051 3.332051 $`4` [1] 5.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ ma <- cbind(x = 1:10, y = (-4:5)^2) ; split(ma, col(ma)) } $`1` [1] 1 2 3 4 5 6 7 8 9 10 $`2` [1] 16 9 4 1 0 1 4 9 16 25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ split(1, NA); } named list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ split(1:10, 1:2) } $`1` [1] 1 3 5 7 9 $`2` [1] 2 4 6 8 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ split(1:2, c(NA, NA)); } named list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ split(as.raw(1:10), as.factor(c('a', 'b', 'a')); } Error: unexpected ';' in "{ split(as.raw(1:10), as.factor(c('a', 'b', 'a'));" ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ split(c(5,1,2,6,3,6), c(NA,2)); } $`2` [1] 1 6 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ split(list(1, 2L, 'x', T), as.factor(c('a', 'b', 'a')); } Error: unexpected ';' in "{ split(list(1, 2L, 'x', T), as.factor(c('a', 'b', 'a'));" ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplit# #{ x <- factor(c("a", "b", "a")); attr(x, "levels")<-c(7L, 42L) ; split(1:3, x) } $`7` [1] 1 3 $`42` [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplitWithNames# #{ split(list(q=1, w=2L, e='x', r=T), as.factor(c('a', 'b', 'a')); } Error: unexpected ';' in "{ split(list(q=1, w=2L, e='x', r=T), as.factor(c('a', 'b', 'a'));" ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testSplitWithNames#Ignored.Unimplemented# #{ tmp <- c(1,2,3); names(tmp) <- c('x','y','z'); split(tmp, as.factor(c('a','b'))); } $a x z 1 3 $b y 2 Warning message: In split.default(tmp, as.factor(c("a", "b"))) : data length is not a multiple of split variable ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit1# #argv <- list(1:6, structure(1:2, .Label = c('1', '2'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`1` [1] 1 3 5 $`2` [1] 2 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit10# #argv <- list(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), structure(c(2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('1', '2', '3', '4'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`1` [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 $`2` [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 $`3` [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 $`4` [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit12# #argv <- list(structure(c(95.7845839266016, 111.117917259935, 120.284583926602, 77.019531700964, 96.9521364368474, 112.285469770181, 121.452136436847, 77.019531700964, 96.9521364368474, 112.285469770181, 121.452136436847, 78.1870842112099, 98.1196889470933, 113.453022280427, 122.619688947093, 79.3546367214558, 99.2872414573392, 114.620574790673, 123.787241457339, 79.3546367214558, 99.2872414573392, 114.620574790673, 123.787241457339, 78.1870842112099, 98.1196889470933, 113.453022280427, 122.619688947093, 79.3546367214558, 99.2872414573392, 114.620574790673, 123.787241457339, 79.3546367214558, 99.2872414573392, 114.620574790673, 123.787241457339, 78.1870842112099, 98.1196889470933, 113.453022280427, 122.619688947093, 79.3546367214558, 99.2872414573392, 114.620574790673, 123.787241457339, 79.3546367214558, 99.2872414573392, 114.620574790673, 123.787241457339, 78.1870842112099, 98.1196889470933, 113.453022280427, 122.619688947093, 79.3546367214558, 99.2872414573392, 114.620574790673, 123.787241457339, 79.3546367214558, 99.2872414573392, 114.620574790673, 123.787241457339, 78.1870842112099, 98.1196889470933, 113.453022280427, 122.619688947093, 79.3546367214558, 99.2872414573392, 114.620574790673, 123.787241457339, 79.3546367214558, 99.2872414573392, 114.620574790673, 123.787241457339), .Dim = c(71L, 1L), .Dimnames = list(c('2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72'), NULL)), structure(c(2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('1', '2', '3', '4'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`1` [1] 77.01953 77.01953 78.18708 79.35464 79.35464 78.18708 79.35464 79.35464 [9] 78.18708 79.35464 79.35464 78.18708 79.35464 79.35464 78.18708 79.35464 [17] 79.35464 $`2` [1] 95.78458 96.95214 96.95214 98.11969 99.28724 99.28724 98.11969 99.28724 [9] 99.28724 98.11969 99.28724 99.28724 98.11969 99.28724 99.28724 98.11969 [17] 99.28724 99.28724 $`3` [1] 111.1179 112.2855 112.2855 113.4530 114.6206 114.6206 113.4530 114.6206 [9] 114.6206 113.4530 114.6206 114.6206 113.4530 114.6206 114.6206 113.4530 [17] 114.6206 114.6206 $`4` [1] 120.2846 121.4521 121.4521 122.6197 123.7872 123.7872 122.6197 123.7872 [9] 123.7872 122.6197 123.7872 123.7872 122.6197 123.7872 123.7872 122.6197 [17] 123.7872 123.7872 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit14# #argv <- list(structure(c(123.48457192908, 239.059434652297, 290.055338401838, 18.397281603467, 6.57585722655537, 0.670931786731845, 0.178466148156965, 0.245410750178149, 0.363167328274208, 0.194808268742596, 2172.67583033103, 8.91763605923317e+38), .Dim = c(1L, 12L), .Dimnames = list(NULL, c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'))), structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), .Label = '1', class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`1` [1] 1.234846e+02 2.390594e+02 2.900553e+02 1.839728e+01 6.575857e+00 [6] 6.709318e-01 1.784661e-01 2.454108e-01 3.631673e-01 1.948083e-01 [11] 2.172676e+03 8.917636e+38 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit15# #argv <- list(character(0), structure(integer(0), .Label = character(0), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) named list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit16# #argv <- list(structure(c(47.432, 12.482), .Names = c('(Intercept)', 'group2')), structure(1:2, .Label = c('0', '1'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`0` (Intercept) 47.432 $`1` group2 12.482 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit17# #argv <- structure(list(x = c(5.1, 4.9, 4.7, 4.6, 5, 5.4, 4.6, 5, 4.4, 4.9, 5.4, 4.8, 4.8, 4.3, 5.8, 5.7, 5.4, 5.1, 5.7, 5.1, 5.4, 5.1, 4.6, 5.1, 4.8, 5, 5, 5.2, 5.2, 4.7, 4.8, 5.4, 5.2, 5.5, 4.9, 5, 5.5, 4.9, 4.4, 5.1, 5, 4.5, 4.4, 5, 5.1, 4.8, 5.1, 4.6, 5.3, 5, 7, 6.4, 6.9, 5.5, 6.5, 5.7, 6.3, 4.9, 6.6, 5.2, 5, 5.9, 6, 6.1, 5.6, 6.7, 5.6, 5.8, 6.2, 5.6, 5.9, 6.1, 6.3, 6.1, 6.4, 6.6, 6.8, 6.7, 6, 5.7, 5.5, 5.5, 5.8, 6, 5.4, 6, 6.7, 6.3, 5.6, 5.5, 5.5, 6.1, 5.8, 5, 5.6, 5.7, 5.7, 6.2, 5.1, 5.7, 6.3, 5.8, 7.1, 6.3, 6.5, 7.6, 4.9, 7.3, 6.7, 7.2, 6.5, 6.4, 6.8, 5.7, 5.8, 6.4, 6.5, 7.7, 7.7, 6, 6.9, 5.6, 7.7, 6.3, 6.7, 7.2, 6.2, 6.1, 6.4, 7.2, 7.4, 7.9, 6.4, 6.3, 6.1, 7.7, 6.3, 6.4, 6, 6.9, 6.7, 6.9, 5.8, 6.8, 6.7, 6.7, 6.3, 6.5, 6.2, 5.9), f = structure(list(col2 = structure(c(3L, 2L, 2L, 2L, 3L, 3L, 2L, 2L, 2L, 2L, 3L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 2L, 3L, 3L, 2L, 2L, 2L, 2L, 3L, 2L, 2L, 2L, 2L, 3L, 3L, 2L, 2L, 3L, 3L, 2L, 2L, 3L, 1L, 2L, 3L, 3L, 2L, 3L, 2L, 3L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 1L, 2L, 2L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 1L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 1L, 3L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 3L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L), .Label = c('2', '3', '4'), class = 'factor'), col5 = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('setosa', 'versicolor', 'virginica'), class = 'factor')), .Names = c('col2', 'col5'))), .Names = c('x', 'f'));do.call('split', argv) $`2.setosa` [1] 4.5 $`3.setosa` [1] 4.9 4.7 4.6 4.6 5.0 4.4 4.9 4.8 4.8 4.3 5.4 5.1 4.8 5.0 5.0 5.2 4.7 4.8 5.4 [20] 4.9 5.0 4.4 5.1 4.4 4.8 4.6 5.0 $`4.setosa` [1] 5.1 5.0 5.4 5.4 5.8 5.7 5.4 5.1 5.7 5.1 5.1 4.6 5.2 5.2 5.5 5.5 4.9 5.0 5.0 [20] 5.1 5.1 5.3 $`2.versicolor` [1] 5.5 4.9 5.0 6.0 6.2 5.6 6.3 5.5 5.5 6.3 5.5 5.0 5.1 $`3.versicolor` [1] 7.0 6.4 6.9 6.5 5.7 6.3 6.6 5.2 5.9 6.1 5.6 6.7 5.6 5.8 5.9 6.1 6.1 6.4 6.6 [20] 6.8 6.7 6.0 5.7 5.8 6.0 5.4 6.0 6.7 5.6 5.5 6.1 5.8 5.6 5.7 5.7 6.2 5.7 $`4.versicolor` numeric(0) $`2.virginica` [1] 4.9 6.7 5.7 6.0 6.3 $`3.virginica` [1] 6.3 5.8 7.1 6.3 6.5 7.6 7.3 6.5 6.4 6.8 5.8 6.4 6.5 7.7 6.9 5.6 7.7 6.3 6.7 [20] 7.2 6.2 6.1 6.4 7.2 7.4 6.4 6.3 6.1 7.7 6.3 6.4 6.0 6.9 6.7 6.9 5.8 6.8 6.7 [39] 6.7 6.5 6.2 5.9 $`4.virginica` [1] 7.2 7.7 7.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit18# #argv <- structure(list(x = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('setosa', 'versicolor', 'virginica'), class = 'factor'), f = c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L)), .Names = c('x', 'f'));do.call('split', argv) $`1` [1] setosa setosa setosa setosa setosa setosa setosa setosa setosa setosa [11] setosa setosa setosa setosa setosa setosa setosa setosa setosa setosa [21] setosa setosa setosa setosa setosa setosa setosa setosa setosa setosa [31] setosa setosa setosa setosa setosa setosa setosa setosa setosa setosa [41] setosa setosa setosa setosa setosa setosa setosa setosa setosa setosa Levels: setosa versicolor virginica $`2` [1] versicolor versicolor versicolor versicolor versicolor versicolor [7] versicolor versicolor versicolor versicolor versicolor versicolor [13] versicolor versicolor versicolor versicolor versicolor versicolor [19] versicolor versicolor versicolor versicolor versicolor versicolor [25] versicolor versicolor versicolor versicolor versicolor versicolor [31] versicolor versicolor versicolor versicolor versicolor versicolor [37] versicolor versicolor versicolor versicolor versicolor versicolor [43] versicolor versicolor versicolor versicolor versicolor versicolor [49] versicolor versicolor virginica virginica virginica virginica [55] virginica virginica virginica virginica virginica virginica [61] virginica virginica virginica virginica virginica virginica [67] virginica virginica virginica virginica virginica virginica [73] virginica virginica virginica virginica virginica virginica [79] virginica virginica virginica virginica virginica virginica [85] virginica virginica virginica virginica virginica virginica [91] virginica virginica virginica virginica virginica virginica [97] virginica virginica virginica virginica Levels: setosa versicolor virginica ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit19# #argv <- list(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 26.3011774151224, 2.485452029809, 7.15323925419351, 16.761819986295, 10.2645644917686, 0.758337657329402, 29.4935619829433, 12.665970880074, 2.27782676164194e-08, 0.115876279686418), structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L), .Label = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23', '25', '27', '29', '31', '33', '35', '37', '39', '41'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`1` [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 [39] 1 $`3` [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 [39] 1 1 1 1 1 1 1 1 1 1 1 $`5` [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 $`7` [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 [39] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 $`9` [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 $`11` [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 $`13` [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 $`15` [1] 1 1 1 1 1 1 1 $`17` [1] 1 1 1 1 1 1 1 1 1 1 1 1 $`19` [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 $`21` [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 $`23` [1] 26.30118 $`25` [1] 2.485452 $`27` [1] 7.153239 $`29` [1] 16.76182 $`31` [1] 10.26456 $`33` [1] 0.7583377 $`35` [1] 29.49356 $`37` [1] 12.66597 $`39` [1] 2.277827e-08 $`41` [1] 0.1158763 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit2# #argv <- list(structure(c(-1.13864415195445, 0.574433648632919, 0.61125743366192, 0.291104607198021, 1.44367450704693, 0.408616385050392, -0.252815027721455, 0.73544465026571, -0.711029326417947, -0.611820918993561, -0.963259276248408, -0.28935033673839, -0.482346616963731, 0.575284398820533, 0.0664802498883062, 0.0889008730409177, -0.527009741835806, -0.572160487726669, 0.458433701366337, 0.0259549922279207, 0.79246010222197, 0.200856719794408, 0.681708382019133, 1.24959713166139, 2.28504683598586, 0.885201117877485, 0.275047494865858, 0.0611635446204713, -0.226340664609402, -0.701634984067551, -1.36331112409512, -0.470720710127998, 0.0116712292760789, 0.680960771805182, 1.25010637890252, -0.168484448953506, -0.703880448859559, -0.342493773069341, -0.359950801091045, 0.187018301421814, 0.332611568778467, 0.418088885897922, 1.52526747601546, 1.23881025318897, 1.97893910443604, 1.67980257496383, -0.0423836378777035, -0.085940264442189, 0.0751591419566941, 1.33615888669544, 1.29143414265875, 0.211686019646981, 0.107754613497605, -0.842122877395922, -0.363550334633855, -1.04260396788242, -1.00216202750311, -0.725219786582336, -0.702075395338802, -0.0588517433215815, 0.676181221812652, 0.606054389584641, -0.0722001122493283, -0.565579974058951, -1.50420998542363, -1.38835023347894, -1.6387526999868, -1.22317617387598, -2.6439685322602, -1.50311594814139, 0.58539278534518, 0.476423420506994, -0.229810354321508, -0.669629539423225, -0.500767918117353, -1.30780681405878, -0.0658147956438969, 0.619743292251259, 0.947409254626009, 0.137968713284014, -0.0705143536229389, -0.316245167388448, 0.423768217540825, -1.77132723836955, 0.437524374017483, 1.05217040293853, 1.29145821945076, 0.189519814277623, 0.405463210651828, -1.10579240546022, 0.470126971026959, 1.3013241742778, 1.57690948154138, 0.836753145709701, -0.0990436481848584, 0.305059193206195, 0.722542224965483, 0.497020187014643, -0.798519685959293, -0.162044448918511, -0.268976403560686, 0.471344909208507, 1.07960447064393, 0.816448434674936, 1.01857006703316, -0.19352270657549, 0.193745914189151, -0.0118346974247015, 0.515110447770272, 1.29117007883295, 0.484844437955959, 0.357506193819553, -1.95817055695569, -1.62102859205691, -2.13900473718215, -2.19173201733318, -1.86372596557808, -1.18864210270607, -1.19890597040604, 0.432503235072499, 0.594410727524479, 1.21432538936706, 2.15795981275539, 1.31528364302187, 0.38422055227912, 0.786869292659675, -0.703717985086569, -0.535651668024763, 0.34627858116184, 0.537117318247469, 0.901014803953916, 1.2151594352426, 0.827351473348557, -0.682186392255085, -1.33342351753519, -1.26893821314864, -1.4632463728941, -1.64736130434257, -1.21073183651285, -0.643396605364174), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100', '101', '102', '103', '104', '105', '106', '107', '108', '109', '110', '111', '112', '113', '114', '115', '116', '117', '118', '119', '120', '121', '122', '123', '124', '125', '126', '127', '128', '129', '130', '131', '132', '133', '134', '135', '136', '137', '138', '139', '140')), structure(c(9L, 9L, 9L, 9L, 9L, 9L, 9L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 10L, 10L, 10L, 10L, 10L, 10L, 10L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 13L, 13L, 13L, 13L, 13L, 13L, 13L, 14L, 14L, 14L, 14L, 14L, 14L, 14L, 16L, 16L, 16L, 16L, 16L, 16L, 16L, 17L, 17L, 17L, 17L, 17L, 17L, 17L, 19L, 19L, 19L, 19L, 19L, 19L, 19L, 15L, 15L, 15L, 15L, 15L, 15L, 15L, 11L, 11L, 11L, 11L, 11L, 11L, 11L, 18L, 18L, 18L, 18L, 18L, 18L, 18L, 20L, 20L, 20L, 20L, 20L, 20L, 20L, 12L, 12L, 12L, 12L, 12L, 12L, 12L), .Label = c('10', '8', '2', '6', '3', '5', '9', '7', '1', '4', '17', '20', '11', '12', '16', '13', '14', '18', '15', '19'), class = c('ordered', 'factor'))); .Internal(split(argv[[1]], argv[[2]])) $`10` 64 65 66 67 68 69 70 -0.565580 -1.504210 -1.388350 -1.638753 -1.223176 -2.643969 -1.503116 $`8` 50 51 52 53 54 55 56 1.3361589 1.2914341 0.2116860 0.1077546 -0.8421229 -0.3635503 -1.0426040 $`2` 8 9 10 11 12 13 14 0.7354447 -0.7110293 -0.6118209 -0.9632593 -0.2893503 -0.4823466 0.5752844 $`6` 36 37 38 39 40 41 42 -0.1684844 -0.7038804 -0.3424938 -0.3599508 0.1870183 0.3326116 0.4180889 $`3` 15 16 17 18 19 20 0.06648025 0.08890087 -0.52700974 -0.57216049 0.45843370 0.02595499 21 0.79246010 $`5` 29 30 31 32 33 34 -0.22634066 -0.70163498 -1.36331112 -0.47072071 0.01167123 0.68096077 35 1.25010638 $`9` 57 58 59 60 61 62 -1.00216203 -0.72521979 -0.70207540 -0.05885174 0.67618122 0.60605439 63 -0.07220011 $`7` 43 44 45 46 47 48 1.52526748 1.23881025 1.97893910 1.67980257 -0.04238364 -0.08594026 49 0.07515914 $`1` 1 2 3 4 5 6 7 -1.1386442 0.5744336 0.6112574 0.2911046 1.4436745 0.4086164 -0.2528150 $`4` 22 23 24 25 26 27 28 0.20085672 0.68170838 1.24959713 2.28504684 0.88520112 0.27504749 0.06116354 $`17` 113 114 115 116 117 118 119 -1.958171 -1.621029 -2.139005 -2.191732 -1.863726 -1.188642 -1.198906 $`20` 134 135 136 137 138 139 140 -0.6821864 -1.3334235 -1.2689382 -1.4632464 -1.6473613 -1.2107318 -0.6433966 $`11` 71 72 73 74 75 76 77 0.5853928 0.4764234 -0.2298104 -0.6696295 -0.5007679 -1.3078068 -0.0658148 $`12` 78 79 80 81 82 83 0.61974329 0.94740925 0.13796871 -0.07051435 -0.31624517 0.42376822 84 -1.77132724 $`16` 106 107 108 109 110 111 112 -0.1935227 0.1937459 -0.0118347 0.5151104 1.2911701 0.4848444 0.3575062 $`13` 85 86 87 88 89 90 91 0.4375244 1.0521704 1.2914582 0.1895198 0.4054632 -1.1057924 0.4701270 $`14` 92 93 94 95 96 97 1.30132417 1.57690948 0.83675315 -0.09904365 0.30505919 0.72254222 98 0.49702019 $`18` 120 121 122 123 124 125 126 0.4325032 0.5944107 1.2143254 2.1579598 1.3152836 0.3842206 0.7868693 $`15` 99 100 101 102 103 104 105 -0.7985197 -0.1620444 -0.2689764 0.4713449 1.0796045 0.8164484 1.0185701 $`19` 127 128 129 130 131 132 133 -0.7037180 -0.5356517 0.3462786 0.5371173 0.9010148 1.2151594 0.8273515 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit2# #{ .Internal(split(structure(1:4, names=c('a','b','c','d')), factor(c(1,2)))); } $`1` a c 1 3 $`2` b d 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit2# #{ .Internal(split(structure(c(TRUE,FALSE,FALSE,FALSE), names=c('a','b','c','d')), factor(c(1,2)))); } $`1` a c TRUE FALSE $`2` b d FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit3# #argv <- list(structure(c(1034.46153846154, 480.076923076923, 504.692307692308, 480.076923076923, 0, 0, 0, 0, 480.076923076923, 517.230769230769, 444.307692307692, 819.846153846154, 945.230769230769, 542.769230769231, 0, 0, 0, 1824.30769230769, 444.307692307692, 912.153846153846, 0, 0, 1514.07692307692, 0, 936, 0), .Dim = 26L, .Dimnames = list(c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '2', '2', '2', '2', '2', '2', '2', '2', '2', '2', '2', '2', '2'))), structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('1', '2'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`1` 1 1 1 1 1 1 1 1 1034.4615 480.0769 504.6923 480.0769 0.0000 0.0000 0.0000 0.0000 1 1 1 1 1 480.0769 517.2308 444.3077 819.8462 945.2308 $`2` 2 2 2 2 2 2 2 2 542.7692 0.0000 0.0000 0.0000 1824.3077 444.3077 912.1538 0.0000 2 2 2 2 2 0.0000 1514.0769 0.0000 936.0000 0.0000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit4# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 1.48219693752374e-323, 0, 0, 0, 0, 0), .Dim = c(1L, 12L), .Dimnames = list(NULL, c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'))), structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L), .Label = '1', class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`1` [1] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [6] 0.000000e+00 1.482197e-323 0.000000e+00 0.000000e+00 0.000000e+00 [11] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit5#Ignored.ImplementationError# #argv <- list(c(1, 3, 5, 7, 8, 3, 5, NA, 4, 5, 7, 9), structure(c(8L, 6L, 3L, 2L, NA, 5L, 1L, 4L, 7L, 3L, NA, NA), .Label = c('0', '2', '6', '8', '15', '22', '29', '35'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`0` [1] 5 $`2` [1] 7 $`6` [1] 5 5 $`8` [1] NA $`15` [1] 3 $`22` [1] 3 $`29` [1] 4 $`35` [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit6# #argv <- list(c(41L, 36L, 12L, 18L, NA, 28L, 23L, 19L, 8L, NA, 7L, 16L, 11L, 14L, 18L, 14L, 34L, 6L, 30L, 11L, 1L, 11L, 4L, 32L, NA, NA, NA, 23L, 45L, 115L, 37L, NA, NA, NA, NA, NA, NA, 29L, NA, 71L, 39L, NA, NA, 23L, NA, NA, 21L, 37L, 20L, 12L, 13L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 135L, 49L, 32L, NA, 64L, 40L, 77L, 97L, 97L, 85L, NA, 10L, 27L, NA, 7L, 48L, 35L, 61L, 79L, 63L, 16L, NA, NA, 80L, 108L, 20L, 52L, 82L, 50L, 64L, 59L, 39L, 9L, 16L, 78L, 35L, 66L, 122L, 89L, 110L, NA, NA, 44L, 28L, 65L, NA, 22L, 59L, 23L, 31L, 44L, 21L, 9L, NA, 45L, 168L, 73L, NA, 76L, 118L, 84L, 85L, 96L, 78L, 73L, 91L, 47L, 32L, 20L, 23L, 21L, 24L, 44L, 21L, 28L, 9L, 13L, 46L, 18L, 13L, 24L, 16L, 13L, 23L, 36L, 7L, 14L, 30L, NA, 14L, 18L, 20L), structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L), .Label = c('1', '2', '3', '4', '5'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`1` [1] 41 36 12 18 NA 28 23 19 8 NA 7 16 11 14 18 14 34 6 30 [20] 11 1 11 4 32 NA NA NA 23 45 115 37 $`2` [1] NA NA NA NA NA NA 29 NA 71 39 NA NA 23 NA NA 21 37 20 12 13 NA NA NA NA NA [26] NA NA NA NA NA $`3` [1] 135 49 32 NA 64 40 77 97 97 85 NA 10 27 NA 7 48 35 61 79 [20] 63 16 NA NA 80 108 20 52 82 50 64 59 $`4` [1] 39 9 16 78 35 66 122 89 110 NA NA 44 28 65 NA 22 59 23 31 [20] 44 21 9 NA 45 168 73 NA 76 118 84 85 $`5` [1] 96 78 73 91 47 32 20 23 21 24 44 21 28 9 13 46 18 13 24 16 13 23 36 7 14 [26] 30 NA 14 18 20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit7# #argv <- list(structure(c('Sex/(Age + Eth * Lrn)', 'Sex + Sex:Age + Sex:Eth + Sex:Lrn + Sex:Eth:Lrn + Sex:Age:Lrn', 'Sex + Sex:Age + Sex:Eth + Sex:Lrn + Sex:Eth:Lrn + Sex:Age:Lrn + Sex:Age:Eth + Sex:Age:Eth:Lrn', '1.597991', '1.686899', '1.928360', '132', '128', '118', '-1063.025', '-1055.398', '-1039.324', '', '1 vs 2', '2 vs 3', '', ' 4', '10', '', ' 7.627279', '16.073723', '', '0.10622602', '0.09754136'), .Dim = c(3L, 8L)), structure(c(1L, 1L, 1L, 2L, 2L, 2L, 3L, 3L, 3L, 4L, 4L, 4L, 5L, 5L, 5L, 6L, 6L, 6L, 7L, 7L, 7L, 8L, 8L, 8L), .Label = c('1', '2', '3', '4', '5', '6', '7', '8'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`1` [1] "Sex/(Age + Eth * Lrn)" [2] "Sex + Sex:Age + Sex:Eth + Sex:Lrn + Sex:Eth:Lrn + Sex:Age:Lrn" [3] "Sex + Sex:Age + Sex:Eth + Sex:Lrn + Sex:Eth:Lrn + Sex:Age:Lrn + Sex:Age:Eth + Sex:Age:Eth:Lrn" $`2` [1] "1.597991" "1.686899" "1.928360" $`3` [1] "132" "128" "118" $`4` [1] "-1063.025" "-1055.398" "-1039.324" $`5` [1] "" "1 vs 2" "2 vs 3" $`6` [1] "" " 4" "10" $`7` [1] "" " 7.627279" "16.073723" $`8` [1] "" "0.10622602" "0.09754136" ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit8# #argv <- list(c(0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 0L), structure(c(60L, 60L, 60L, 60L, 61L, 61L, 61L, 61L, 62L, 62L, 62L, 62L, 63L, 63L, 63L, 63L, 64L, 64L, 64L, 64L, 65L, 65L, 65L, 65L, 66L, 66L, 66L, 66L, 67L, 67L, 67L, 67L, 68L, 68L, 68L, 68L, 69L, 69L, 69L, 69L, 70L, 70L, 70L, 70L, 71L, 71L, 71L, 71L, 72L, 72L, 72L, 72L, 73L, 73L, 73L, 73L, 74L, 74L, 74L, 74L, 75L, 75L, 75L, 75L, 76L, 76L, 76L, 76L, 77L, 77L, 77L, 77L, 78L, 78L, 78L, 78L, 79L, 79L, 79L, 79L, 80L, 80L, 80L, 80L, 81L, 81L, 81L, 81L, 82L, 82L, 82L, 82L, 83L, 83L, 83L, 83L, 84L, 84L, 84L, 84L, 85L, 85L, 85L, 85L, 86L, 86L, 86L, 86L, 87L, 87L, 87L, 87L, 88L, 88L, 88L, 88L, 89L, 89L, 89L, 89L, 90L, 90L, 90L, 90L, 91L, 91L, 91L, 91L, 92L, 92L, 92L, 92L, 93L, 93L, 93L, 93L, 94L, 94L, 94L, 94L, 95L, 95L, 95L, 95L, 96L, 96L, 96L, 96L, 97L, 97L, 97L, 97L, 98L, 98L, 98L, 98L, 99L, 99L, 99L, 99L, 100L, 100L, 100L, 100L, 101L, 101L, 101L, 101L, 102L, 102L, 102L, 102L, 103L, 103L, 103L, 103L, 104L, 104L, 104L, 104L, 105L, 105L, 105L, 105L, 106L, 106L, 106L, 106L, 107L, 107L, 107L, 107L, 108L, 108L, 108L, 108L, 109L, 109L, 109L, 109L, 110L, 110L, 110L, 110L, 111L, 111L, 111L, 111L, 112L, 112L, 112L, 112L, 113L, 113L, 113L, 113L, 114L, 114L, 114L, 114L, 115L, 115L, 115L, 115L, 116L, 116L, 116L, 116L, 117L, 117L, 117L, 117L, 118L, 118L, 118L, 118L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 32L, 33L, 34L, 35L, 36L, 37L, 38L, 39L, 40L, 41L, 42L, 43L, 44L, 45L, 46L, 47L, 48L, 49L, 50L, 51L, 52L, 53L, 54L, 55L, 56L, 57L, 58L, 59L), .Label = c('0', '1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100', '101', '102', '103', '104', '105', '106', '107', '108', '109', '110', '111', '112', '113', '114', '115', '116', '117'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`0` [1] 0 $`1` [1] 0 $`2` [1] 0 $`3` [1] 0 $`4` [1] 0 $`5` [1] 0 $`6` [1] 0 $`7` [1] 0 $`8` [1] 0 $`9` [1] 0 $`10` [1] 0 $`11` [1] 0 $`12` [1] 0 $`13` [1] 0 $`14` [1] 0 $`15` [1] 0 $`16` [1] 0 $`17` [1] 0 $`18` [1] 0 $`19` [1] 0 $`20` [1] 0 $`21` [1] 0 $`22` [1] 0 $`23` [1] 0 $`24` [1] 0 $`25` [1] 0 $`26` [1] 0 $`27` [1] 0 $`28` [1] 0 $`29` [1] 0 $`30` [1] 0 $`31` [1] 0 $`32` [1] 0 $`33` [1] 0 $`34` [1] 0 $`35` [1] 0 $`36` [1] 0 $`37` [1] 0 $`38` [1] 0 $`39` [1] 0 $`40` [1] 0 $`41` [1] 0 $`42` [1] 0 $`43` [1] 0 $`44` [1] 0 $`45` [1] 0 $`46` [1] 0 $`47` [1] 0 $`48` [1] 0 $`49` [1] 0 $`50` [1] 0 $`51` [1] 0 $`52` [1] 0 $`53` [1] 0 $`54` [1] 0 $`55` [1] 0 $`56` [1] 0 $`57` [1] 0 $`58` [1] 0 $`59` [1] 0 0 0 1 $`60` [1] 0 0 0 1 $`61` [1] 0 0 0 1 $`62` [1] 0 0 0 1 $`63` [1] 0 0 0 1 $`64` [1] 0 0 0 1 $`65` [1] 0 0 0 1 $`66` [1] 0 0 0 1 $`67` [1] 0 0 0 1 $`68` [1] 0 0 0 1 $`69` [1] 0 0 0 1 $`70` [1] 0 0 0 1 $`71` [1] 0 0 0 1 $`72` [1] 0 0 0 1 $`73` [1] 0 0 0 1 $`74` [1] 0 0 0 1 $`75` [1] 0 0 0 1 $`76` [1] 0 0 0 1 $`77` [1] 0 0 0 1 $`78` [1] 0 0 0 1 $`79` [1] 0 0 0 1 $`80` [1] 0 0 0 1 $`81` [1] 0 0 0 1 $`82` [1] 0 0 0 1 $`83` [1] 0 0 0 1 $`84` [1] 0 0 0 1 $`85` [1] 0 0 0 1 $`86` [1] 0 0 0 1 $`87` [1] 0 0 0 1 $`88` [1] 0 0 0 1 $`89` [1] 0 0 0 1 $`90` [1] 0 0 0 1 $`91` [1] 0 0 0 1 $`92` [1] 0 0 0 1 $`93` [1] 0 0 0 1 $`94` [1] 0 0 0 1 $`95` [1] 0 0 0 1 $`96` [1] 0 0 0 1 $`97` [1] 0 0 0 1 $`98` [1] 0 0 0 1 $`99` [1] 0 0 0 1 $`100` [1] 0 0 0 1 $`101` [1] 0 0 0 1 $`102` [1] 0 0 0 1 $`103` [1] 0 0 0 1 $`104` [1] 0 0 0 1 $`105` [1] 0 0 0 1 $`106` [1] 0 0 0 1 $`107` [1] 0 0 0 1 $`108` [1] 0 0 0 1 $`109` [1] 0 0 0 1 $`110` [1] 0 0 0 1 $`111` [1] 0 0 0 1 $`112` [1] 0 0 0 1 $`113` [1] 0 0 0 1 $`114` [1] 0 0 0 1 $`115` [1] 0 0 0 1 $`116` [1] 0 0 0 1 $`117` [1] 0 0 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_split.testsplit9# #argv <- list(structure(c(NA, NA), .Dim = 1:2), structure(1:2, .Label = c('1', '2'), class = 'factor')); .Internal(split(argv[[1]], argv[[2]])) $`1` [1] NA $`2` [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #sprintf('%02d', as.integer(NA)) [1] "NA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%d', 1L) } [1] "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%d', 2) } [1] "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%d', 2.2) } Error in sprintf("%d", 2.2) : invalid format '%d'; use format %f, %e, %g or %a for numeric objects ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%d', TRUE) } [1] "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%f', 1L) } [1] "1.000000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%f', 2) } [1] "2.000000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%f', 2.2) } [1] "2.200000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%f', TRUE) } [1] "1.000000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%s', 1L) } [1] "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%s', 2) } [1] "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%s', 2.2) } [1] "2.2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('%s', TRUE) } [1] "TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions#Ignored.Unimplemented# #{ sprintf('%s', as.raw(1)) } [1] "01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testConversions# #{ sprintf('limited to %d part%s due to %.0f', 3L, 'a', 3L) } [1] "limited to 3 parta due to 3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testCornerCases# #{ sprintf('limited to %d part%s due to %.0f', 3L, 3.3) } Error in sprintf("limited to %d part%s due to %.0f", 3L, 3.3) : too few arguments ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testCornerCases#Ignored.ImplementationError# #{ sprintf(c('hello %d %s', 'world %d %s'), list(2, 'x')) } Error in sprintf(c("hello %d %s", "world %d %s"), list(2, "x")) : unsupported type ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testGenericDispatch#Ignored.Unimplemented# #{ as.character.myclass65231 <- function(x) '42'; y <- 2; class(y) <- 'myclass65231'; sprintf('%s', y); } [1] "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testGenericDispatch#Ignored.Unimplemented# #{ as.double.myclass65321 <- function(x) 3.14; y <- 'str'; class(y) <- 'myclass65321'; sprintf('%g', y); } Error in sprintf("%g", y) : invalid format '%g'; use format %s for character objects ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testGenericDispatch#Ignored.Unimplemented# #{ as.double.myclass65321 <- function(x) 3.14; y <- 3L; class(y) <- 'myclass65321'; sprintf('%g', y); } [1] "3.14" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ asdfgerta <- sprintf('%.0f', 1); } ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ asdfgerta <- sprintf('%0.0f', 1); } ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ asdfgerta <- sprintf('%0.f', 1); } ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%.3g", 1.234) } [1] "1.23" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%03d", 1:3) } [1] "001" "002" "003" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%04X", 26) } [1] "001A" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%3d", 1:3) } [1] " 1" " 2" " 3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%4X", 26) } [1] " 1A" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%7.3f", 10.1) } [1] " 10.100" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%d %d", as.integer(c(7,42)), as.integer(1)) } [1] "7 1" "42 1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%d %d", as.integer(c(7,42)), as.integer(c(1,2))) } [1] "7 1" "42 2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%d %d", as.integer(c(7,42)), integer()) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%d", 10) } [1] "10" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%d", as.integer(c(7))) } [1] "7" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%d", as.integer(c(7,42)), as.integer(c(1,2))) } [1] "7" "42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("%d%d",1L,2L) } [1] "12" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("0x%x",1) } [1] "0x1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("0x%x",10) } [1] "0xa" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("0x%x",10L) } [1] "0xa" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("0x%x",1L) } [1] "0x1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("Hello %*2$d", 3, 2) } [1] "Hello 3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("Hello %*d", 3, 2) } [1] "Hello 2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("Hello %2$*2$d", 3, 2) } [1] "Hello 2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf("foo") } [1] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('% g', 4.0) } [1] " 4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('% g', 4.33) } [1] " 4.33" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf#Ignored.ImplementationError# #{ sprintf('%#g', 4.0) } [1] "4.00000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%+g', 4.0) } [1] "+4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%+g', 4.33) } [1] "+4.33" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%.3d', 4.0) } [1] "004" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%.3g', 4.0) } [1] "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%.3g', 4.33) } [1] "4.33" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%.3i', 4.0) } [1] "004" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%d%s', NULL, 'Hello') } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%g', 4.3345423) } [1] "4.33454" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%s%d', 'Hello', NULL) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%s%d', 'Hello', c()) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%s%d', 'Hello', seq_along(c())) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('%s', list('hello world')) } [1] "hello world" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf('plot_%02g', 3L) } [1] "plot_03" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf(c("foo %f %d", "bar %f %d"), 7, 42L) } [1] "foo 7.000000 42" "bar 7.000000 42" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf(c("foo %f %d", "bar %f %d"), c(7,1), c(42L, 2L)) } [1] "foo 7.000000 42" "bar 1.000000 2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf(c("foo %f", "bar %f"), 7) } [1] "foo 7.000000" "bar 7.000000" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf(c("foo", "bar")) } [1] "foo" "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testSprintf# #{ sprintf(c('hello', 'world'), NULL) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf1# #argv <- list('%s is not TRUE', 'identical(fxy, c(1, 2, 3))'); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "identical(fxy, c(1, 2, 3)) is not TRUE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf10# #argv <- list('%.0f%% said yes (out of a sample of size %.0f)', 66.666, 3); .Internal(sprintf(argv[[1]], argv[[2]], argv[[3]])) [1] "67% said yes (out of a sample of size 3)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf11# #argv <- list('%1$d %1$x %1$X', 0:15); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "0 0 0" "1 1 1" "2 2 2" "3 3 3" "4 4 4" "5 5 5" "6 6 6" "7 7 7" [9] "8 8 8" "9 9 9" "10 a A" "11 b B" "12 c C" "13 d D" "14 e E" "15 f F" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf12# #argv <- list('%03o', 1:255); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "001" "002" "003" "004" "005" "006" "007" "010" "011" "012" "013" "014" [13] "015" "016" "017" "020" "021" "022" "023" "024" "025" "026" "027" "030" [25] "031" "032" "033" "034" "035" "036" "037" "040" "041" "042" "043" "044" [37] "045" "046" "047" "050" "051" "052" "053" "054" "055" "056" "057" "060" [49] "061" "062" "063" "064" "065" "066" "067" "070" "071" "072" "073" "074" [61] "075" "076" "077" "100" "101" "102" "103" "104" "105" "106" "107" "110" [73] "111" "112" "113" "114" "115" "116" "117" "120" "121" "122" "123" "124" [85] "125" "126" "127" "130" "131" "132" "133" "134" "135" "136" "137" "140" [97] "141" "142" "143" "144" "145" "146" "147" "150" "151" "152" "153" "154" [109] "155" "156" "157" "160" "161" "162" "163" "164" "165" "166" "167" "170" [121] "171" "172" "173" "174" "175" "176" "177" "200" "201" "202" "203" "204" [133] "205" "206" "207" "210" "211" "212" "213" "214" "215" "216" "217" "220" [145] "221" "222" "223" "224" "225" "226" "227" "230" "231" "232" "233" "234" [157] "235" "236" "237" "240" "241" "242" "243" "244" "245" "246" "247" "250" [169] "251" "252" "253" "254" "255" "256" "257" "260" "261" "262" "263" "264" [181] "265" "266" "267" "270" "271" "272" "273" "274" "275" "276" "277" "300" [193] "301" "302" "303" "304" "305" "306" "307" "310" "311" "312" "313" "314" [205] "315" "316" "317" "320" "321" "322" "323" "324" "325" "326" "327" "330" [217] "331" "332" "333" "334" "335" "336" "337" "340" "341" "342" "343" "344" [229] "345" "346" "347" "350" "351" "352" "353" "354" "355" "356" "357" "360" [241] "361" "362" "363" "364" "365" "366" "367" "370" "371" "372" "373" "374" [253] "375" "376" "377" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf13# #argv <- list('%d y value <= 0 omitted from logarithmic plot', 1L); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "1 y value <= 0 omitted from logarithmic plot" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf14# #argv <- list('%o', 1:255); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "1" "2" "3" "4" "5" "6" "7" "10" "11" "12" "13" "14" [13] "15" "16" "17" "20" "21" "22" "23" "24" "25" "26" "27" "30" [25] "31" "32" "33" "34" "35" "36" "37" "40" "41" "42" "43" "44" [37] "45" "46" "47" "50" "51" "52" "53" "54" "55" "56" "57" "60" [49] "61" "62" "63" "64" "65" "66" "67" "70" "71" "72" "73" "74" [61] "75" "76" "77" "100" "101" "102" "103" "104" "105" "106" "107" "110" [73] "111" "112" "113" "114" "115" "116" "117" "120" "121" "122" "123" "124" [85] "125" "126" "127" "130" "131" "132" "133" "134" "135" "136" "137" "140" [97] "141" "142" "143" "144" "145" "146" "147" "150" "151" "152" "153" "154" [109] "155" "156" "157" "160" "161" "162" "163" "164" "165" "166" "167" "170" [121] "171" "172" "173" "174" "175" "176" "177" "200" "201" "202" "203" "204" [133] "205" "206" "207" "210" "211" "212" "213" "214" "215" "216" "217" "220" [145] "221" "222" "223" "224" "225" "226" "227" "230" "231" "232" "233" "234" [157] "235" "236" "237" "240" "241" "242" "243" "244" "245" "246" "247" "250" [169] "251" "252" "253" "254" "255" "256" "257" "260" "261" "262" "263" "264" [181] "265" "266" "267" "270" "271" "272" "273" "274" "275" "276" "277" "300" [193] "301" "302" "303" "304" "305" "306" "307" "310" "311" "312" "313" "314" [205] "315" "316" "317" "320" "321" "322" "323" "324" "325" "326" "327" "330" [217] "331" "332" "333" "334" "335" "336" "337" "340" "341" "342" "343" "344" [229] "345" "346" "347" "350" "351" "352" "353" "354" "355" "356" "357" "360" [241] "361" "362" "363" "364" "365" "366" "367" "370" "371" "372" "373" "374" [253] "375" "376" "377" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf15# #argv <- list('%s-class.Rd', structure('foo', .Names = 'foo')); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "foo-class.Rd" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf16# #argv <- list('checkRd: (%d) %s', -3, 'evalSource.Rd:157: Unnecessary braces at ‘{\'sourceEnvironment\'}’'); .Internal(sprintf(argv[[1]], argv[[2]], argv[[3]])) [1] "checkRd: (-3) evalSource.Rd:157: Unnecessary braces at ‘{'sourceEnvironment'}’" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf17# #argv <- list('tools:::check_compiled_code(\'%s\')', '/home/lzhao/hg/r-instrumented/library/foreign'); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "tools:::check_compiled_code('/home/lzhao/hg/r-instrumented/library/foreign')" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf18#Ignored.ImplementationError# #argv <- list('%5g', structure(c(18, 18, 0, 14, 4, 12, 12, 0, 4, 8, 26, 23, 3, 18, 5, 8, 5, 3, 0, 5, 21, 0, 21, 0, 0), .Dim = c(5L, 5L), .Dimnames = list(NULL, c('', '', '', '', '')))); .Internal(sprintf(argv[[1]], argv[[2]])) [1] " 18" " 18" " 0" " 14" " 4" " 12" " 12" " 0" " 4" [10] " 8" " 26" " 23" " 3" " 18" " 5" " 8" " 5" " 3" [19] " 0" " 5" " 21" " 0" " 21" " 0" " 0" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf19# #argv <- list('%G', 3.14159265358979e-06); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "3.14159E-06" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf2# #argv <- list('%1.0f', 3.14159265358979); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf21# #argv <- structure(list(fmt = '%9.4g', 12345.6789), .Names = c('fmt', ''));do.call('sprintf', argv) [1] "1.235e+04" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf3# #argv <- list('min 10-char string \'%10s\'', c('a', 'ABC', 'and an even longer one')); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "min 10-char string ' a'" [2] "min 10-char string ' ABC'" [3] "min 10-char string 'and an even longer one'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf3# #argv <- list('min 3-char string \'%3s\'', c('a', 'ABC', 'and an even longer one')); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "min 3-char string ' a'" [2] "min 3-char string 'ABC'" [3] "min 3-char string 'and an even longer one'" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf4# #argv <- list('%o', integer(0)); .Internal(sprintf(argv[[1]], argv[[2]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf5# #argv <- list('%*s', 1, ''); .Internal(sprintf(argv[[1]], argv[[2]], argv[[3]])) [1] " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf6# #argv <- list('p,L,S = (%2d,%2d,%2d): ', TRUE, TRUE, FALSE); .Internal(sprintf(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] "p,L,S = ( 1, 1, 0): " ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf7# #argv <- list('p,L,S = (%2d,%2d,%2d): ', TRUE, FALSE, NA); .Internal(sprintf(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] "p,L,S = ( 1, 0,NA): " ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf8# #argv <- list('plot_%02g', 1L); .Internal(sprintf(argv[[1]], argv[[2]])) [1] "plot_01" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sprintf.testsprintf9# #argv <- list('tools:::.createExdotR(\'%s\', \'%s\', silent = TRUE, use_gct = %s, addTiming = %s)', structure('KernSmooth', .Names = 'Package'), '/home/lzhao/hg/r-instrumented/library/KernSmooth', FALSE, FALSE); .Internal(sprintf(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]])) [1] "tools:::.createExdotR('KernSmooth', '/home/lzhao/hg/r-instrumented/library/KernSmooth', silent = TRUE, use_gct = FALSE, addTiming = FALSE)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testSqrt#Output.MissingWarning# #{ sqrt(-1) } [1] NaN Warning message: In sqrt(-1) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testSqrt#Output.MissingWarning# #{ sqrt(-1L) } [1] NaN Warning message: In sqrt(-1L) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testSqrt# #{ sqrt(1:5) } [1] 1.000000 1.414214 1.732051 2.000000 2.236068 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testSqrt# #{ sqrt(9) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testSqrt# #{ sqrt(9L) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testSqrt# #{ sqrt(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testSqrt# #{ sqrt(c(1,4,9,16)) } [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testSqrt# #{ sqrt(c(1,4,NA,16)) } [1] 1 2 NA 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testSqrt# #{ sqrt(c(a=9,b=81)) } a b 3 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt1# #argv <- list(12.8025995273675);sqrt(argv[[1]]); [1] 3.578072 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt10#Output.MissingWarning# #argv <- list(c(6L, 5L, 4L, 3L, 2L, 1L, 0L, -1L, -2L, -3L, -4L));sqrt(argv[[1]]); [1] 2.449490 2.236068 2.000000 1.732051 1.414214 1.000000 0.000000 NaN [9] NaN NaN NaN Warning message: In sqrt(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt11# #argv <- list(0+1i);sqrt(argv[[1]]); [1] 0.7071068+0.7071068i ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt12# #argv <- list(c(TRUE, FALSE));sqrt(argv[[1]]); [1] 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt2# #argv <- list(numeric(0));sqrt(argv[[1]]); numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt3# #argv <- list(-17+0i);sqrt(argv[[1]]); [1] 0+4.123106i ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt4# #argv <- list(1e+07);sqrt(argv[[1]]); [1] 3162.278 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt5# #argv <- list(1);sqrt(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt6# #argv <- list(structure(c(0.0101832147522745, 0.0107298799092166, 0.0605795647466432, 7.03601392438852e-05), .Names = c('ar1', 'ar2', 'intercept', 'trend')));sqrt(argv[[1]]); ar1 ar2 intercept trend 0.100911916 0.103585134 0.246129163 0.008388095 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt7# #argv <- list(structure(1:10, id = 'test 1', class = structure('withId', package = '.GlobalEnv')));sqrt(argv[[1]]); [1] 1.000000 1.414214 1.732051 2.000000 2.236068 2.449490 2.645751 2.828427 [9] 3.000000 3.162278 attr(,"id") [1] "test 1" attr(,"class") [1] "withId" attr(,"class")attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt8# #argv <- list(structure(c(660, 543, 711, 500, 410, 309, 546, 351, 269, 203, 370, 193, 181, 117, 243, 136, 117, 87, 154, 84), .Dim = 4:5, .Dimnames = list(c('Rural Male', 'Rural Female', 'Urban Male', 'Urban Female'), c('70-74', '65-69', '60-64', '55-59', '50-54'))));sqrt(argv[[1]]); 70-74 65-69 60-64 55-59 50-54 Rural Male 25.69047 20.24846 16.40122 13.45362 10.816654 Rural Female 23.30236 17.57840 14.24781 10.81665 9.327379 Urban Male 26.66458 23.36664 19.23538 15.58846 12.409674 Urban Female 22.36068 18.73499 13.89244 11.66190 9.165151 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sqrt.testsqrt9# #argv <- list(c(6L, 5L, 4L, 3L, 2L, 1L, 0L, NA, NA, NA, NA));sqrt(argv[[1]]); [1] 2.449490 2.236068 2.000000 1.732051 1.414214 1.000000 0.000000 NA [9] NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testEndsWith# #{ endsWith("abc", "b") } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testEndsWith# #{ endsWith("abc", "c") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testEndsWith# #{ endsWith("abc", 1) } Error in endsWith("abc", 1) : non-character object(s) ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testEndsWith# #{ endsWith(2, "1") } Error in endsWith(2, "1") : non-character object(s) ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testEndsWith# #{ endsWith(2, 1) } Error in endsWith(2, 1) : non-character object(s) ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testEndsWith# #{ endsWith(c("abc", "xyz", "ade"), "b") } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testEndsWith# #{ endsWith(c("abc", "xyz", "ade"), "c") } [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testStartsWith# #{ startsWith("abc", "a") } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testStartsWith# #{ startsWith("abc", "b") } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testStartsWith# #{ startsWith("abc", 1) } Error in startsWith("abc", 1) : non-character object(s) ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testStartsWith# #{ startsWith(2, "1") } Error in startsWith(2, "1") : non-character object(s) ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testStartsWith# #{ startsWith(2, 1) } Error in startsWith(2, 1) : non-character object(s) ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testStartsWith# #{ startsWith(c("abc", "xyz", "ade"), "a") } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_starts_endsWith.testStartsWith# #{ startsWith(c("abc", "xyz", "ade"), "b") } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_stderr.teststderr1# # .Internal(stderr()) A connection with description "stderr" class "terminal" mode "w" text "text" opened "opened" can read "no" can write "yes" ##com.oracle.truffle.r.test.builtins.TestBuiltin_stdin.teststdin1# # .Internal(stdin()) A connection with description "stdin" class "terminal" mode "r" text "text" opened "opened" can read "yes" can write "no" ##com.oracle.truffle.r.test.builtins.TestBuiltin_stopifnot.testStopifnotBasicUsage# #stopifnot(1 == 1, all.equal(pi, 3.14159265), 1 < 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_stopifnot.testStopifnotBasicUsage# #stopifnot(4 < 5, 7 < 10, T) ##com.oracle.truffle.r.test.builtins.TestBuiltin_stopifnot.testStopifnotBasicUsage# #stopifnot(4 < 5, 7 > 10, T) Error: 7 > 10 is not TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_stopifnot.testStopifnotBasicUsage# #stopifnot(exprs = { 4 < 5; 7 < 10; T }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_stopifnot.testStopifnotBasicUsage#Output.IgnoreErrorContext# #stopifnot(exprs = { 4 < 5; 7 > 10; T }) Error: 7 > 10 is not TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_stopifnot.testStopifnotFastPathBailoutWithSideEffect# #{ global <- 42; foo <- function() { if (global == 42) { global <<- 44; F } else T }; tryCatch(stopifnot(foo()), error=function(x) cat(x$message,'\n')); global } foo() is not TRUE [1] 44 ##com.oracle.truffle.r.test.builtins.TestBuiltin_stopifnot.testStopifnotFastPathConditionThrowsError# #{ foo <- function() { stop('my error') }; stopifnot(foo()) } Error in foo() : my error ##com.oracle.truffle.r.test.builtins.TestBuiltin_stopifnot.testStopifnotFastPathWithWarning# #{ foo <- function(a) { if (a != 42L) warning('my warning'); a }; stopifnot(foo(33) < 42) } Warning message: In foo(33) : my warning ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemode.testStorageMode# #{storage.mode(1)} [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemode.testStorageMode# #{storage.mode(c(1,2,3))} [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemode.testStorageMode# #{storage.mode(c)} [1] "function" ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemode.testStorageMode# #{storage.mode(f<-function(){1})} [1] "function" ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemode.testStorageMode# #{x<-1;storage.mode(x)<-"character"} ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemode.testStorageMode# #{x<-1;storage.mode(x)<-"logical";x} [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemode.teststoragemode1# #argv <- structure(list(x = structure(c(1, 0.666666666666667, 0.333333333333333, 0, -0.333333333333333, -0.666666666666667, -1, -1.33333333333333, -1.66666666666667, 1.5, 1, 0.5, 0, -0.5, -1, -1.5, -2, -2.5, 3, 2, 1, 0, -1, -2, -3, -4, -5, -Inf, -Inf, -Inf, NaN, Inf, Inf, Inf, Inf, Inf, -3, -2, -1, 0, 1, 2, 3, 4, 5, -1.5, -1, -0.5, 0, 0.5, 1, 1.5, 2, 2.5, -1, -0.666666666666667, -0.333333333333333, 0, 0.333333333333333, 0.666666666666667, 1, 1.33333333333333, 1.66666666666667, -0.75, -0.5, -0.25, 0, 0.25, 0.5, 0.75, 1, 1.25, -0.6, -0.4, -0.2, 0, 0.2, 0.4, 0.6, 0.8, 1), .Dim = c(9L, 9L))), .Names = 'x');do.call('storage.mode', argv) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testErrors# #{ x <- 1; storage.mode(x) <- 42.5; } Error in storage.mode(x) <- 42.5 : 'value' must be non-null character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testErrors#Output.IgnoreErrorMessage# #{ x <- as.pairlist(1); storage.mode(x) <- 'integer'; } ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testErrors#Output.IgnoreErrorMessage# #{ x <- new.env(); storage.mode(x) <- 'integer'; } Error in storage.mode(x) <- "integer" : environments cannot be coerced to other types ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testErrors#Output.IgnoreErrorMessage# #{ x <- quote(a+b); storage.mode(x) <- 'integer'; } Error in storage.mode(x) <- "integer" : 'language' object cannot be coerced to type 'integer' ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testUpdateStorageMode# #{ x <- c(1L, 2L); dim(x)<-c(1,2); storage.mode(x) <- "double"; x} [,1] [,2] [1,] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testUpdateStorageMode# #{ x <- c(1L, 2L); storage.mode(x) <- "double"} ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testUpdateStorageMode# #{ x <- c(1L, 2L); storage.mode(x) <- "not.double"} Error in storage.mode(x) <- "not.double" : invalid value ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testUpdateStorageModeWithNull# #{ x <- NULL; storage.mode(x) <- 'character'; x } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testUpdateStorageModeWithNull# #{ x <- NULL; storage.mode(x) <- 'double'; x } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testUpdateStorageModeWithNull# #{ x <- NULL; storage.mode(x) <- 'integer'; x } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testUpdateStorageModeWithNull# #{ x <- NULL; storage.mode(x) <- 'logical'; x } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testUpdateStorageModeWithNull# #{ x <- NULL; storage.mode(x) <- 'numeric'; x } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.testUpdateStorageModeWithNull# #{ x <- NULL; storage.mode(x) <- 'raw'; x } raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.teststoragemodeassign1# #argv <- list(structure(c(4L, 5L, 10L, 9L, 13L, 13L, 12L, 15L, 18L, 19L, 22L, 27L, 28L, 24L, 27L, 28L, 30L, 31L, 32L, 36L, 28L, 32L, 35L, 33L, 38L, 41L, 38L, 38L, 32L, 34L, 44L, 44L, 44L, 46L, 47L, 49L, 50L, 53L, 52L, 55L, 54L, 60L, 63L, 86L, 85L, 85L, 78L, 74L, 97L, 98L, 98L, 99L, 99L, 101L, 108L, 110L, 108L, 111L, 115L, 117L, 70L, 77L, 83L, 61L, 69L, 78L, 66L, 58L, 64L, 69L, 66L, 61L, 76L, 72L, 64L, 53L, 63L, 59L, 77L, 49L, 69L, 88L, 75L, 61L, 65L, 74L, 72L, 76L, 58L, 55L, 60L, 52L, 60L, 61L, 72L, 147L, 149L, 153L, 154L, 151L, 150L, 145L, 143L, 143L, 141L, 156L, 149L, 143L, 142L, 149L, 152L, 142L, 144L, 152L, 155L, 124L, 136L, 139L, 132L, 115L, 96L, 94L, 96L, 122L, 116L, 124L, 119L, 128L, 115L, 111L, 111L, 116L, 126L, 117L, 115L, 4L, 12L, 21L, 15L, 15L, 16L, 18L, 13L, 20L, 21L, 23L, 25L, 27L, 31L, 30L), .Dim = c(75L, 2L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75'), c('x', 'y'))), value = 'double');`storage.mode<-`(argv[[1]],argv[[2]]); x y 1 4 53 2 5 63 3 10 59 4 9 77 5 13 49 6 13 69 7 12 88 8 15 75 9 18 61 10 19 65 11 22 74 12 27 72 13 28 76 14 24 58 15 27 55 16 28 60 17 30 52 18 31 60 19 32 61 20 36 72 21 28 147 22 32 149 23 35 153 24 33 154 25 38 151 26 41 150 27 38 145 28 38 143 29 32 143 30 34 141 31 44 156 32 44 149 33 44 143 34 46 142 35 47 149 36 49 152 37 50 142 38 53 144 39 52 152 40 55 155 41 54 124 42 60 136 43 63 139 44 86 132 45 85 115 46 85 96 47 78 94 48 74 96 49 97 122 50 98 116 51 98 124 52 99 119 53 99 128 54 101 115 55 108 111 56 110 111 57 108 116 58 111 126 59 115 117 60 117 115 61 70 4 62 77 12 63 83 21 64 61 15 65 69 15 66 78 16 67 66 18 68 58 13 69 64 20 70 69 21 71 66 23 72 61 25 73 76 27 74 72 31 75 64 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.teststoragemodeassign2# #argv <- list(3.14159265358979, value = 'complex');`storage.mode<-`(argv[[1]],argv[[2]]); [1] 3.141593+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.teststoragemodeassign3# #argv <- list(structure(c(FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE), .Dim = c(4L, 4L)), value = 'integer');`storage.mode<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [,4] [1,] 0 0 0 1 [2,] 0 0 1 0 [3,] 0 1 0 0 [4,] 1 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.teststoragemodeassign4# #argv <- list(structure(c(2, 0, 1, 2), .Dim = c(2L, 2L), .Dimnames = list(c('A', 'B'), c('A', 'B'))), value = 'logical');`storage.mode<-`(argv[[1]],argv[[2]]); A B A TRUE TRUE B FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign.teststoragemodeassign5# #argv <- list(structure(c(2.5, 0, 0.75, 0, 2.5, -2.5, 0.75, -2.5, 2.8), .Dim = c(3L, 3L)), value = 'double');`storage.mode<-`(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] 2.50 0.0 0.75 [2,] 0.00 2.5 -2.50 [3,] 0.75 -2.5 2.80 ##com.oracle.truffle.r.test.builtins.TestBuiltin_storagemodeassign_.teststoragemodeassign_1# #argv <- structure(list(structure(c(0, 1, 2), .Dim = c(3L, 1L)), value = 'integer'), .Names = c('', 'value'));do.call('storage.mode<-', argv) [,1] [1,] 0 [2,] 1 [3,] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2expression.test# #str2expression('NULL') expression(NULL) ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2expression.testParseDataFrame# #eval(str2expression(deparse(data.frame(x=c(1))))) x 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2expression.testParseVector# #str2expression(deparse(c(1, 2, 3))) expression(c(1, 2, 3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2expression.testParseVector# #{ str2expression(c('for (i in 1:10) {', ' x[i] <- i', '}')) } expression(for (i in 1:10) { x[i] <- i }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testReturnValue# #{ num <- str2lang('1.375'); typeof(num) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testReturnValue# #{ qa <- str2lang('abc'); !is.call(qa) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testReturnValue# #{ qa <- str2lang('abc'); is.symbol(qa) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testReturnValue# #{ qa <- str2lang('log(y)'); is.call(qa) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testSimpleCalls# #{ str2lang('1 + 1') } 1 + 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testSimpleCalls# #{ str2lang('abc') } abc ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testSimpleCalls# #{ str2lang('abs(1 + 1)') } abs(1 + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testSimpleCalls# #{ str2lang('log(y)') } log(y) ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testSimpleCalls# #{ str2lang('x[3] <- 1+4') } x[3] <- 1 + 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testWrongArguments#Output.IgnoreErrorMessage# #{ str2lang(1) } Error in str2lang(s) : argument must be character ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testWrongArguments#Output.IgnoreErrorMessage# #{ str2lang(1:3) } Error in str2lang(s) : argument must be character ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testWrongArguments#Output.IgnoreErrorMessage# #{ str2lang(NA) } Error in str2lang(s) : argument must be character ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testWrongArguments#Output.IgnoreErrorMessage# #{ str2lang(NULL) } Error in str2lang(s) : argument must be character ##com.oracle.truffle.r.test.builtins.TestBuiltin_str2lang.testWrongArguments#Output.IgnoreErrorMessage# #{ str2lang(c('a', 'b')) } Error in str2lang(s) : argument must be a character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.testArgsCasts#Output.IgnoreErrorContext# #{ .Internal(strptime('','',)); } Error in .Internal(strptime("", "", )) : argument 3 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.testArgsCasts#Output.IgnoreErrorContext# #{ .Internal(strptime('',,'')); } Error in .Internal(strptime("", , "")) : argument 2 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.testArgsCasts# #{ .Internal(strptime('1970-01-01 0:3:22', '%H:%M:%S', 'UTC')); } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.testArgsCasts#Output.IgnoreErrorContext# #{ .Internal(strptime(,'','')); } Error in .Internal(strptime(, "", "")) : argument 1 is empty ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.teststrptime1# #argv <- list('2008-04-22 09:45', '%Y-%m-%d', ''); .Internal(strptime(argv[[1]], argv[[2]], argv[[3]])) [1] "2008-04-22 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.teststrptime10# #argv <- list(c('1937/01/01', '1916/01/01', '1913/01/01', '1927/01/01', '1947/01/01', '1913/01/01', '1917/01/01', '1923/01/01', '1921/01/01', '1926/01/01', '1920/01/01', '1915/01/01', '1914/01/01', '1914/01/01', '1914/01/01', '1919/01/01', '1948/01/01', '1911/01/01', '1909/01/01', '1913/01/01', '1925/01/01', '1926/01/01', '1910/01/01', '1917/01/01', '1936/01/01', '1938/01/01', '1960/01/01', '1915/01/01', '1919/01/01', '1924/01/01', '1914/01/01', '1905/01/01', '1921/01/01', '1929/01/01', '1926/01/01', '1921/01/01', '1908/01/01', '1928/01/01', '1919/01/01', '1921/01/01', '1925/01/01', '1934/01/01', '1927/01/01', '1928/01/01', '1934/01/01', '1922/01/01', '1923/01/01', '1915/01/01', '1934/01/01', '1925/01/01', '1922/01/01', '1930/01/01', '1924/01/01', '1923/01/01', '1919/01/01', '1932/01/01', '1930/01/01', '1923/01/01', '1930/01/01', '1922/01/01', '1919/01/01', '1932/01/01', '1939/01/01', '1923/01/01', '1920/01/01', '1919/01/01', '1952/01/01', '1927/01/01', '1924/01/01', '1919/01/01', '1925/01/01', '1945/01/01', '1916/01/01', '1943/01/01', '1920/01/01', '1920/01/01', '1931/01/01', '1924/01/01', '1919/01/01', '1926/01/01', '1920/01/01', '1952/01/01', '1919/01/01', '1930/01/01', '1925/01/01', '1924/01/01', '1926/01/01', '1918/01/01', '1922/01/01', '1921/01/01', '1925/01/01', '1928/01/01', '1925/01/01', '1929/01/01', '1933/01/01', '1947/01/01', '1950/01/01', '1945/01/01', '1924/01/01', '1939/01/01', '1924/01/01', '1933/01/01', '1928/01/01'), '%Y/%m/%d', ''); .Internal(strptime(argv[[1]], argv[[2]], argv[[3]])) [1] "1937-01-01 GMT" "1916-01-01 GMT" "1913-01-01 GMT" "1927-01-01 GMT" [5] "1947-01-01 GMT" "1913-01-01 GMT" "1917-01-01 GMT" "1923-01-01 GMT" [9] "1921-01-01 GMT" "1926-01-01 GMT" "1920-01-01 GMT" "1915-01-01 GMT" [13] "1914-01-01 GMT" "1914-01-01 GMT" "1914-01-01 GMT" "1919-01-01 GMT" [17] "1948-01-01 GMT" "1911-01-01 GMT" "1909-01-01 GMT" "1913-01-01 GMT" [21] "1925-01-01 GMT" "1926-01-01 GMT" "1910-01-01 GMT" "1917-01-01 GMT" [25] "1936-01-01 GMT" "1938-01-01 GMT" "1960-01-01 GMT" "1915-01-01 GMT" [29] "1919-01-01 GMT" "1924-01-01 GMT" "1914-01-01 GMT" "1905-01-01 GMT" [33] "1921-01-01 GMT" "1929-01-01 GMT" "1926-01-01 GMT" "1921-01-01 GMT" [37] "1908-01-01 GMT" "1928-01-01 GMT" "1919-01-01 GMT" "1921-01-01 GMT" [41] "1925-01-01 GMT" "1934-01-01 GMT" "1927-01-01 GMT" "1928-01-01 GMT" [45] "1934-01-01 GMT" "1922-01-01 GMT" "1923-01-01 GMT" "1915-01-01 GMT" [49] "1934-01-01 GMT" "1925-01-01 GMT" "1922-01-01 GMT" "1930-01-01 GMT" [53] "1924-01-01 GMT" "1923-01-01 GMT" "1919-01-01 GMT" "1932-01-01 GMT" [57] "1930-01-01 GMT" "1923-01-01 GMT" "1930-01-01 GMT" "1922-01-01 GMT" [61] "1919-01-01 GMT" "1932-01-01 GMT" "1939-01-01 GMT" "1923-01-01 GMT" [65] "1920-01-01 GMT" "1919-01-01 GMT" "1952-01-01 GMT" "1927-01-01 GMT" [69] "1924-01-01 GMT" "1919-01-01 GMT" "1925-01-01 GMT" "1945-01-01 GMT" [73] "1916-01-01 GMT" "1943-01-01 GMT" "1920-01-01 GMT" "1920-01-01 GMT" [77] "1931-01-01 GMT" "1924-01-01 GMT" "1919-01-01 GMT" "1926-01-01 GMT" [81] "1920-01-01 GMT" "1952-01-01 GMT" "1919-01-01 GMT" "1930-01-01 GMT" [85] "1925-01-01 GMT" "1924-01-01 GMT" "1926-01-01 GMT" "1918-01-01 GMT" [89] "1922-01-01 GMT" "1921-01-01 GMT" "1925-01-01 GMT" "1928-01-01 GMT" [93] "1925-01-01 GMT" "1929-01-01 GMT" "1933-01-01 GMT" "1947-01-01 GMT" [97] "1950-01-01 GMT" "1945-01-01 GMT" "1924-01-01 GMT" "1939-01-01 GMT" [101] "1924-01-01 GMT" "1933-01-01 GMT" "1928-01-01 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.teststrptime2# #argv <- list(character(0), '%X', ''); .Internal(strptime(argv[[1]], argv[[2]], argv[[3]])) POSIXlt of length 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.teststrptime3# #argv <- list('1970-01-01', '%Y-%m-%d %H:%M', 'GMT'); .Internal(strptime(argv[[1]], argv[[2]], argv[[3]])) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.teststrptime4# #argv <- list('2007-11-06', '%Y-%m-%d', 'GMT'); .Internal(strptime(argv[[1]], argv[[2]], argv[[3]])) [1] "2007-11-06 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.teststrptime5# #argv <- list('1970-01-01', '%Y-%m-%d', 'GMT'); .Internal(strptime(argv[[1]], argv[[2]], argv[[3]])) [1] "1970-01-01 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.teststrptime6# #argv <- list(c('2007-11-06', NA), '%Y-%m-%d', ''); .Internal(strptime(argv[[1]], argv[[2]], argv[[3]])) [1] "2007-11-06 GMT" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.teststrptime7# #argv <- list(c('20010101', NA, NA, '20041026'), '%Y%m%d', 'GMT'); .Internal(strptime(argv[[1]], argv[[2]], argv[[3]])) [1] "2001-01-01 GMT" NA NA "2004-10-26 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.teststrptime8# #argv <- list('2002-02-02 02:02', '%Y-%m-%d %H:%M', ''); .Internal(strptime(argv[[1]], argv[[2]], argv[[3]])) [1] "2002-02-02 02:02:00 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strptime.teststrptime9# #argv <- list(c('1890/01/01', '1891/01/01', '1892/01/01', '1893/01/01', '1894/01/01', '1895/01/01'), '%Y/%m/%d', ''); .Internal(strptime(argv[[1]], argv[[2]], argv[[3]])) [1] "1890-01-01 GMT" "1891-01-01 GMT" "1892-01-01 GMT" "1893-01-01 GMT" [5] "1894-01-01 GMT" "1895-01-01 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strrep.testArgsCasts# #if (!any(R.version$engine == "FastR")) { cat("character(0)\n") } else { .Internal(strrep('aa', NULL)) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_strrep.testArgsCasts# #if (!any(R.version$engine == "FastR")) { cat("character(0)\n") } else { .Internal(strrep(NULL, 5)) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_strrep.testArgsCasts# #{ .Internal(strrep('', ) } Error: unexpected '}' in "{ .Internal(strrep('', ) }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strrep.testArgsCasts# #{ .Internal(strrep(, '') } Error: unexpected '}' in "{ .Internal(strrep(, '') }" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strrep.testStrrep# #{ strrep("ABC", 2) } [1] "ABCABC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strrep.testStrrep# #{ strrep("X", 1 : 5) } [1] "X" "XX" "XXX" "XXXX" "XXXXX" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strrep.testStrrep# #{ strrep(c("A", "B", "C"), 1 : 3) } [1] "A" "BB" "CCC" ##com.oracle.truffle.r.test.builtins.TestBuiltin_strsplit.testStrSplit#Ignored.ImplementationError# #strsplit('/some/path/to/somewhere' , '^(?=/)(?!//)|(?= 3.0.3) ') } [1] "R (>= 3.0.3)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('\\s*$', '', 'Ä', perl=TRUE) } [1] "Ä" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([1[:alpha:].]+).*$', '\\1', '1R.ff (>= 3.0.3)') } [1] "1R.ff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:alnum:].]+).*$', '\\1', 'R (>= 3.0.3)') } [1] "R" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:alnum:]]*).*$', '\\1', 'aZ45j%$ ') } [1] "aZ45j" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:alpha:]]*).*$', '\\1', 'aZ45j%$ ') } [1] "aZ" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:blank:]]*).*$', '\\1', ' \ta45j%$ ') } [1] " \t" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:cntrl:]]*).*$', '\\1', '\ta45j%$ ') } [1] "\t" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:digit:]]*).*$', '\\1', '12a45j%$ ') } [1] "12" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:graph:]]*).*$', '\\1', 'a45j%$ ') } [1] "a45j%$" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:lower:]]*).*$', '\\1', 'a45j%$ ') } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:print:]]*).*$', '\\1', 'a45j%$ ') } [1] "a45j%$ " ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:punct:]]*).*$', '\\1', '.,/a45j%$ ') } [1] ".,/" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:space:]]*).*$', '\\1', ' a45j%$ ') } [1] " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:upper:]]*).*$', '\\1', 'AASDFAa45j%$ ') } [1] "AASDFA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^([[:xdigit:]]*).*$', '\\1', '1234abABhxa45j%$ ') } [1] "1234abAB" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('^[[:space:]]*(.*)', '\\1', 'R (>= 3.0.3)') } [1] "R (>= 3.0.3)" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub('~', '\\\\X', '~') } [1] "\\X" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub(pattern = 'a*', replacement = 'x', x = 'ÄaaaaÄ', perl = TRUE) } [1] "xÄaaaaÄ" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub(pattern = 'a*', replacement = 'x', x = 'ÄaÄ', perl = TRUE) } [1] "xÄaÄ" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testSub# #{ sub(pattern = 'Ä*', replacement = 'x', x = 'aÄÄÄÄÄb', perl = TRUE) } [1] "xaÄÄÄÄÄb" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub1# #argv <- list('^..dfd.', '', c('aa', '..dfd.row.names'), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "aa" "row.names" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub10# #argv <- list('^[[:space:]]*([[:alnum:].]+).*$', '\\1', structure('MASS', .Names = 'Suggests'), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) Suggests "MASS" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub11# #argv <- list(' +$', '', c(NA, '1', NA, '2', '1', NA, NA, '1', '4', '1', NA, '4', '1', '3', NA, '4', '2', '2', NA, '4', '4', '2', '4', '4', '2', '1', '4', '4', '3', '1', '1', '4', '1', '4', NA, '1', '4', '4', '2', '2', '4', '4', '3', '4', '2', '2', '3', '3', '4', '1', '1', '1', '4', '1', '4', '4', '4', '4', NA, '4', '4', '4', NA, '1', '2', '3', '4', '3', '4', '2', '4', '4', '1', '4', '1', '4', NA, '4', '2', '1', '4', '1', '1', '1', '4', '4', '2', '4', '1', '1', '1', '4', '1', '1', '1', '4', '3', '1', '4', '3', '2', '4', '3', '1', '4', '2', '4', NA, '4', '4', '4', '2', '1', '4', '4', NA, '2', '4', '4', '1', '1', '1', '1', '4', '1', '2', '3', '2', '1', '4', '4', '4', '1', NA, '4', '2', '2', '2', '4', '4', '3', '3', '4', '2', '4', '3', '1', '1', '4', '2', '4', '3', '1', '4', '3', '4', '4', '1', '1', '4', '4', '3', '1', '1', '2', '1', '3', '4', '2', '2', '2', '4', '4', '3', '2', '1', '1', '4', '1', '1', '2', NA, '2', '3', '3', '2', '1', '1', '1', '1', '4', '4', '4', '4', '4', '4', '2', '2', '1', '4', '1', '4', '3', '4', '2', '3', '1', '3', '1', '4', '1', '4', '1', '4', '3', '3', '4', '4', '1', NA, '3', '4', '4', '4', '4', '4', '4', '3', '4', '3', '4', '2', '4', '4', '1', '2', NA, '4', '4', '4', '4', '1', '2', '1', '1', '2', '1', '4', '2', '3', '1', '4', '4', '4', '1', '2', '1', '4', '2', '1', '3', '1', '2', '2', '1', '2', '1', NA, '3', '2', '2', '4', '1', '4', '4', '2', '4', '4', '4', '2', '1', '4', '2', '4', '4', '4', '4', '4', '1', '3', '4', '3', '4', '1', NA, '4', NA, '1', '1', '1', '4', '4', '4', '4', '2', '4', '3', '2', NA, '1', '4', '4', '3', '4', '4', '4', '2', '4', '2', '1', '4', '4', NA, '4', '4', '3', '3', '4', '2', '2', '4', '1', '4', '4', '4', '3', '4', '4', '4', '3', '2', '1', '3', '1', '4', '1', '4', '2', NA, '1', '4', '4', '3', '1', '4', '1', '4', '1', '4', '4', '1', '2', '2', '1', '4', '1', '1', '4', NA, '4', NA, '4', '4', '4', '1', '4', '2', '1', '2', '2', '2', '2', '1', '1', '2', '1', '4', '2', '3', '3', '1', '3', '1', '4', '1', '3', '2', '2', '4', '1', NA, '3', '4', '2', '4', '4', '4', '4', '4', '4', '3', '4', '4', '3', '2', '1', '4', '4', '2', '4', '2', '1', '2', '1', '1', '1', '1', '4', '4', '1', '1', '4', '1', '4', '4', '4', '1', '1', NA, '3', '2', '4', '4', '4', '4', '2', '3', '3', '2', NA, '4', '2', '4', '4', '1', '1', '4', '4', '1', '1', '4', '1', '2', '2', '2', '2', '1', '4', '4', '1', '2', '2', '2', '3', '4', '4', '3', '4', '1', '1', '4', '4', NA, '4', '1', '4', '4', '4', '1', '4', '4', '1', '2', '4', '4', '4', '4', '1', '2', '4', '4', '2', '1', '4', '2', '4', '2', '2', '4', '1', '3', '3', '2', '4', '1', '4', '4', '4', '1', NA, '4', '4', '2', '4', '4', '4', '4', '4', '2', NA, '4', '2', '4', '3', '1', '4', '4', '3', '4', '2', '4', '4', '1', '2', '1', '4', '1', '3', '3', '1', '4', '4', '2', '4', '4', '4', '4', '3', '2', '3', '3', '2', NA, '3', '4', '4', '3', '3', '4', '4', '4', '1', '4', '4', '4', '4', '4', '4', '4', '2', '4', '2', '3', '4', '1', '3', '1', NA, '4', '1', '2', '2', '1', '4', '3', '3', '4', '1', '1', '3'), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] NA "1" NA "2" "1" NA NA "1" "4" "1" NA "4" "1" "3" NA "4" "2" "2" [19] NA "4" "4" "2" "4" "4" "2" "1" "4" "4" "3" "1" "1" "4" "1" "4" NA "1" [37] "4" "4" "2" "2" "4" "4" "3" "4" "2" "2" "3" "3" "4" "1" "1" "1" "4" "1" [55] "4" "4" "4" "4" NA "4" "4" "4" NA "1" "2" "3" "4" "3" "4" "2" "4" "4" [73] "1" "4" "1" "4" NA "4" "2" "1" "4" "1" "1" "1" "4" "4" "2" "4" "1" "1" [91] "1" "4" "1" "1" "1" "4" "3" "1" "4" "3" "2" "4" "3" "1" "4" "2" "4" NA [109] "4" "4" "4" "2" "1" "4" "4" NA "2" "4" "4" "1" "1" "1" "1" "4" "1" "2" [127] "3" "2" "1" "4" "4" "4" "1" NA "4" "2" "2" "2" "4" "4" "3" "3" "4" "2" [145] "4" "3" "1" "1" "4" "2" "4" "3" "1" "4" "3" "4" "4" "1" "1" "4" "4" "3" [163] "1" "1" "2" "1" "3" "4" "2" "2" "2" "4" "4" "3" "2" "1" "1" "4" "1" "1" [181] "2" NA "2" "3" "3" "2" "1" "1" "1" "1" "4" "4" "4" "4" "4" "4" "2" "2" [199] "1" "4" "1" "4" "3" "4" "2" "3" "1" "3" "1" "4" "1" "4" "1" "4" "3" "3" [217] "4" "4" "1" NA "3" "4" "4" "4" "4" "4" "4" "3" "4" "3" "4" "2" "4" "4" [235] "1" "2" NA "4" "4" "4" "4" "1" "2" "1" "1" "2" "1" "4" "2" "3" "1" "4" [253] "4" "4" "1" "2" "1" "4" "2" "1" "3" "1" "2" "2" "1" "2" "1" NA "3" "2" [271] "2" "4" "1" "4" "4" "2" "4" "4" "4" "2" "1" "4" "2" "4" "4" "4" "4" "4" [289] "1" "3" "4" "3" "4" "1" NA "4" NA "1" "1" "1" "4" "4" "4" "4" "2" "4" [307] "3" "2" NA "1" "4" "4" "3" "4" "4" "4" "2" "4" "2" "1" "4" "4" NA "4" [325] "4" "3" "3" "4" "2" "2" "4" "1" "4" "4" "4" "3" "4" "4" "4" "3" "2" "1" [343] "3" "1" "4" "1" "4" "2" NA "1" "4" "4" "3" "1" "4" "1" "4" "1" "4" "4" [361] "1" "2" "2" "1" "4" "1" "1" "4" NA "4" NA "4" "4" "4" "1" "4" "2" "1" [379] "2" "2" "2" "2" "1" "1" "2" "1" "4" "2" "3" "3" "1" "3" "1" "4" "1" "3" [397] "2" "2" "4" "1" NA "3" "4" "2" "4" "4" "4" "4" "4" "4" "3" "4" "4" "3" [415] "2" "1" "4" "4" "2" "4" "2" "1" "2" "1" "1" "1" "1" "4" "4" "1" "1" "4" [433] "1" "4" "4" "4" "1" "1" NA "3" "2" "4" "4" "4" "4" "2" "3" "3" "2" NA [451] "4" "2" "4" "4" "1" "1" "4" "4" "1" "1" "4" "1" "2" "2" "2" "2" "1" "4" [469] "4" "1" "2" "2" "2" "3" "4" "4" "3" "4" "1" "1" "4" "4" NA "4" "1" "4" [487] "4" "4" "1" "4" "4" "1" "2" "4" "4" "4" "4" "1" "2" "4" "4" "2" "1" "4" [505] "2" "4" "2" "2" "4" "1" "3" "3" "2" "4" "1" "4" "4" "4" "1" NA "4" "4" [523] "2" "4" "4" "4" "4" "4" "2" NA "4" "2" "4" "3" "1" "4" "4" "3" "4" "2" [541] "4" "4" "1" "2" "1" "4" "1" "3" "3" "1" "4" "4" "2" "4" "4" "4" "4" "3" [559] "2" "3" "3" "2" NA "3" "4" "4" "3" "3" "4" "4" "4" "1" "4" "4" "4" "4" [577] "4" "4" "4" "2" "4" "2" "3" "4" "1" "3" "1" NA "4" "1" "2" "2" "1" "4" [595] "3" "3" "4" "1" "1" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub12#Output.IgnoreWhitespace# #argv <- list('.* : ', '', structure('Error in rnorm(2, c(1, NA)) : (converted from warning) NAs produced\n', class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rnorm(2, c(1, NA)))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "(converted from warning) NAs produced\n" attr(,"class") [1] "try-error" attr(,"condition") ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub13#Output.IgnoreWhitespace# #argv <- list('.* : ', '', structure('Error in rexp(2, numeric()) : (converted from warning) NAs produced\n', class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rexp(2, numeric()))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "(converted from warning) NAs produced\n" attr(,"class") [1] "try-error" attr(,"condition") ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub14#Output.IgnoreWhitespace# #argv <- list('.* : ', '', structure('Error in rnorm(2, numeric()) : (converted from warning) NAs produced\n', class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rnorm(2, numeric()))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "(converted from warning) NAs produced\n" attr(,"class") [1] "try-error" attr(,"condition") ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub15#Output.IgnoreWhitespace# #argv <- list('.* : ', '', structure('Error in rnorm(1, sd = Inf) : (converted from warning) NAs produced\n', class = 'try-error', condition = structure(list(message = '(converted from warning) NAs produced', call = quote(rnorm(1, sd = Inf))), .Names = c('message', 'call'), class = c('simpleError', 'error', 'condition'))), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "(converted from warning) NAs produced\n" attr(,"class") [1] "try-error" attr(,"condition") ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub16# #argv <- list('^ +', '', c('1_', 'Weight', 'Cylinders4', 'Cylinders5', 'Cylinders6', 'Cylinders8', 'Cylindersrotary', 'TypeLarge', 'TypeMidsize', 'TypeSmall', 'TypeSporty', 'TypeVan', 'EngineSize', 'DriveTrainFront', 'DriveTrainRear'), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "1_" "Weight" "Cylinders4" "Cylinders5" [5] "Cylinders6" "Cylinders8" "Cylindersrotary" "TypeLarge" [9] "TypeMidsize" "TypeSmall" "TypeSporty" "TypeVan" [13] "EngineSize" "DriveTrainFront" "DriveTrainRear" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub17# #argv <- list('^msgstr[[:blank:]]+[\'](.*)[\'][[:blank:]]*$', '\\1', 'msgstr \' \'', FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] " " ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub18# #argv <- list('.*Content-Type:[^\\]*charset=([^\\[:space:]]*)[[:space:]]*\\\\n.*', '\\1', 'Project-Id-Version: lattice 0.20-10\\nReport-Msgid-Bugs-To: bugs@r-project.org\\nPOT-Creation-Date: 2012-03-10 14:42\\nPO-Revision-Date: 2012-08-31 16:36+0100\\nLast-Translator: \305\201ukasz Daniel \\nLanguage-Team: \305\201ukasz Daniel \\nLanguage: pl_PL\\nMIME-Version: 1.0\\nContent-Type: text/plain; charset=UTF-8\\nContent-Transfer-Encoding: 8bit\\nPlural-Forms: nplurals=3; plural=(n==1 ? 0 : n%10>=2 && n%10<=4 && (n%100<10 || n%100>=20) ? 1 : 2)\\nX-Poedit-SourceCharset: iso-8859-1\\n', FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "UTF-8" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub19# #argv <- list('([^:]*):(.*)', '\\2', character(0), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub2# #argv <- list('[b-e]', '.', c('The', 'licenses', 'for', 'most', 'software', 'are', 'designed', 'to', 'take', 'away', 'your', 'freedom', 'to', 'share', 'and', 'change', 'it.', '', 'By', 'contrast,', 'the', 'GNU', 'General', 'Public', 'License', 'is', 'intended', 'to', 'guarantee', 'your', 'freedom', 'to', 'share', 'and', 'change', 'free', 'software', '--', 'to', 'make', 'sure', 'the', 'software', 'is', 'free', 'for', 'all', 'its', 'users'), FALSE, TRUE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "Th." "li.enses" "for" "most" "softwar." "ar." [7] ".esigned" "to" "tak." "away" "your" "fr.edom" [13] "to" "shar." "an." ".hange" "it." "" [19] "By" ".ontrast," "th." "GNU" "G.neral" "Pu.lic" [25] "Li.ense" "is" "int.nded" "to" "guarant.e" "your" [31] "fr.edom" "to" "shar." "an." ".hange" "fr.e" [37] "softwar." "--" "to" "mak." "sur." "th." [43] "softwar." "is" "fr.e" "for" "all" "its" [49] "us.rs" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub3# #argv <- list('%bm', 'http://www.bioconductor.org', c('@CRAN@', 'http://www.stats.ox.ac.uk/pub/RWin', '%bm/packages/%v/bioc', '%bm/packages/%v/data/annotation', '%bm/packages/%v/data/experiment', '%bm/packages/%v/extra', 'http://www.omegahat.org/R', 'http://R-Forge.R-project.org', 'http://www.rforge.net'), FALSE, FALSE, TRUE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "@CRAN@" [2] "http://www.stats.ox.ac.uk/pub/RWin" [3] "http://www.bioconductor.org/packages/%v/bioc" [4] "http://www.bioconductor.org/packages/%v/data/annotation" [5] "http://www.bioconductor.org/packages/%v/data/experiment" [6] "http://www.bioconductor.org/packages/%v/extra" [7] "http://www.omegahat.org/R" [8] "http://R-Forge.R-project.org" [9] "http://www.rforge.net" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub4# #argv <- list('^ \036 ', '\036', c('', ' \036 Merged in a set of Splus code changes that had accumulated at Mayo', ' over the course of a decade. The primary one is a change in how', ' indexing is done in the underlying C code, which leads to a major', ' speed increase for large data sets. Essentially, for the lower', ' leaves all our time used to be eaten up by bookkeeping, and this', ' was replaced by a different approach. The primary routine also', ' uses .Call{} so as to be more memory efficient.', '', ' \036 The other major change was an error for asymmetric loss matrices,', ' prompted by a user query. With L=loss asymmetric, the altered', ' priors were computed incorrectly - they were using L\' instead of L.', ' Upshot - the tree would not not necessarily choose optimal splits', ' for the given loss matrix. Once chosen, splits were evaluated', ' correctly. The printed “improvement” values are of course the', ' wrong ones as well. It is interesting that for my little test', ' case, with L quite asymmetric, the early splits in the tree are', ' unchanged - a good split still looks good.', '', ' \036 Add the return.all argument to xpred.rpart().', '', ' \036 Added a set of formal tests, i.e., cases with known answers to', ' which we can compare.', '', ' \036 Add a usercode vignette, explaining how to add user defined', ' splitting functions.', '', ' \036 The class method now also returns the node probability.', '', ' \036 Add the stagec data set, used in some tests.', '', ' \036 The plot.rpart routine needs to store a value that will be visible', ' to the rpartco routine at a later time. This is now done in an', ' environment in the namespace.', ''), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "" [2] "\036Merged in a set of Splus code changes that had accumulated at Mayo" [3] " over the course of a decade. The primary one is a change in how" [4] " indexing is done in the underlying C code, which leads to a major" [5] " speed increase for large data sets. Essentially, for the lower" [6] " leaves all our time used to be eaten up by bookkeeping, and this" [7] " was replaced by a different approach. The primary routine also" [8] " uses .Call{} so as to be more memory efficient." [9] "" [10] "\036The other major change was an error for asymmetric loss matrices," [11] " prompted by a user query. With L=loss asymmetric, the altered" [12] " priors were computed incorrectly - they were using L' instead of L." [13] " Upshot - the tree would not not necessarily choose optimal splits" [14] " for the given loss matrix. Once chosen, splits were evaluated" [15] " correctly. The printed “improvement” values are of course the" [16] " wrong ones as well. It is interesting that for my little test" [17] " case, with L quite asymmetric, the early splits in the tree are" [18] " unchanged - a good split still looks good." [19] "" [20] "\036Add the return.all argument to xpred.rpart()." [21] "" [22] "\036Added a set of formal tests, i.e., cases with known answers to" [23] " which we can compare." [24] "" [25] "\036Add a usercode vignette, explaining how to add user defined" [26] " splitting functions." [27] "" [28] "\036The class method now also returns the node probability." [29] "" [30] "\036Add the stagec data set, used in some tests." [31] "" [32] "\036The plot.rpart routine needs to store a value that will be visible" [33] " to the rpartco routine at a later time. This is now done in an" [34] " environment in the namespace." [35] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub5# #argv <- list('./', '', structure(c('./data', './html', './po/en@quot/LC_MESSAGES', './po/en@quot', './po/pl/LC_MESSAGES', './po/pl', './po/de/LC_MESSAGES', './po/de', './po', './doc/SuiteSparse', './doc', './Meta', './include', './R', './help', './libs', './external'), class = 'AsIs'), FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "data" "html" "po/en@quot/LC_MESSAGES" [4] "po/en@quot" "po/pl/LC_MESSAGES" "po/pl" [7] "po/de/LC_MESSAGES" "po/de" "po" [10] "doc/SuiteSparse" "doc" "Meta" [13] "include" "R" "help" [16] "libs" "external" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub6# #argv <- list('\'', '\\\'', '\\method{as.dist}{default}', FALSE, FALSE, TRUE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "\\method{as.dist}{default}" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub7# #argv <- list('(\\w)(\\w*)(\\w)', '\\U\\1\\E\\2\\U\\3', 'useRs may fly into JFK or laGuardia', FALSE, TRUE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "UseRS may fly into JFK or laGuardia" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub8# #argv <- list('^(msgstr)\\[([[:digit:]]+)\\].*$', '\\1\\\\[\\2\\\\]', 'msgstr[0] \'%d ligne de poids nul non comptabilise\'', FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "msgstr\\[0\\]" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sub.testsub9# #argv <- list('[[:space:]]*$', '', 'identical() has a new argument, ignore.environment, used when\ncomparing functions (with default FALSE as before).\n\n\036There is a new option, options(CBoundsCheck=), which controls how\n.C() and .Fortran() pass arguments to compiled code. If true\n(which can be enabled by setting the environment variable\nR_C_BOUNDS_CHECK to yes), raw, integer, double and complex\narguments are always copied, and checked for writing off either end\nof the array on return from the compiled code (when a second copy\nis made). This also checks individual elements of character\nvectors passed to .C().\n\nThis is not intended for routine use, but can be very helpful in\nfinding segfaults in package code.\n\n\036In layout(), the limits on the grid size have been raised (again).\n\n\036New simple provideDimnames() utility function.\n\n\036Where methods for length() return a double value which is\nrepresentable as an integer (as often happens for package Matrix),\nthis is converted to an integer.\n\n\036Matrix indexing of dataframes by two-column numeric indices is now\nsupported for replacement as well as extraction.\n\n\036setNames() now has a default for its object argument, useful for a\ncharacter result.\n\n\036StructTS() has a revised additive constant in the loglik component\nof the result: the previous definition is returned as the loglik0\ncomponent. However, the help page has always warned of a lack of\ncomparability of log-likelihoods for non-stationary models.\n(Suggested by Jouni Helske.)\n\n\036The logic in aggregate.formula() has been revised. It is now\npossible to use a formula stored in a variable; previously, it had\nto be given explicitly in the function call.\n\n\036install.packages() has a new argument quiet to reduce the amount of\noutput shown.\n\n\036Setting an element of the graphics argument lwd to a negative or\ninfinite value is now an error. Lines corresponding to elements\nwith values NA or NaN are silently omitted.\n\nPreviously the behaviour was device-dependent.\n\n\036Setting graphical parameters cex, col, lty, lwd and pch in par()\nnow requires a length-one argument. Previously some silently took\nthe first element of a longer vector, but not always when\ndocumented to do so.\n\n\036Sys.which() when used with inputs which would be unsafe in a shell\n(e.g. absolute paths containing spaces) now uses appropriate\nquoting.\n\n\036as.tclObj() has been extended to handle raw vectors. Previously,\nit only worked in the other direction. (Contributed by Charlie\nFriedemann, PR#14939.)\n\n\036New functions cite() and citeNatbib() have been added, to allow\ngeneration of in-text citations from \'bibentry\' objects. A cite()\nfunction may be added to bibstyle() environments.\n\n\036A sort() method has been added for \'bibentry\' objects.\n\n\036The bibstyle() function now defaults to setting the default\nbibliography style. The getBibstyle() function has been added to\nreport the name of the current default style.\n\n\036scatter.smooth() now has an argument lpars to pass arguments to\nlines().\n\n\036pairs() has a new log argument, to allow some or all variables to\nbe plotted on logarithmic scale. (In part, wish of PR#14919.)\n\n\036split() gains a sep argument.\n\n\036termplot() does a better job when given a model with interactions\n(and no longer attempts to plot interaction terms).\n\n\036The parser now incorporates code from Romain Francois\' parser\npackage, to support more detailed computation on the code, such as\nsyntax highlighting, comment-based documentation, etc. Functions\ngetParseData() and getParseText() access the data.\n\n\036There is a new function rep_len() analogous to rep.int() for when\nspeed is required (and names are not).\n\n\036The undocumented use rep(NULL, length.out = n) for n > 0 (which\nreturns NULL) now gives a warning.\n\n\036demo() gains an encoding argument for those packages with non-ASCII\ndemos: it defaults to the package encoding where there is one.\n\n\036strwrap() converts inputs with a marked encoding to the current\nlocale: previously it made some attempt to pass through as bytes\ninputs invalid in the current locale.\n\n\036Specifying both rate and scale to [dpqr]gamma is a warning (if they\nare essentially the same value) or an error.\n\n\036merge() works in more cases where the data frames include matrices.\n(Wish of PR#14974.)\n\n\036optimize() and uniroot() no longer use a shared parameter object\nacross calls. (nlm(), nlminb() and optim() with numerical\nderivatives still do, as documented.)\n\n\036The all.equal() method for date-times is now documented: times are\nregarded as equal (by default) if they differ by up to 1 msec.\n\n\036duplicated() and unique() gain a nmax argument which can be used to\nmake them much more efficient when it is known that there are only\na small number of unique entries. This is done automatically for\nfactors.\n\n\036Functions rbinom(), rgeom(), rhyper(), rpois(), rnbinom(),\nrsignrank() and rwilcox() now return integer (not double) vectors.\nThis halves the storage requirements for large simulations.\n\n\036sort(), sort.int() and sort.list() now use radix sorting for\nfactors of less than 100,000 levels when method is not supplied.\nSo does order() if called with a single factor, unless na.last =\nNA.\n\n\036diag() as used to generate a diagonal matrix has been re-written in\nC for speed and less memory usage. It now forces the result to be\nnumeric in the case diag(x) since it is said to have ‘zero\noff-diagonal entries’.\n\n\036backsolve() (and forwardsolve()) are now internal functions, for\nspeed and support for large matrices.\n\n\036More matrix algebra functions (e.g. chol() and solve()) accept\nlogical matrices (and coerce to numeric).\n\n\036sample.int() has some support for n >= 2^31: see its help for the\nlimitations.\n\nA different algorithm is used for (n, size, replace = FALSE, prob =\nNULL) for n > 1e7 and size <= n/2. This is much faster and uses\nless memory, but does give different results.\n\n\036approxfun() and splinefun() now return a wrapper to an internal\nfunction in the stats namespace rather than a .C() or .Call() call.\nThis is more likely to work if the function is saved and used in a\ndifferent session.\n\n\036The functions .C(), .Call(), .External() and .Fortran() now give an\nerror (rather than a warning) if called with a named first\nargument.\n\n\036Sweave() by default now reports the locations in the source file(s)\nof each chunk.\n\n\036clearPushBack() is now a documented interface to a long-existing\ninternal call.\n\n\036aspell() gains filters for R code, Debian Control Format and\nmessage catalog files, and support for R level dictionaries. In\naddition, package utils now provides functions\naspell_package_R_files() and aspell_package_C_files() for spell\nchecking R and C level message strings in packages.\n\n\036bibentry() gains some support for “incomplete” entries with a\ncrossref field.\n\n\036gray() and gray.colors() finally allow alpha to be specified.\n\n\036monthplot() gains parameters to control the look of the reference\nlines. (Suggestion of Ian McLeod.)\n\n\036Added support for new %~% relation (“is distributed as”) in\nplotmath.\n\n\036domain = NA is accepted by gettext() and ngettext(), analogously to\nstop() etc.\n\n\036termplot() gains a new argument plot = FALSE which returns\ninformation to allow the plots to be modified for use as part of\nother plots, but does not plot them. (Contributed by Terry\nTherneau, PR#15076.)\n\n\036quartz.save(), formerly an undocumented part of R.app, is now\navailable to copy a device to a quartz() device. dev.copy2pdf()\noptionally does this for PDF output: quartz.save() defaults to PNG.\n\n\036The default method of pairs() now allows text.panel = NULL and the\nuse of .panel = NULL is now documented.\n\n\036setRefClass() and getRefClass() now return class generator\nfunctions, similar to setClass(), but still with the reference\nfields and methods as before (suggestion of Romain Francois).\n\n\036New functions bitwNot(), bitwAnd(), bitwOr() and bitwXor(), using\nthe internal interfaces previously used for classes \'octmode\' and\n\'hexmode\'.\n\nAlso bitwShiftL() and bitwShiftR() for shifting bits in elements of\ninteger vectors.\n\n\036New option \'deparse.cutoff\' to control the deparsing of language\nobjects such as calls and formulae when printing. (Suggested by a\ncomment of Sarah Goslee.)\n\n\036colors() gains an argument distinct.\n\n\036New demo(colors) and demo(hclColors), with utility functions.\n\n\036list.files() (aka dir()) gains a new optional argument no.. which\nallows to exclude \'.\' and \'..\' from listings.\n\n\036Multiple time series are also of class \'matrix\'; consequently,\nhead(), e.g., is more useful.\n\n\036encodeString() preserves UTF-8 marked encodings. Thus if factor\nlevels are marked as UTF-8 an attempt is made to print them in\nUTF-8 in RGui on Windows.\n\n\036readLines() and scan() (and hence read.table()) in a UTF-8 locale\nnow discard a UTF-8 byte-order-mark (BOM). Such BOMs are allowed\nbut not recommended by the Unicode Standard: however Microsoft\napplications can produce them and so they are sometimes found on\nwebsites.\n\nThe encoding name \'UTF-8-BOM\' for a connection will ensure that a\nUTF-8 BOM is discarded.\n\n\036mapply(FUN, a1, ..) now also works when a1 (or a further such\nargument) needs a length() method (which the documented arguments\nnever do). (Requested by Hervé Pagès; with a patch.)\n\n\036.onDetach() is supported as an alternative to .Last.lib. Unlike\n.Last.lib, this does not need to be exported from the package\'s\nnamespace.\n\n\036The srcfile argument to parse() may now be a character string, to\nbe used in error messages.\n\n\036The format() method for ftable objects gains a method argument,\npropagated to write.ftable() and print(), allowing more compact\noutput, notably for LaTeX formatting, thanks to Marius Hofert.\n\n\036The utils::process.events() function has been added to trigger\nimmediate event handling.\n\n\036Sys.which() now returns NA (not \'\') for NA inputs (related to\nPR#15147).\n\n\036The print() method for class \'htest\' gives fewer trailing spaces\n(wish of PR#15124).\n\nAlso print output from HoltWinters(), nls() and others.\n\n\036loadNamespace() allows a version specification to be given, and\nthis is used to check version specifications given in the Imports\nfield when a namespace is loaded.\n\n\036setClass() has a new argument, slots, clearer and less ambiguous\nthan representation. It is recommended for future code, but should\nbe back-compatible. At the same time, the allowed slot\nspecification is slightly more general. See the documentation for\ndetails.\n\n\036mget() now has a default for envir (the frame from which it is\ncalled), for consistency with get() and assign().\n\n\036close() now returns an integer status where available, invisibly.\n(Wish of PR#15088.)\n\n\036The internal method of tar() can now store paths too long for the\nustar format, using the (widely supported) GNU extension. It can\nalso store long link names, but these are much less widely\nsupported. There is support for larger files, up to the ustar\nlimit of 8GB.\n\n\036Local reference classes have been added to package methods. These\nare a technique for avoiding unneeded copying of large components\nof objects while retaining standard R functional behavior. See\n?LocalReferenceClasses.\n\n\036untar() has a new argument restore_times which if false (not the\ndefault) discards the times in the tarball. This is useful if they\nare incorrect (some tarballs submitted to CRAN have times in a\nlocal timezone or many years in the past even though the standard\nrequired them to be in UTC).\n\n\036replayplot() cannot (and will not attempt to) replay plots recorded\nunder R < 3.0.0. It may crash the R session if an attempt is made\nto replay plots created in a different build of R >= 3.0.0.\n\n\036Palette changes get recorded on the display list, so replaying\nplots (including when resizing screen devices and using dev.copy())\nwill work better when the palette is changed during a plot.\n\n\036chol(pivot = TRUE) now defaults to LAPACK, not LINPACK.\n\n\036The parse() function has a new parameter keep.source, which\ndefaults to options(\'keep.source\').\n\n\036Profiling via Rprof() now optionally records information at the\nstatement level, not just the function level.\n\n\036The Rprof() function now quotes function names in in its output\nfile on Windows, to be consistent with the quoting in Unix.\n\n\036Profiling via Rprof() now optionally records information about time\nspent in GC.\n\n\036The HTML help page for a package now displays non-vignette\ndocumentation files in a more accessible format.\n\n\036To support options(stringsAsFactors = FALSE), model.frame(),\nmodel.matrix() and replications() now automatically convert\ncharacter vectors to factors without a warning.\n\n\036The print method for objects of class \'table\' now detects tables\nwith 0-extents and prints the results as, e.g., < table of extent 0\nx 1 x 2 >. (Wish of PR#15198.)\n\n\036Deparsing involving calls to anonymous functions and has been made\ncloser to reversible by the addition of extra parentheses.\n\n\036The function utils::packageName() has been added as a lightweight\nversion of methods::getPackageName().\n\n\036find.package(lib.loc = NULL) now treats loaded namespaces\npreferentially in the same way as attached packages have been for a\nlong time.\n\n\036In Windows, the Change Directory dialog now defaults to the current\nworking directory, rather than to the last directory chosen in that\ndialog.\n\n\036available.packages() gains a \'license/restricts_use\' filter which\nretains only packages for which installation can proceed solely\nbased on packages which are guaranteed not to restrict use.\n\n\036New check_packages_in_dir() function in package tools for\nconveniently checking source packages along with their reverse\ndependencies.\n\n\036R\'s completion mechanism has been improved to handle help requests\n(starting with a question mark). In particular, help prefixes are\nnow supported, as well as quoted help topics. To support this,\ncompletion inside quotes are now handled by R by default on all\nplatforms.\n\n\036The memory manager now allows the strategy used to balance garbage\ncollection and memory growth to be controlled by setting the\nenvironment variable R_GC_MEM_GROW. See ?Memory for more details.\n\n\036(‘For experts only’, as the introductory manual says.) The use of\nenvironment variables R_NSIZE and R_VSIZE to control the initial (=\nminimum) garbage collection trigger for number of cons cels and\nsize of heap has been restored: they can be overridden by the\ncommand-line options --min-nsize and --min-vsize; see ?Memory.\n\n\036On Windows, the device name for bitmap devices as reported by\n.Device and .Devices no longer includes the file name. This is for\nconsistency with other platforms and was requested by the lattice\nmaintainer.\n\nwin.metafile() still uses the file name: the exact form is used by\npackage tkrplot.\n\n\036set.seed(NULL) re-initializes .Random.seed as done at the beginning\nof the session if not already set. (Suggestion of Bill Dunlap.)\n\n\036The breaks argument in hist.default() can now be a function that\nreturns the breakpoints to be used (previously it could only return\nthe suggested number of breakpoints).\n\n\036File share/licenses/licenses.db has some clarifications, especially\nas to which variants of ‘BSD’ and ‘MIT’ is intended and how to\napply them to packages. The problematic licence ‘Artistic-1.0’ has\nbeen removed.\n', FALSE, FALSE, FALSE, FALSE); .Internal(sub(argv[[1]], argv[[2]], argv[[3]], argv[[4]], argv[[5]], argv[[6]], argv[[7]])) [1] "identical() has a new argument, ignore.environment, used when\ncomparing functions (with default FALSE as before).\n\n\036There is a new option, options(CBoundsCheck=), which controls how\n.C() and .Fortran() pass arguments to compiled code. If true\n(which can be enabled by setting the environment variable\nR_C_BOUNDS_CHECK to yes), raw, integer, double and complex\narguments are always copied, and checked for writing off either end\nof the array on return from the compiled code (when a second copy\nis made). This also checks individual elements of character\nvectors passed to .C().\n\nThis is not intended for routine use, but can be very helpful in\nfinding segfaults in package code.\n\n\036In layout(), the limits on the grid size have been raised (again).\n\n\036New simple provideDimnames() utility function.\n\n\036Where methods for length() return a double value which is\nrepresentable as an integer (as often happens for package Matrix),\nthis is converted to an integer.\n\n\036Matrix indexing of dataframes by two-column numeric indices is now\nsupported for replacement as well as extraction.\n\n\036setNames() now has a default for its object argument, useful for a\ncharacter result.\n\n\036StructTS() has a revised additive constant in the loglik component\nof the result: the previous definition is returned as the loglik0\ncomponent. However, the help page has always warned of a lack of\ncomparability of log-likelihoods for non-stationary models.\n(Suggested by Jouni Helske.)\n\n\036The logic in aggregate.formula() has been revised. It is now\npossible to use a formula stored in a variable; previously, it had\nto be given explicitly in the function call.\n\n\036install.packages() has a new argument quiet to reduce the amount of\noutput shown.\n\n\036Setting an element of the graphics argument lwd to a negative or\ninfinite value is now an error. Lines corresponding to elements\nwith values NA or NaN are silently omitted.\n\nPreviously the behaviour was device-dependent.\n\n\036Setting graphical parameters cex, col, lty, lwd and pch in par()\nnow requires a length-one argument. Previously some silently took\nthe first element of a longer vector, but not always when\ndocumented to do so.\n\n\036Sys.which() when used with inputs which would be unsafe in a shell\n(e.g. absolute paths containing spaces) now uses appropriate\nquoting.\n\n\036as.tclObj() has been extended to handle raw vectors. Previously,\nit only worked in the other direction. (Contributed by Charlie\nFriedemann, PR#14939.)\n\n\036New functions cite() and citeNatbib() have been added, to allow\ngeneration of in-text citations from 'bibentry' objects. A cite()\nfunction may be added to bibstyle() environments.\n\n\036A sort() method has been added for 'bibentry' objects.\n\n\036The bibstyle() function now defaults to setting the default\nbibliography style. The getBibstyle() function has been added to\nreport the name of the current default style.\n\n\036scatter.smooth() now has an argument lpars to pass arguments to\nlines().\n\n\036pairs() has a new log argument, to allow some or all variables to\nbe plotted on logarithmic scale. (In part, wish of PR#14919.)\n\n\036split() gains a sep argument.\n\n\036termplot() does a better job when given a model with interactions\n(and no longer attempts to plot interaction terms).\n\n\036The parser now incorporates code from Romain Francois' parser\npackage, to support more detailed computation on the code, such as\nsyntax highlighting, comment-based documentation, etc. Functions\ngetParseData() and getParseText() access the data.\n\n\036There is a new function rep_len() analogous to rep.int() for when\nspeed is required (and names are not).\n\n\036The undocumented use rep(NULL, length.out = n) for n > 0 (which\nreturns NULL) now gives a warning.\n\n\036demo() gains an encoding argument for those packages with non-ASCII\ndemos: it defaults to the package encoding where there is one.\n\n\036strwrap() converts inputs with a marked encoding to the current\nlocale: previously it made some attempt to pass through as bytes\ninputs invalid in the current locale.\n\n\036Specifying both rate and scale to [dpqr]gamma is a warning (if they\nare essentially the same value) or an error.\n\n\036merge() works in more cases where the data frames include matrices.\n(Wish of PR#14974.)\n\n\036optimize() and uniroot() no longer use a shared parameter object\nacross calls. (nlm(), nlminb() and optim() with numerical\nderivatives still do, as documented.)\n\n\036The all.equal() method for date-times is now documented: times are\nregarded as equal (by default) if they differ by up to 1 msec.\n\n\036duplicated() and unique() gain a nmax argument which can be used to\nmake them much more efficient when it is known that there are only\na small number of unique entries. This is done automatically for\nfactors.\n\n\036Functions rbinom(), rgeom(), rhyper(), rpois(), rnbinom(),\nrsignrank() and rwilcox() now return integer (not double) vectors.\nThis halves the storage requirements for large simulations.\n\n\036sort(), sort.int() and sort.list() now use radix sorting for\nfactors of less than 100,000 levels when method is not supplied.\nSo does order() if called with a single factor, unless na.last =\nNA.\n\n\036diag() as used to generate a diagonal matrix has been re-written in\nC for speed and less memory usage. It now forces the result to be\nnumeric in the case diag(x) since it is said to have ‘zero\noff-diagonal entries’.\n\n\036backsolve() (and forwardsolve()) are now internal functions, for\nspeed and support for large matrices.\n\n\036More matrix algebra functions (e.g. chol() and solve()) accept\nlogical matrices (and coerce to numeric).\n\n\036sample.int() has some support for n >= 2^31: see its help for the\nlimitations.\n\nA different algorithm is used for (n, size, replace = FALSE, prob =\nNULL) for n > 1e7 and size <= n/2. This is much faster and uses\nless memory, but does give different results.\n\n\036approxfun() and splinefun() now return a wrapper to an internal\nfunction in the stats namespace rather than a .C() or .Call() call.\nThis is more likely to work if the function is saved and used in a\ndifferent session.\n\n\036The functions .C(), .Call(), .External() and .Fortran() now give an\nerror (rather than a warning) if called with a named first\nargument.\n\n\036Sweave() by default now reports the locations in the source file(s)\nof each chunk.\n\n\036clearPushBack() is now a documented interface to a long-existing\ninternal call.\n\n\036aspell() gains filters for R code, Debian Control Format and\nmessage catalog files, and support for R level dictionaries. In\naddition, package utils now provides functions\naspell_package_R_files() and aspell_package_C_files() for spell\nchecking R and C level message strings in packages.\n\n\036bibentry() gains some support for “incomplete” entries with a\ncrossref field.\n\n\036gray() and gray.colors() finally allow alpha to be specified.\n\n\036monthplot() gains parameters to control the look of the reference\nlines. (Suggestion of Ian McLeod.)\n\n\036Added support for new %~% relation (“is distributed as”) in\nplotmath.\n\n\036domain = NA is accepted by gettext() and ngettext(), analogously to\nstop() etc.\n\n\036termplot() gains a new argument plot = FALSE which returns\ninformation to allow the plots to be modified for use as part of\nother plots, but does not plot them. (Contributed by Terry\nTherneau, PR#15076.)\n\n\036quartz.save(), formerly an undocumented part of R.app, is now\navailable to copy a device to a quartz() device. dev.copy2pdf()\noptionally does this for PDF output: quartz.save() defaults to PNG.\n\n\036The default method of pairs() now allows text.panel = NULL and the\nuse of .panel = NULL is now documented.\n\n\036setRefClass() and getRefClass() now return class generator\nfunctions, similar to setClass(), but still with the reference\nfields and methods as before (suggestion of Romain Francois).\n\n\036New functions bitwNot(), bitwAnd(), bitwOr() and bitwXor(), using\nthe internal interfaces previously used for classes 'octmode' and\n'hexmode'.\n\nAlso bitwShiftL() and bitwShiftR() for shifting bits in elements of\ninteger vectors.\n\n\036New option 'deparse.cutoff' to control the deparsing of language\nobjects such as calls and formulae when printing. (Suggested by a\ncomment of Sarah Goslee.)\n\n\036colors() gains an argument distinct.\n\n\036New demo(colors) and demo(hclColors), with utility functions.\n\n\036list.files() (aka dir()) gains a new optional argument no.. which\nallows to exclude '.' and '..' from listings.\n\n\036Multiple time series are also of class 'matrix'; consequently,\nhead(), e.g., is more useful.\n\n\036encodeString() preserves UTF-8 marked encodings. Thus if factor\nlevels are marked as UTF-8 an attempt is made to print them in\nUTF-8 in RGui on Windows.\n\n\036readLines() and scan() (and hence read.table()) in a UTF-8 locale\nnow discard a UTF-8 byte-order-mark (BOM). Such BOMs are allowed\nbut not recommended by the Unicode Standard: however Microsoft\napplications can produce them and so they are sometimes found on\nwebsites.\n\nThe encoding name 'UTF-8-BOM' for a connection will ensure that a\nUTF-8 BOM is discarded.\n\n\036mapply(FUN, a1, ..) now also works when a1 (or a further such\nargument) needs a length() method (which the documented arguments\nnever do). (Requested by Hervé Pagès; with a patch.)\n\n\036.onDetach() is supported as an alternative to .Last.lib. Unlike\n.Last.lib, this does not need to be exported from the package's\nnamespace.\n\n\036The srcfile argument to parse() may now be a character string, to\nbe used in error messages.\n\n\036The format() method for ftable objects gains a method argument,\npropagated to write.ftable() and print(), allowing more compact\noutput, notably for LaTeX formatting, thanks to Marius Hofert.\n\n\036The utils::process.events() function has been added to trigger\nimmediate event handling.\n\n\036Sys.which() now returns NA (not '') for NA inputs (related to\nPR#15147).\n\n\036The print() method for class 'htest' gives fewer trailing spaces\n(wish of PR#15124).\n\nAlso print output from HoltWinters(), nls() and others.\n\n\036loadNamespace() allows a version specification to be given, and\nthis is used to check version specifications given in the Imports\nfield when a namespace is loaded.\n\n\036setClass() has a new argument, slots, clearer and less ambiguous\nthan representation. It is recommended for future code, but should\nbe back-compatible. At the same time, the allowed slot\nspecification is slightly more general. See the documentation for\ndetails.\n\n\036mget() now has a default for envir (the frame from which it is\ncalled), for consistency with get() and assign().\n\n\036close() now returns an integer status where available, invisibly.\n(Wish of PR#15088.)\n\n\036The internal method of tar() can now store paths too long for the\nustar format, using the (widely supported) GNU extension. It can\nalso store long link names, but these are much less widely\nsupported. There is support for larger files, up to the ustar\nlimit of 8GB.\n\n\036Local reference classes have been added to package methods. These\nare a technique for avoiding unneeded copying of large components\nof objects while retaining standard R functional behavior. See\n?LocalReferenceClasses.\n\n\036untar() has a new argument restore_times which if false (not the\ndefault) discards the times in the tarball. This is useful if they\nare incorrect (some tarballs submitted to CRAN have times in a\nlocal timezone or many years in the past even though the standard\nrequired them to be in UTC).\n\n\036replayplot() cannot (and will not attempt to) replay plots recorded\nunder R < 3.0.0. It may crash the R session if an attempt is made\nto replay plots created in a different build of R >= 3.0.0.\n\n\036Palette changes get recorded on the display list, so replaying\nplots (including when resizing screen devices and using dev.copy())\nwill work better when the palette is changed during a plot.\n\n\036chol(pivot = TRUE) now defaults to LAPACK, not LINPACK.\n\n\036The parse() function has a new parameter keep.source, which\ndefaults to options('keep.source').\n\n\036Profiling via Rprof() now optionally records information at the\nstatement level, not just the function level.\n\n\036The Rprof() function now quotes function names in in its output\nfile on Windows, to be consistent with the quoting in Unix.\n\n\036Profiling via Rprof() now optionally records information about time\nspent in GC.\n\n\036The HTML help page for a package now displays non-vignette\ndocumentation files in a more accessible format.\n\n\036To support options(stringsAsFactors = FALSE), model.frame(),\nmodel.matrix() and replications() now automatically convert\ncharacter vectors to factors without a warning.\n\n\036The print method for objects of class 'table' now detects tables\nwith 0-extents and prints the results as, e.g., < table of extent 0\nx 1 x 2 >. (Wish of PR#15198.)\n\n\036Deparsing involving calls to anonymous functions and has been made\ncloser to reversible by the addition of extra parentheses.\n\n\036The function utils::packageName() has been added as a lightweight\nversion of methods::getPackageName().\n\n\036find.package(lib.loc = NULL) now treats loaded namespaces\npreferentially in the same way as attached packages have been for a\nlong time.\n\n\036In Windows, the Change Directory dialog now defaults to the current\nworking directory, rather than to the last directory chosen in that\ndialog.\n\n\036available.packages() gains a 'license/restricts_use' filter which\nretains only packages for which installation can proceed solely\nbased on packages which are guaranteed not to restrict use.\n\n\036New check_packages_in_dir() function in package tools for\nconveniently checking source packages along with their reverse\ndependencies.\n\n\036R's completion mechanism has been improved to handle help requests\n(starting with a question mark). In particular, help prefixes are\nnow supported, as well as quoted help topics. To support this,\ncompletion inside quotes are now handled by R by default on all\nplatforms.\n\n\036The memory manager now allows the strategy used to balance garbage\ncollection and memory growth to be controlled by setting the\nenvironment variable R_GC_MEM_GROW. See ?Memory for more details.\n\n\036(‘For experts only’, as the introductory manual says.) The use of\nenvironment variables R_NSIZE and R_VSIZE to control the initial (=\nminimum) garbage collection trigger for number of cons cels and\nsize of heap has been restored: they can be overridden by the\ncommand-line options --min-nsize and --min-vsize; see ?Memory.\n\n\036On Windows, the device name for bitmap devices as reported by\n.Device and .Devices no longer includes the file name. This is for\nconsistency with other platforms and was requested by the lattice\nmaintainer.\n\nwin.metafile() still uses the file name: the exact form is used by\npackage tkrplot.\n\n\036set.seed(NULL) re-initializes .Random.seed as done at the beginning\nof the session if not already set. (Suggestion of Bill Dunlap.)\n\n\036The breaks argument in hist.default() can now be a function that\nreturns the breakpoints to be used (previously it could only return\nthe suggested number of breakpoints).\n\n\036File share/licenses/licenses.db has some clarifications, especially\nas to which variants of ‘BSD’ and ‘MIT’ is intended and how to\napply them to packages. The problematic licence ‘Artistic-1.0’ has\nbeen removed." ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testInfiniteIndex# #{ aaa <- c(1,2); aaa[-Inf] } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testInfiniteIndex# #{ aaa <- c(1,2); aaa[Inf] } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testInfiniteIndex# #{ aaa <- c(1,2); aaa[c(-Inf, 1)] } [1] NA 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testInfiniteIndex# #{ aaa <- c(1,2); aaa[c(Inf, 1)] } [1] NA 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSideEffect# #{ x <- c(1, 2, 3, 4); f <- function() { x[1] <<- 10 ; 1 }; .subset(x, f())} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetAssign#Output.IgnoreWarningContext# #{z <- 1 ; f <- function(d) { b <- data.frame(x='a', y='b') ; invisible(b[[{z<<-z+1;1},{z<<-z*2;2},drop=z<<-z*10]]) }; f(0) ; z; f(1L) ; z} [1] 7 Warning messages: 1: In `[[.data.frame`(b, { : named arguments other than 'exact' are discouraged 2: In `[[.data.frame`(b, { : named arguments other than 'exact' are discouraged ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetAssign# #{z <- 1 ; f <- function(d) { b <- data.frame(x='a', y='b') ; invisible(b[{z<<-z+1;1},{z<<-z*2;2},drop=z<<-z*10]) }; f(0) ; z; f(1L) ; z} [1] 421 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetAssign# #{z <- 1 ; f <- function(d) { b <- matrix(1:4,nrow=2,ncol=2) ; invisible(b[[{z<<-z+1;1},{z<<-z*2;2},drop=z<<-z*10]]) }; f(0) ; z; f(1L) ; z} [1] 820 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetAssign# #{z <- 1 ; f <- function(d) { b <- matrix(1:4,nrow=2,ncol=2) ; invisible(b[{z<<-z+1;1},{z<<-z*2;2},drop=z<<-z*10]) }; f(0) ; z; f(1L) ; z} [1] 820 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetAssign# #{z <- c(3,4,2); z[3:1] <- 3:1;} ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- as.pairlist(list(x='a', y='b')); l[[]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- c(1,3,5); l[[]] Error in l[[]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- expression(a+b); l[[]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list('a', 'b'); l[[]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); .subset(l) $x [1] "a" $y [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); f <- function(l, missng) {.subset(l, missng)}; f(l) Error in f(l) : argument "missng" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); f <- function(l, missng) {l[,missng]}; f(l) Error in l[, missng] : incorrect number of dimensions ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); f <- function(l, missng) {l[[,]]}; f(l) Error in l[[, ]] : incorrect number of subscripts ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); f <- function(l, missng) {l[[,missng]]}; f(l) Error in l[[, missng]] : incorrect number of subscripts ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); f <- function(l, missng) {l[[1, missng]]}; f(l) Error in l[[1, missng]] : incorrect number of subscripts ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); f <- function(l, missng) {l[[missng, 1]]}; f(l) Error in l[[missng, 1]] : incorrect number of subscripts ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); f <- function(l, missng) {l[[missng, ]]}; f(l) Error in l[[missng, ]] : incorrect number of subscripts ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); f <- function(l, missng) {l[[missng, missng]]}; f(l) Error in l[[missng, missng]] : incorrect number of subscripts ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); f <- function(l, missng) {l[missng,]}; f(l) Error in l[missng, ] : incorrect number of dimensions ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); f <- function(l, missng) {l[missng]}; f(l) $x [1] "a" $y [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); l[[]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- list(x='a', y='b'); l[] $x [1] "a" $y [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- matrix(1:9, nrow=3); l[[]] Error in l[[]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #l <- quote(a+b); l[[]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {.subset(m,missng)}; f(m) Error in f(m) : argument "missng" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[,,missng]}; f(m) Error in m[, , missng] : incorrect number of dimensions ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[,missng]}; f(m) [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[1,missng]}; f(m) [1] 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[[, missng]]}; f(m) Error in m[[, missng]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[[,]]}; f(m) Error in m[[, ]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[[1, missng]]}; f(m) Error in m[[1, missng]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[[]]}; f(m) Error in m[[]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[[missng, 1]]}; f(m) Error in m[[missng, 1]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[[missng, ]]}; f(m) Error in m[[missng, ]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[[missng, missng]]}; f(m) Error in m[[missng, missng]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[[missng]]}; f(m) Error in m[[missng]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[missng, missng]}; f(m) [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[missng,1]}; f(m) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[missng,]}; f(m) [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); f <- function(m, missng) {m[missng]}; f(m) [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetMissing# #m <- matrix(c(1:4), 2, 2); m[[]] Error in m[[]] : subscript out of bounds ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetTransfersSrcrefAttr# #attributes(parse(text='1+1;bar()', keep.source=T)[1]) $srcref $srcref[[1]] 1+1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetTransfersSrcrefAttr# #attributes(structure(1:3, srcref=list('a', 'b', 'c'))[1]) $srcref $srcref[[1]] [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetTransfersSrcrefAttr# #attributes(structure(1:4, dim=c(2,2), srcref=list('a', 'b', 'c', 'd'))[1,1]) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testSubsetTransfersSrcrefAttr# #attributes(structure(1:4, dim=c(2,2), srcref=list('a', 'b', 'c', 'd'))[c(1,2)]) $srcref $srcref[[1]] [1] "a" $srcref[[2]] [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset1# #argv <- list(structure(list(`Resid. Df` = c(4, 0), `Resid. Dev` = c(5.12914107700115, 7.54951656745095e-15), Df = c(NA, 4), Deviance = c(NA, 5.12914107700114), Rao = c(NA, 5.17320176026795)), .Names = c('Resid. Df', 'Resid. Dev', 'Df', 'Deviance', 'Rao'), row.names = c('1', '2'), class = 'data.frame'), 5L);.subset(argv[[1]],argv[[2]]); $Rao [1] NA 5.173202 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset10# #argv <- list(structure(list(surname = structure(2L, .Label = c('McNeil', 'R Core', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(NA_integer_, .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(NA_integer_, .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = 1L, class = 'data.frame'), 1L);.subset(argv[[1]],argv[[2]]); $surname [1] R Core Levels: McNeil R Core Ripley Tierney Tukey Venables ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset11# #argv <- list(structure(list(height = numeric(0), weight = numeric(0)), .Names = c('height', 'weight'), row.names = integer(0), class = 'data.frame'), 1:2);.subset(argv[[1]],argv[[2]]); $height numeric(0) $weight numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset12# #argv <- list(structure(list(srcfile = c('/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/cloud.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/cloud.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/cloud.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/cloud.R'), frow = c(32L, 33L, 33L, 36L), lrow = c(32L, 33L, 33L, 36L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 4L), class = 'data.frame'), 'frow');.subset(argv[[1]],argv[[2]]); $frow [1] 32 33 33 36 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset13# #argv <- list(structure(list(surname = structure(c(5L, 6L, 4L, 3L, 3L, 1L, 2L), .Label = c('McNeil', 'R Core', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), title = structure(c(2L, 5L, 4L, 6L, 7L, 3L, 1L), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA, 1L, NA, NA, NA, NA, 2L), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('surname', 'title', 'other.author'), row.names = c(NA, -7L), class = 'data.frame'), 1L);.subset(argv[[1]],argv[[2]]); $surname [1] Tukey Venables Tierney Ripley Ripley McNeil R Core Levels: McNeil R Core Ripley Tierney Tukey Venables ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset14# #argv <- list(structure(list(size = 1056, isdir = FALSE, mode = structure(420L, class = 'octmode'), mtime = structure(1393948130.23894, class = c('POSIXct', 'POSIXt')), ctime = structure(1393948130.23894, class = c('POSIXct', 'POSIXt')), atime = structure(1395074550.46596, class = c('POSIXct', 'POSIXt')), uid = 1001L, gid = 1001L, uname = 'roman', grname = 'roman'), .Names = c('size', 'isdir', 'mode', 'mtime', 'ctime', 'atime', 'uid', 'gid', 'uname', 'grname'), class = 'data.frame', row.names = '/home/roman/r-instrumented/library/grid/R/grid'), 'mtime');.subset(argv[[1]],argv[[2]]); $mtime [1] "2014-03-04 15:48:50 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset15# #argv <- list(structure(list(Sepal.Length = c(5.1, 4.9, 4.7, 4.6, 5, 5.4, 4.6, 5, 4.4, 4.9, 5.4, 4.8, 4.8, 4.3, 5.8, 5.7, 5.4, 5.1, 5.7, 5.1, 5.4, 5.1, 4.6, 5.1, 4.8, 5, 5, 5.2, 5.2, 4.7, 4.8, 5.4, 5.2, 5.5, 4.9, 5, 5.5, 4.9, 4.4, 5.1, 5, 4.5, 4.4, 5, 5.1, 4.8, 5.1, 4.6, 5.3, 5, 7, 6.4, 6.9, 5.5, 6.5, 5.7, 6.3, 4.9, 6.6, 5.2, 5, 5.9, 6, 6.1, 5.6, 6.7, 5.6, 5.8, 6.2, 5.6, 5.9, 6.1, 6.3, 6.1, 6.4, 6.6, 6.8, 6.7, 6, 5.7, 5.5, 5.5, 5.8, 6, 5.4, 6, 6.7, 6.3, 5.6, 5.5, 5.5, 6.1, 5.8, 5, 5.6, 5.7, 5.7, 6.2, 5.1, 5.7, 6.3, 5.8, 7.1, 6.3, 6.5, 7.6, 4.9, 7.3, 6.7, 7.2, 6.5, 6.4, 6.8, 5.7, 5.8, 6.4, 6.5, 7.7, 7.7, 6, 6.9, 5.6, 7.7, 6.3, 6.7, 7.2, 6.2, 6.1, 6.4, 7.2, 7.4, 7.9, 6.4, 6.3, 6.1, 7.7, 6.3, 6.4, 6, 6.9, 6.7, 6.9, 5.8, 6.8, 6.7, 6.7, 6.3, 6.5, 6.2, 5.9), Sepal.Width = c(3.5, 3, 3.2, 3.1, 3.6, 3.9, 3.4, 3.4, 2.9, 3.1, 3.7, 3.4, 3, 3, 4, 4.4, 3.9, 3.5, 3.8, 3.8, 3.4, 3.7, 3.6, 3.3, 3.4, 3, 3.4, 3.5, 3.4, 3.2, 3.1, 3.4, 4.1, 4.2, 3.1, 3.2, 3.5, 3.6, 3, 3.4, 3.5, 2.3, 3.2, 3.5, 3.8, 3, 3.8, 3.2, 3.7, 3.3, 3.2, 3.2, 3.1, 2.3, 2.8, 2.8, 3.3, 2.4, 2.9, 2.7, 2, 3, 2.2, 2.9, 2.9, 3.1, 3, 2.7, 2.2, 2.5, 3.2, 2.8, 2.5, 2.8, 2.9, 3, 2.8, 3, 2.9, 2.6, 2.4, 2.4, 2.7, 2.7, 3, 3.4, 3.1, 2.3, 3, 2.5, 2.6, 3, 2.6, 2.3, 2.7, 3, 2.9, 2.9, 2.5, 2.8, 3.3, 2.7, 3, 2.9, 3, 3, 2.5, 2.9, 2.5, 3.6, 3.2, 2.7, 3, 2.5, 2.8, 3.2, 3, 3.8, 2.6, 2.2, 3.2, 2.8, 2.8, 2.7, 3.3, 3.2, 2.8, 3, 2.8, 3, 2.8, 3.8, 2.8, 2.8, 2.6, 3, 3.4, 3.1, 3, 3.1, 3.1, 3.1, 2.7, 3.2, 3.3, 3, 2.5, 3, 3.4, 3), Petal.Length = c(1.4, 1.4, 1.3, 1.5, 1.4, 1.7, 1.4, 1.5, 1.4, 1.5, 1.5, 1.6, 1.4, 1.1, 1.2, 1.5, 1.3, 1.4, 1.7, 1.5, 1.7, 1.5, 1, 1.7, 1.9, 1.6, 1.6, 1.5, 1.4, 1.6, 1.6, 1.5, 1.5, 1.4, 1.5, 1.2, 1.3, 1.4, 1.3, 1.5, 1.3, 1.3, 1.3, 1.6, 1.9, 1.4, 1.6, 1.4, 1.5, 1.4, 4.7, 4.5, 4.9, 4, 4.6, 4.5, 4.7, 3.3, 4.6, 3.9, 3.5, 4.2, 4, 4.7, 3.6, 4.4, 4.5, 4.1, 4.5, 3.9, 4.8, 4, 4.9, 4.7, 4.3, 4.4, 4.8, 5, 4.5, 3.5, 3.8, 3.7, 3.9, 5.1, 4.5, 4.5, 4.7, 4.4, 4.1, 4, 4.4, 4.6, 4, 3.3, 4.2, 4.2, 4.2, 4.3, 3, 4.1, 6, 5.1, 5.9, 5.6, 5.8, 6.6, 4.5, 6.3, 5.8, 6.1, 5.1, 5.3, 5.5, 5, 5.1, 5.3, 5.5, 6.7, 6.9, 5, 5.7, 4.9, 6.7, 4.9, 5.7, 6, 4.8, 4.9, 5.6, 5.8, 6.1, 6.4, 5.6, 5.1, 5.6, 6.1, 5.6, 5.5, 4.8, 5.4, 5.6, 5.1, 5.1, 5.9, 5.7, 5.2, 5, 5.2, 5.4, 5.1), Petal.Width = c(0.2, 0.2, 0.2, 0.2, 0.2, 0.4, 0.3, 0.2, 0.2, 0.1, 0.2, 0.2, 0.1, 0.1, 0.2, 0.4, 0.4, 0.3, 0.3, 0.3, 0.2, 0.4, 0.2, 0.5, 0.2, 0.2, 0.4, 0.2, 0.2, 0.2, 0.2, 0.4, 0.1, 0.2, 0.2, 0.2, 0.2, 0.1, 0.2, 0.2, 0.3, 0.3, 0.2, 0.6, 0.4, 0.3, 0.2, 0.2, 0.2, 0.2, 1.4, 1.5, 1.5, 1.3, 1.5, 1.3, 1.6, 1, 1.3, 1.4, 1, 1.5, 1, 1.4, 1.3, 1.4, 1.5, 1, 1.5, 1.1, 1.8, 1.3, 1.5, 1.2, 1.3, 1.4, 1.4, 1.7, 1.5, 1, 1.1, 1, 1.2, 1.6, 1.5, 1.6, 1.5, 1.3, 1.3, 1.3, 1.2, 1.4, 1.2, 1, 1.3, 1.2, 1.3, 1.3, 1.1, 1.3, 2.5, 1.9, 2.1, 1.8, 2.2, 2.1, 1.7, 1.8, 1.8, 2.5, 2, 1.9, 2.1, 2, 2.4, 2.3, 1.8, 2.2, 2.3, 1.5, 2.3, 2, 2, 1.8, 2.1, 1.8, 1.8, 1.8, 2.1, 1.6, 1.9, 2, 2.2, 1.5, 1.4, 2.3, 2.4, 1.8, 1.8, 2.1, 2.4, 2.3, 1.9, 2.3, 2.5, 2.3, 1.9, 2, 2.3, 1.8), Species = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('setosa', 'versicolor', 'virginica'), class = 'factor')), .Names = c('Sepal.Length', 'Sepal.Width', 'Petal.Length', 'Petal.Width', 'Species'), row.names = c(NA, -150L), class = 'data.frame'), c(FALSE, FALSE, FALSE, FALSE, TRUE));.subset(argv[[1]],argv[[2]]); $Species [1] setosa setosa setosa setosa setosa setosa [7] setosa setosa setosa setosa setosa setosa [13] setosa setosa setosa setosa setosa setosa [19] setosa setosa setosa setosa setosa setosa [25] setosa setosa setosa setosa setosa setosa [31] setosa setosa setosa setosa setosa setosa [37] setosa setosa setosa setosa setosa setosa [43] setosa setosa setosa setosa setosa setosa [49] setosa setosa versicolor versicolor versicolor versicolor [55] versicolor versicolor versicolor versicolor versicolor versicolor [61] versicolor versicolor versicolor versicolor versicolor versicolor [67] versicolor versicolor versicolor versicolor versicolor versicolor [73] versicolor versicolor versicolor versicolor versicolor versicolor [79] versicolor versicolor versicolor versicolor versicolor versicolor [85] versicolor versicolor versicolor versicolor versicolor versicolor [91] versicolor versicolor versicolor versicolor versicolor versicolor [97] versicolor versicolor versicolor versicolor virginica virginica [103] virginica virginica virginica virginica virginica virginica [109] virginica virginica virginica virginica virginica virginica [115] virginica virginica virginica virginica virginica virginica [121] virginica virginica virginica virginica virginica virginica [127] virginica virginica virginica virginica virginica virginica [133] virginica virginica virginica virginica virginica virginica [139] virginica virginica virginica virginica virginica virginica [145] virginica virginica virginica virginica virginica virginica Levels: setosa versicolor virginica ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset16# #argv <- list(structure(list(VAR1 = c(1, 2, 3, 4, 5), VAR2 = c(5, 4, 3, 2, 1), VAR3 = c(1, 1, 1, 1, NA)), .Names = c('VAR1', 'VAR2', 'VAR3'), row.names = c(NA, -5L), class = 'data.frame'), c(1, 3));.subset(argv[[1]],argv[[2]]); $VAR1 [1] 1 2 3 4 5 $VAR3 [1] 1 1 1 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset17# #argv <- list(structure(list(ii = 1:10, xx = c(-9.42477796076938, -6.28318530717959, -3.14159265358979, 0, 3.14159265358979, 6.28318530717959, 9.42477796076938, 12.5663706143592, 15.707963267949, 18.8495559215388)), .Names = c('ii', 'xx'), row.names = c(NA, -10L), class = 'data.frame'), 'C');.subset(argv[[1]],argv[[2]]); $ NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset18# #argv <- list(structure(list(srcfile = c(NA, NA, '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/levelplot.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/levelplot.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/levelplot.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/levelplot.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/levelplot.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/levelplot.R', '/home/lzhao/tmp/RtmpGUHe0I/R.INSTALL2aa51f3e9d31/lattice/R/levelplot.R'), frow = c(NA, NA, 427L, 427L, 432L, 434L, 434L, 438L, 438L), lrow = c(NA, NA, 428L, 428L, 432L, 437L, 437L, 441L, 441L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, 9L), class = 'data.frame'), 'lrow');.subset(argv[[1]],argv[[2]]); $lrow [1] NA NA 428 428 432 437 437 441 441 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset19# #argv <- list(structure(list(x = 1:3, y = structure(4:6, .Dim = c(3L, 1L), class = 'AsIs'), z = structure(c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i'), .Dim = c(3L, 3L), class = 'AsIs')), .Names = c('x', 'y', 'z'), row.names = c(NA, -3L), class = 'data.frame'), 'z');.subset(argv[[1]],argv[[2]]); $z [,1] [,2] [,3] [1,] "a" "d" "g" [2,] "b" "e" "h" [3,] "c" "f" "i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset2# #argv <- list(structure(list(y = structure(c(8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536, 9.79424), .Tsp = c(1962.25, 1971.75, 4), class = 'ts'), lag.quarterly.revenue = c(8.79636, 8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536), price.index = c(4.70997, 4.70217, 4.68944, 4.68558, 4.64019, 4.62553, 4.61991, 4.61654, 4.61407, 4.60766, 4.60227, 4.5896, 4.57592, 4.58661, 4.57997, 4.57176, 4.56104, 4.54906, 4.53957, 4.51018, 4.50352, 4.4936, 4.46505, 4.44924, 4.43966, 4.42025, 4.4106, 4.41151, 4.3981, 4.38513, 4.3732, 4.3277, 4.32023, 4.30909, 4.30909, 4.30552, 4.29627, 4.27839, 4.27789), income.level = c(5.8211, 5.82558, 5.83112, 5.84046, 5.85036, 5.86464, 5.87769, 5.89763, 5.92574, 5.94232, 5.95365, 5.9612, 5.97805, 6.00377, 6.02829, 6.03475, 6.03906, 6.05046, 6.05563, 6.06093, 6.07103, 6.08018, 6.08858, 6.10199, 6.11207, 6.11596, 6.12129, 6.122, 6.13119, 6.14705, 6.15336, 6.15627, 6.16274, 6.17369, 6.16135, 6.18231, 6.18768, 6.19377, 6.2003), market.potential = c(12.9699, 12.9733, 12.9774, 12.9806, 12.9831, 12.9854, 12.99, 12.9943, 12.9992, 13.0033, 13.0099, 13.0159, 13.0212, 13.0265, 13.0351, 13.0429, 13.0497, 13.0551, 13.0634, 13.0693, 13.0737, 13.077, 13.0849, 13.0918, 13.095, 13.0984, 13.1089, 13.1169, 13.1222, 13.1266, 13.1356, 13.1415, 13.1444, 13.1459, 13.152, 13.1593, 13.1579, 13.1625, 13.1664)), .Names = c('y', 'lag.quarterly.revenue', 'price.index', 'income.level', 'market.potential'), row.names = c('1962.25', '1962.5', '1962.75', '1963', '1963.25', '1963.5', '1963.75', '1964', '1964.25', '1964.5', '1964.75', '1965', '1965.25', '1965.5', '1965.75', '1966', '1966.25', '1966.5', '1966.75', '1967', '1967.25', '1967.5', '1967.75', '1968', '1968.25', '1968.5', '1968.75', '1969', '1969.25', '1969.5', '1969.75', '1970', '1970.25', '1970.5', '1970.75', '1971', '1971.25', '1971.5', '1971.75'), class = 'data.frame'), 3L);.subset(argv[[1]],argv[[2]]); $price.index [1] 4.70997 4.70217 4.68944 4.68558 4.64019 4.62553 4.61991 4.61654 4.61407 [10] 4.60766 4.60227 4.58960 4.57592 4.58661 4.57997 4.57176 4.56104 4.54906 [19] 4.53957 4.51018 4.50352 4.49360 4.46505 4.44924 4.43966 4.42025 4.41060 [28] 4.41151 4.39810 4.38513 4.37320 4.32770 4.32023 4.30909 4.30909 4.30552 [37] 4.29627 4.27839 4.27789 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset20# #argv <- list(structure(list(srcfile = c('/home/lzhao/hg/r-instrumented/library/stats/R/stats', '/home/lzhao/hg/r-instrumented/library/stats/R/stats'), frow = 21911:21912, lrow = 21911:21912), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2, class = 'data.frame'), 'frow');.subset(argv[[1]],argv[[2]]); $frow [1] 21911 21912 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset21# #argv <- list(structure(list(z = c(-2.97525101631257, -2.48489962337717, -1.99157511113426, -1.4958325959814, -0.998253002608536, -0.499437269286478, 0, 0.499437269286499, 0.998253002608553, 1.49583259598141, 1.99157511113428, 2.48489962337718, 2.97525101631258), par.vals = structure(c(3.29998649934118, 3.26341935258893, 3.22450701705249, 3.18319718928165, 3.13944811066026, 3.09322935890527, 3.04452243772342, 2.99332114068265, 2.93963167421501, 2.88347253461377, 2.824874144162, 2.76387826147581, 2.70053719000543, -0.454255272277595, -0.454255272277596, -0.454255272277596, -0.454255272277598, -0.454255272277597, -0.454255272277596, -0.454255272277594, -0.454255272277597, -0.454255272277596, -0.454255272277596, -0.454255272277597, -0.454255272277596, -0.454255272277597, -0.292987124681473, -0.292987124681473, -0.292987124681474, -0.292987124681475, -0.292987124681474, -0.292987124681474, -0.292987124681473, -0.292987124681475, -0.292987124681474, -0.292987124681474, -0.292987124681474, -0.292987124681474, -0.292987124681474, -0.255464061617756, -0.218896914865511, -0.179984579329071, -0.138674751558221, -0.0949256729368359, -0.0487069211818519, 1.33790930192987e-15, 0.0512012970407721, 0.104890763508413, 0.161049903109653, 0.219648293561426, 0.280644176247611, 0.34398524771799, -0.599449309335745, -0.49954109111312, -0.399632872890496, -0.299724654667872, -0.199816436445247, -0.099908218222623, 1.42108546079721e-15, 0.0999082182226258, 0.19981643644525, 0.299724654667875, 0.399632872890499, 0.499541091113123, 0.599449309335748), .Dim = c(13L, 5L), .Dimnames = list(NULL, c('(Intercept)', 'outcome2', 'outcome3', 'treatment2', 'treatment3')))), .Names = c('z', 'par.vals'), row.names = c(NA, 13L), class = 'data.frame'), 'par.vals');.subset(argv[[1]],argv[[2]]); $par.vals (Intercept) outcome2 outcome3 treatment2 treatment3 [1,] 3.299986 -0.4542553 -0.2929871 -2.554641e-01 -5.994493e-01 [2,] 3.263419 -0.4542553 -0.2929871 -2.188969e-01 -4.995411e-01 [3,] 3.224507 -0.4542553 -0.2929871 -1.799846e-01 -3.996329e-01 [4,] 3.183197 -0.4542553 -0.2929871 -1.386748e-01 -2.997247e-01 [5,] 3.139448 -0.4542553 -0.2929871 -9.492567e-02 -1.998164e-01 [6,] 3.093229 -0.4542553 -0.2929871 -4.870692e-02 -9.990822e-02 [7,] 3.044522 -0.4542553 -0.2929871 1.337909e-15 1.421085e-15 [8,] 2.993321 -0.4542553 -0.2929871 5.120130e-02 9.990822e-02 [9,] 2.939632 -0.4542553 -0.2929871 1.048908e-01 1.998164e-01 [10,] 2.883473 -0.4542553 -0.2929871 1.610499e-01 2.997247e-01 [11,] 2.824874 -0.4542553 -0.2929871 2.196483e-01 3.996329e-01 [12,] 2.763878 -0.4542553 -0.2929871 2.806442e-01 4.995411e-01 [13,] 2.700537 -0.4542553 -0.2929871 3.439852e-01 5.994493e-01 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset22# #argv <- list(structure(3.14159265358979, class = 'testit'), structure(3.14159265358979, class = 'testit'));.subset(argv[[1]],argv[[2]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset23# #argv <- list(structure(list(Fertility = c(80.2, 83.1, 92.5, 85.8, 76.9), Agriculture = c(17, 45.1, 39.7, 36.5, 43.5), Examination = c(15L, 6L, 5L, 12L, 17L), Education = c(12L, 9L, 5L, 7L, 15L)), .Names = c('Fertility', 'Agriculture', 'Examination', 'Education'), row.names = c('Courtelary', 'Delemont', 'Franches-Mnt', 'Moutier', 'Neuveville'), class = 'data.frame'), 'Ferti');.subset(argv[[1]],argv[[2]]); $ NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset24# #argv <- list(structure(list(size = 131, isdir = FALSE, mode = structure(436L, class = 'octmode'), mtime = structure(1386583148.91412, class = c('POSIXct', 'POSIXt')), ctime = structure(1386583148.91712, class = c('POSIXct', 'POSIXt')), atime = structure(1386583149.16512, class = c('POSIXct', 'POSIXt')), uid = 501L, gid = 501L, uname = 'lzhao', grname = 'lzhao'), .Names = c('size', 'isdir', 'mode', 'mtime', 'ctime', 'atime', 'uid', 'gid', 'uname', 'grname'), class = 'data.frame', row.names = 'startup.Rs'), 'mtime');.subset(argv[[1]],argv[[2]]); $mtime [1] "2013-12-09 09:59:08 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset26# #argv <- structure(list(x = structure(list(Ozone = c(41L, 36L, 12L, 18L, NA, 28L, 23L, 19L, 8L, NA, 7L, 16L, 11L, 14L, 18L, 14L, 34L, 6L, 30L, 11L, 1L, 11L, 4L, 32L, NA, NA, NA, 23L, 45L, 115L, 37L, NA, NA, NA, NA, NA, NA, 29L, NA, 71L, 39L, NA, NA, 23L, NA, NA, 21L, 37L, 20L, 12L, 13L, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 135L, 49L, 32L, NA, 64L, 40L, 77L, 97L, 97L, 85L, NA, 10L, 27L, NA, 7L, 48L, 35L, 61L, 79L, 63L, 16L, NA, NA, 80L, 108L, 20L, 52L, 82L, 50L, 64L, 59L, 39L, 9L, 16L, 78L, 35L, 66L, 122L, 89L, 110L, NA, NA, 44L, 28L, 65L, NA, 22L, 59L, 23L, 31L, 44L, 21L, 9L, NA, 45L, 168L, 73L, NA, 76L, 118L, 84L, 85L, 96L, 78L, 73L, 91L, 47L, 32L, 20L, 23L, 21L, 24L, 44L, 21L, 28L, 9L, 13L, 46L, 18L, 13L, 24L, 16L, 13L, 23L, 36L, 7L, 14L, 30L, NA, 14L, 18L, 20L), Solar.R = c(190L, 118L, 149L, 313L, NA, NA, 299L, 99L, 19L, 194L, NA, 256L, 290L, 274L, 65L, 334L, 307L, 78L, 322L, 44L, 8L, 320L, 25L, 92L, 66L, 266L, NA, 13L, 252L, 223L, 279L, 286L, 287L, 242L, 186L, 220L, 264L, 127L, 273L, 291L, 323L, 259L, 250L, 148L, 332L, 322L, 191L, 284L, 37L, 120L, 137L, 150L, 59L, 91L, 250L, 135L, 127L, 47L, 98L, 31L, 138L, 269L, 248L, 236L, 101L, 175L, 314L, 276L, 267L, 272L, 175L, 139L, 264L, 175L, 291L, 48L, 260L, 274L, 285L, 187L, 220L, 7L, 258L, 295L, 294L, 223L, 81L, 82L, 213L, 275L, 253L, 254L, 83L, 24L, 77L, NA, NA, NA, 255L, 229L, 207L, 222L, 137L, 192L, 273L, 157L, 64L, 71L, 51L, 115L, 244L, 190L, 259L, 36L, 255L, 212L, 238L, 215L, 153L, 203L, 225L, 237L, 188L, 167L, 197L, 183L, 189L, 95L, 92L, 252L, 220L, 230L, 259L, 236L, 259L, 238L, 24L, 112L, 237L, 224L, 27L, 238L, 201L, 238L, 14L, 139L, 49L, 20L, 193L, 145L, 191L, 131L, 223L), Wind = c(7.4, 8, 12.6, 11.5, 14.3, 14.9, 8.6, 13.8, 20.1, 8.6, 6.9, 9.7, 9.2, 10.9, 13.2, 11.5, 12, 18.4, 11.5, 9.7, 9.7, 16.6, 9.7, 12, 16.6, 14.9, 8, 12, 14.9, 5.7, 7.4, 8.6, 9.7, 16.1, 9.2, 8.6, 14.3, 9.7, 6.9, 13.8, 11.5, 10.9, 9.2, 8, 13.8, 11.5, 14.9, 20.7, 9.2, 11.5, 10.3, 6.3, 1.7, 4.6, 6.3, 8, 8, 10.3, 11.5, 14.9, 8, 4.1, 9.2, 9.2, 10.9, 4.6, 10.9, 5.1, 6.3, 5.7, 7.4, 8.6, 14.3, 14.9, 14.9, 14.3, 6.9, 10.3, 6.3, 5.1, 11.5, 6.9, 9.7, 11.5, 8.6, 8, 8.6, 12, 7.4, 7.4, 7.4, 9.2, 6.9, 13.8, 7.4, 6.9, 7.4, 4.6, 4, 10.3, 8, 8.6, 11.5, 11.5, 11.5, 9.7, 11.5, 10.3, 6.3, 7.4, 10.9, 10.3, 15.5, 14.3, 12.6, 9.7, 3.4, 8, 5.7, 9.7, 2.3, 6.3, 6.3, 6.9, 5.1, 2.8, 4.6, 7.4, 15.5, 10.9, 10.3, 10.9, 9.7, 14.9, 15.5, 6.3, 10.9, 11.5, 6.9, 13.8, 10.3, 10.3, 8, 12.6, 9.2, 10.3, 10.3, 16.6, 6.9, 13.2, 14.3, 8, 11.5), Temp = c(67L, 72L, 74L, 62L, 56L, 66L, 65L, 59L, 61L, 69L, 74L, 69L, 66L, 68L, 58L, 64L, 66L, 57L, 68L, 62L, 59L, 73L, 61L, 61L, 57L, 58L, 57L, 67L, 81L, 79L, 76L, 78L, 74L, 67L, 84L, 85L, 79L, 82L, 87L, 90L, 87L, 93L, 92L, 82L, 80L, 79L, 77L, 72L, 65L, 73L, 76L, 77L, 76L, 76L, 76L, 75L, 78L, 73L, 80L, 77L, 83L, 84L, 85L, 81L, 84L, 83L, 83L, 88L, 92L, 92L, 89L, 82L, 73L, 81L, 91L, 80L, 81L, 82L, 84L, 87L, 85L, 74L, 81L, 82L, 86L, 85L, 82L, 86L, 88L, 86L, 83L, 81L, 81L, 81L, 82L, 86L, 85L, 87L, 89L, 90L, 90L, 92L, 86L, 86L, 82L, 80L, 79L, 77L, 79L, 76L, 78L, 78L, 77L, 72L, 75L, 79L, 81L, 86L, 88L, 97L, 94L, 96L, 94L, 91L, 92L, 93L, 93L, 87L, 84L, 80L, 78L, 75L, 73L, 81L, 76L, 77L, 71L, 71L, 78L, 67L, 76L, 68L, 82L, 64L, 71L, 81L, 69L, 63L, 70L, 77L, 75L, 76L, 68L), Month = c(5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 7L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 8L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L), Day = c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L, 31L, 1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 13L, 14L, 15L, 16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, 24L, 25L, 26L, 27L, 28L, 29L, 30L)), .Names = c('Ozone', 'Solar.R', 'Wind', 'Temp', 'Month', 'Day'), class = 'data.frame', row.names = c(NA, -153L)), c(TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, TRUE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE)), .Names = c('x', ''));do.call('subset', argv) Ozone Solar.R Wind Temp Month Day 1 41 190 7.4 67 5 1 2 36 118 8.0 72 5 2 3 12 149 12.6 74 5 3 4 18 313 11.5 62 5 4 7 23 299 8.6 65 5 7 8 19 99 13.8 59 5 8 9 8 19 20.1 61 5 9 12 16 256 9.7 69 5 12 13 11 290 9.2 66 5 13 14 14 274 10.9 68 5 14 15 18 65 13.2 58 5 15 16 14 334 11.5 64 5 16 17 34 307 12.0 66 5 17 18 6 78 18.4 57 5 18 19 30 322 11.5 68 5 19 20 11 44 9.7 62 5 20 21 1 8 9.7 59 5 21 22 11 320 16.6 73 5 22 23 4 25 9.7 61 5 23 24 32 92 12.0 61 5 24 28 23 13 12.0 67 5 28 29 45 252 14.9 81 5 29 30 115 223 5.7 79 5 30 31 37 279 7.4 76 5 31 38 29 127 9.7 82 6 7 40 71 291 13.8 90 6 9 41 39 323 11.5 87 6 10 44 23 148 8.0 82 6 13 47 21 191 14.9 77 6 16 48 37 284 20.7 72 6 17 49 20 37 9.2 65 6 18 50 12 120 11.5 73 6 19 51 13 137 10.3 76 6 20 62 135 269 4.1 84 7 1 63 49 248 9.2 85 7 2 64 32 236 9.2 81 7 3 66 64 175 4.6 83 7 5 67 40 314 10.9 83 7 6 68 77 276 5.1 88 7 7 69 97 267 6.3 92 7 8 70 97 272 5.7 92 7 9 71 85 175 7.4 89 7 10 73 10 264 14.3 73 7 12 74 27 175 14.9 81 7 13 76 7 48 14.3 80 7 15 77 48 260 6.9 81 7 16 78 35 274 10.3 82 7 17 79 61 285 6.3 84 7 18 80 79 187 5.1 87 7 19 81 63 220 11.5 85 7 20 82 16 7 6.9 74 7 21 85 80 294 8.6 86 7 24 86 108 223 8.0 85 7 25 87 20 81 8.6 82 7 26 88 52 82 12.0 86 7 27 89 82 213 7.4 88 7 28 90 50 275 7.4 86 7 29 91 64 253 7.4 83 7 30 92 59 254 9.2 81 7 31 93 39 83 6.9 81 8 1 94 9 24 13.8 81 8 2 95 16 77 7.4 82 8 3 99 122 255 4.0 89 8 7 100 89 229 10.3 90 8 8 101 110 207 8.0 90 8 9 104 44 192 11.5 86 8 12 105 28 273 11.5 82 8 13 106 65 157 9.7 80 8 14 108 22 71 10.3 77 8 16 109 59 51 6.3 79 8 17 110 23 115 7.4 76 8 18 111 31 244 10.9 78 8 19 112 44 190 10.3 78 8 20 113 21 259 15.5 77 8 21 114 9 36 14.3 72 8 22 116 45 212 9.7 79 8 24 117 168 238 3.4 81 8 25 118 73 215 8.0 86 8 26 120 76 203 9.7 97 8 28 121 118 225 2.3 94 8 29 122 84 237 6.3 96 8 30 123 85 188 6.3 94 8 31 124 96 167 6.9 91 9 1 125 78 197 5.1 92 9 2 126 73 183 2.8 93 9 3 127 91 189 4.6 93 9 4 128 47 95 7.4 87 9 5 129 32 92 15.5 84 9 6 130 20 252 10.9 80 9 7 131 23 220 10.3 78 9 8 132 21 230 10.9 75 9 9 133 24 259 9.7 73 9 10 134 44 236 14.9 81 9 11 135 21 259 15.5 76 9 12 136 28 238 6.3 77 9 13 137 9 24 10.9 71 9 14 138 13 112 11.5 71 9 15 139 46 237 6.9 78 9 16 140 18 224 13.8 67 9 17 141 13 27 10.3 76 9 18 142 24 238 10.3 68 9 19 143 16 201 8.0 82 9 20 144 13 238 12.6 64 9 21 145 23 14 9.2 71 9 22 146 36 139 10.3 81 9 23 147 7 49 10.3 69 9 24 148 14 20 16.6 63 9 25 149 30 193 6.9 70 9 26 151 14 191 14.3 75 9 28 152 18 131 8.0 76 9 29 153 20 223 11.5 68 9 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset3# #argv <- list(structure(list(Var1 = c(1L, 2L, 3L, 0L, 1L, 2L, 0L, 1L, 0L), Var2 = c(0L, 0L, 0L, 1L, 1L, 1L, 2L, 2L, 3L)), .Names = c('Var1', 'Var2'), out.attrs = structure(list(dim = c(4L, 4L), dimnames = structure(list(Var1 = c('Var1=0', 'Var1=1', 'Var1=2', 'Var1=3'), Var2 = c('Var2=0', 'Var2=1', 'Var2=2', 'Var2=3')), .Names = c('Var1', 'Var2'))), .Names = c('dim', 'dimnames')), row.names = c(2L, 3L, 4L, 5L, 6L, 7L, 9L, 10L, 13L), class = 'data.frame'), 1);.subset(argv[[1]],argv[[2]]); $Var1 [1] 1 2 3 0 1 2 0 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset4# #argv <- list(structure(list(Population = c(3615, 365, 2212, 2110, 21198, 2541, 3100, 579, 8277, 4931, 868, 813, 11197, 5313, 2861, 2280, 3387, 3806, 1058, 4122, 5814, 9111, 3921, 2341, 4767, 746, 1544, 590, 812, 7333, 1144, 18076, 5441, 637, 10735, 2715, 2284, 11860, 931, 2816, 681, 4173, 12237, 1203, 472, 4981, 3559, 1799, 4589, 376), Income = c(3624, 6315, 4530, 3378, 5114, 4884, 5348, 4809, 4815, 4091, 4963, 4119, 5107, 4458, 4628, 4669, 3712, 3545, 3694, 5299, 4755, 4751, 4675, 3098, 4254, 4347, 4508, 5149, 4281, 5237, 3601, 4903, 3875, 5087, 4561, 3983, 4660, 4449, 4558, 3635, 4167, 3821, 4188, 4022, 3907, 4701, 4864, 3617, 4468, 4566), Illiteracy = c(2.1, 1.5, 1.8, 1.9, 1.1, 0.7, 1.1, 0.9, 1.3, 2, 1.9, 0.6, 0.9, 0.7, 0.5, 0.6, 1.6, 2.8, 0.7, 0.9, 1.1, 0.9, 0.6, 2.4, 0.8, 0.6, 0.6, 0.5, 0.7, 1.1, 2.2, 1.4, 1.8, 0.8, 0.8, 1.1, 0.6, 1, 1.3, 2.3, 0.5, 1.7, 2.2, 0.6, 0.6, 1.4, 0.6, 1.4, 0.7, 0.6), `Life Exp` = c(69.05, 69.31, 70.55, 70.66, 71.71, 72.06, 72.48, 70.06, 70.66, 68.54, 73.6, 71.87, 70.14, 70.88, 72.56, 72.58, 70.1, 68.76, 70.39, 70.22, 71.83, 70.63, 72.96, 68.09, 70.69, 70.56, 72.6, 69.03, 71.23, 70.93, 70.32, 70.55, 69.21, 72.78, 70.82, 71.42, 72.13, 70.43, 71.9, 67.96, 72.08, 70.11, 70.9, 72.9, 71.64, 70.08, 71.72, 69.48, 72.48, 70.29), Murder = c(15.1, 11.3, 7.8, 10.1, 10.3, 6.8, 3.1, 6.2, 10.7, 13.9, 6.2, 5.3, 10.3, 7.1, 2.3, 4.5, 10.6, 13.2, 2.7, 8.5, 3.3, 11.1, 2.3, 12.5, 9.3, 5, 2.9, 11.5, 3.3, 5.2, 9.7, 10.9, 11.1, 1.4, 7.4, 6.4, 4.2, 6.1, 2.4, 11.6, 1.7, 11, 12.2, 4.5, 5.5, 9.5, 4.3, 6.7, 3, 6.9), `HS Grad` = c(41.3, 66.7, 58.1, 39.9, 62.6, 63.9, 56, 54.6, 52.6, 40.6, 61.9, 59.5, 52.6, 52.9, 59, 59.9, 38.5, 42.2, 54.7, 52.3, 58.5, 52.8, 57.6, 41, 48.8, 59.2, 59.3, 65.2, 57.6, 52.5, 55.2, 52.7, 38.5, 50.3, 53.2, 51.6, 60, 50.2, 46.4, 37.8, 53.3, 41.8, 47.4, 67.3, 57.1, 47.8, 63.5, 41.6, 54.5, 62.9), Frost = c(20, 152, 15, 65, 20, 166, 139, 103, 11, 60, 0, 126, 127, 122, 140, 114, 95, 12, 161, 101, 103, 125, 160, 50, 108, 155, 139, 188, 174, 115, 120, 82, 80, 186, 124, 82, 44, 126, 127, 65, 172, 70, 35, 137, 168, 85, 32, 100, 149, 173), Area = c(50708, 566432, 113417, 51945, 156361, 103766, 4862, 1982, 54090, 58073, 6425, 82677, 55748, 36097, 55941, 81787, 39650, 44930, 30920, 9891, 7826, 56817, 79289, 47296, 68995, 145587, 76483, 109889, 9027, 7521, 121412, 47831, 48798, 69273, 40975, 68782, 96184, 44966, 1049, 30225, 75955, 41328, 262134, 82096, 9267, 39780, 66570, 24070, 54464, 97203)), .Names = c('Population', 'Income', 'Illiteracy', 'Life Exp', 'Murder', 'HS Grad', 'Frost', 'Area'), row.names = c('Alabama', 'Alaska', 'Arizona', 'Arkansas', 'California', 'Colorado', 'Connecticut', 'Delaware', 'Florida', 'Georgia', 'Hawaii', 'Idaho', 'Illinois', 'Indiana', 'Iowa', 'Kansas', 'Kentucky', 'Louisiana', 'Maine', 'Maryland', 'Massachusetts', 'Michigan', 'Minnesota', 'Mississippi', 'Missouri', 'Montana', 'Nebraska', 'Nevada', 'New Hampshire', 'New Jersey', 'New Mexico', 'New York', 'North Carolina', 'North Dakota', 'Ohio', 'Oklahoma', 'Oregon', 'Pennsylvania', 'Rhode Island', 'South Carolina', 'South Dakota', 'Tennessee', 'Texas', 'Utah', 'Vermont', 'Virginia', 'Washington', 'West Virginia', 'Wisconsin', 'Wyoming'), class = 'data.frame'), c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE));.subset(argv[[1]],argv[[2]]); named list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset5# #argv <- list(structure(list(war = c(1, 1, 0, 1, 0, 0, 0, 0, 0, 1, 1, 1, 0, 1, 1, 0, 0, 1, 1, 0), fly = c(1, 0, 1, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1), ver = c(1, 1, 0, 1, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 0), end = c(1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, NA, 1, 1, 0, 1, 1, NA, 0), gro = c(0, 0, 1, 1, 0, 0, 0, 1, 0, 1, NA, 0, 0, 1, NA, 0, 0, NA, 1, 0), hai = c(1, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1)), .Names = c('war', 'fly', 'ver', 'end', 'gro', 'hai'), row.names = c('ant', 'bee', 'cat', 'cpl', 'chi', 'cow', 'duc', 'eag', 'ele', 'fly', 'fro', 'her', 'lio', 'liz', 'lob', 'man', 'rab', 'sal', 'spi', 'wha'), class = 'data.frame'), NULL);.subset(argv[[1]],argv[[2]]); named list() ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset6# #argv <- list(structure(list(surname = structure(c('McNeil', 'Ripley', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'AsIs'), nationality = structure(c(1L, 2L, 2L, 3L, 3L, 1L), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(1L, 1L, 1L, 1L, 2L, 1L), .Label = c('no', 'yes'), class = 'factor'), title = structure(c(3L, 6L, 7L, 4L, 2L, 5L), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA, NA, NA, NA, NA, 1L), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased', 'title', 'other.author'), row.names = c(NA, -6L), class = 'data.frame'), -1);.subset(argv[[1]],argv[[2]]); $nationality [1] Australia UK UK US US Australia Levels: Australia UK US $deceased [1] no no no no yes no Levels: no yes $title [1] Interactive Data Analysis Spatial Statistics [3] Stochastic Simulation LISP-STAT [5] Exploratory Data Analysis Modern Applied Statistics ... 7 Levels: An Introduction to R ... Stochastic Simulation $other.author [1] Ripley Levels: Ripley Venables & Smith ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset7# #argv <- list(structure(list(a = c(1L, 2L, 3L, NA), b = c(NA, 3.14159265358979, 3.14159265358979, 3.14159265358979), c = c(TRUE, NA, FALSE, TRUE), d = c('aa', 'bb', NA, 'dd'), e = structure(c('a1', NA, NA, 'a4'), class = 'AsIs'), f = c('20010101', NA, NA, '20041026')), .Names = c('a', 'b', 'c', 'd', 'e', 'f'), row.names = c(NA, -4L), class = 'data.frame'), 3L);.subset(argv[[1]],argv[[2]]); $c [1] TRUE NA FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset8# #argv <- list(structure(list(Df = c(NA, 1, 1, 2), Deviance = c(32.825622681839, 12.2441566485997, 28.4640218366572, 32.4303239692005), AIC = c(92.5235803967766, 73.9421143635373, 90.1619795515948, 96.1282816841381)), .Names = c('Df', 'Deviance', 'AIC'), row.names = c('', '+ M.user', '+ Temp', '+ Soft'), class = c('anova', 'data.frame')), 3L);.subset(argv[[1]],argv[[2]]); $AIC [1] 92.52358 73.94211 90.16198 96.12828 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset.testsubset9# #argv <- list(structure(list(`1` = 0:10, `2` = 10:20, `3` = 20:30), .Names = c('1', '2', '3'), row.names = c(NA, -11L), class = 'data.frame'), -2);.subset(argv[[1]],argv[[2]]); $`1` [1] 0 1 2 3 4 5 6 7 8 9 10 $`3` [1] 20 21 22 23 24 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset21# #argv <- list(structure(list(par.vals = structure(c(43.6690361821048, 35.0518890362789, 30.2558850234373, 27.1664611723591, 24.9930921115624, 23.3776455926353, 22.122313646246, 21.1173217554787, 20.293145402391, 19.6041024133034, 19.0188803067124, 18.5152545044936, 18.0769941360739, 17.6919540860845, 17.3508558987268, 17.0464826391527, 0.924696372559026, 1.4577878275186, 1.99087928247818, 2.52397073743776, 3.05706219239734, 3.59015364735691, 4.12324510231649, 4.65633655727607, 5.18942801223565, 5.72251946719522, 6.2556109221548, 6.78870237711438, 7.32179383207396, 7.85488528703353, 8.38797674199311, 8.92106819695269), .Dim = c(16L, 2L), .Dimnames = list(NULL, c('ymax', 'xhalf')))), .Names = 'par.vals'), 1L);.subset2(argv[[1]],argv[[2]]); ymax xhalf [1,] 43.66904 0.9246964 [2,] 35.05189 1.4577878 [3,] 30.25589 1.9908793 [4,] 27.16646 2.5239707 [5,] 24.99309 3.0570622 [6,] 23.37765 3.5901536 [7,] 22.12231 4.1232451 [8,] 21.11732 4.6563366 [9,] 20.29315 5.1894280 [10,] 19.60410 5.7225195 [11,] 19.01888 6.2556109 [12,] 18.51525 6.7887024 [13,] 18.07699 7.3217938 [14,] 17.69195 7.8548853 [15,] 17.35086 8.3879767 [16,] 17.04648 8.9210682 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset211# #argv <- list(structure(list(V1 = structure(c(4L, 1L, 2L, 3L), .Label = c('1', '3', '6', 'head'), class = 'factor'), V2 = c(NA, 2L, 4L, 7L), V3 = c(NA, NA, 5L, 8L), V4 = c(NA, NA, NA, 9L)), .Names = c('V1', 'V2', 'V3', 'V4'), class = 'data.frame', row.names = c(NA, -4L)), 2L);.subset2(argv[[1]],argv[[2]]); [1] NA 2 4 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset212# #argv <- list(structure(list(Res.Df = c(20, 21), RSS = c(652424.52183908, 658770.746755654), Df = c(NA, -1), `Sum of Sq` = c(NA, -6346.22491657443), F = c(NA, 0.194542807762205), `Pr(>F)` = c(NA, 0.663893424608742)), .Names = c('Res.Df', 'RSS', 'Df', 'Sum of Sq', 'F', 'Pr(>F)'), row.names = c('1', '2'), class = c('anova', 'data.frame'), heading = c('Analysis of Variance Table\n', 'Model 1: birthw ~ sex + sex:age - 1\nModel 2: birthw ~ sex + age - 1')), 6L);.subset2(argv[[1]],argv[[2]]); [1] NA 0.6638934 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset213# #argv <- list(structure(list(a = structure('abc', class = 'AsIs'), b = structure('def\'gh', class = 'AsIs')), .Names = c('a', 'b'), row.names = '1', class = 'data.frame'), 1L);.subset2(argv[[1]],argv[[2]]); [1] "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset214# #argv <- list(structure(list(mtime = structure(1395082258.61787, class = c('POSIXct', 'POSIXt'))), .Names = 'mtime'), 1L);.subset2(argv[[1]],argv[[2]]); [1] "2014-03-17 18:50:58 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset215# #argv <- list(structure(list(A = 0:10, `NA` = 20:30), .Names = c('A', NA), class = 'data.frame', row.names = c(NA, -11L)), 2L);.subset2(argv[[1]],argv[[2]]); [1] 20 21 22 23 24 25 26 27 28 29 30 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset216# #argv <- list(structure(list(Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551), GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962), .Names = c('Employed', 'GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year'), class = 'data.frame', row.names = 1947:1962, terms = quote(Employed ~ GNP.deflator + GNP + Unemployed + Armed.Forces + Population + Year)), 3L);.subset2(argv[[1]],argv[[2]]); [1] 234.289 259.426 258.054 284.599 328.975 346.999 365.385 363.112 397.469 [10] 419.180 442.769 444.546 482.704 502.601 518.173 554.894 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset217# #argv <- list(structure(list(y = c(1.08728092481538, 0.0420572471552261, 0.787502161306819, 0.512717751544676, 3.35376639535311, 0.204341510750309, -0.334930602487435, 0.80049208412789, -0.416177803375218, -0.777970346246018, 0.934996808181635, -0.678786709127108, 1.52621589791412, 0.5895781228122, -0.744496121210548, -1.99065153885627, 1.51286447692396, -0.750182409847851), A = c(0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1), B = c(1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0), U = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('a', 'b', 'c'), class = 'factor'), V = structure(c(1L, 1L, 2L, 2L, 3L, 3L, 1L, 1L, 2L, 2L, 3L, 3L, 1L, 1L, 2L, 2L, 3L, 3L), .Label = c('a', 'b', 'c'), class = 'factor')), .Names = c('y', 'A', 'B', 'U', 'V'), class = 'data.frame', row.names = c(NA, 18L), terms = quote(y ~ (A + B):(U + V) - 1)), 4L);.subset2(argv[[1]],argv[[2]]); [1] a a a a a a b b b b b b c c c c c c Levels: a b c ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset218# #argv <- list(structure(list(y = c(-0.0561287395290008, -0.155795506705329, -1.47075238389927, -0.47815005510862, 0.417941560199702, 1.35867955152904, -0.102787727342996, 0.387671611559369, -0.0538050405829051, -1.37705955682861), x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE)), .Names = c('y', 'x'), class = 'data.frame', row.names = c(NA, 10L), terms = quote(y ~ x)), 1L);.subset2(argv[[1]],argv[[2]]); [1] -0.05612874 -0.15579551 -1.47075238 -0.47815006 0.41794156 1.35867955 [7] -0.10278773 0.38767161 -0.05380504 -1.37705956 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset219# #argv <- list(structure(list(surname = structure(2L, .Label = c('McNeil', 'R Core', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(NA_integer_, .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(NA_integer_, .Label = c('no', 'yes'), class = 'factor'), title = structure(1L, .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(2L, .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased', 'title', 'other.author'), row.names = 1L, class = 'data.frame'), 4L);.subset2(argv[[1]],argv[[2]]); [1] An Introduction to R 7 Levels: An Introduction to R ... Stochastic Simulation ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset22# #argv <- list(structure(list(frow = c(NA, 2467L, 2468L, 2470L, 2470L, 2477L, 2478L, 2478L, 2480L, 2480L, 2482L, 2482L, 2482L, 2484L, 2484L, 2486L, 2486L, 2486L, 2490L, 2491L)), .Names = 'frow'), 1L);.subset2(argv[[1]],argv[[2]]); [1] NA 2467 2468 2470 2470 2477 2478 2478 2480 2480 2482 2482 2482 2484 2484 [16] 2486 2486 2486 2490 2491 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset220# #argv <- list(structure(list(surname = structure(integer(0), .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(integer(0), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(integer(0), .Label = c('no', 'yes'), class = 'factor'), title = structure(integer(0), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(integer(0), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased', 'title', 'other.author'), row.names = integer(0), class = 'data.frame'), 4L);.subset2(argv[[1]],argv[[2]]); factor(0) 7 Levels: An Introduction to R ... Stochastic Simulation ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset221# #argv <- list(structure(list(A = c(1, NA, 1), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA_integer_, NA_integer_, NA_integer_), E = c(FALSE, NA, TRUE), F = c('abc', NA, 'def')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')), 3L);.subset2(argv[[1]],argv[[2]]); [1] 1.1+0i NA 3.0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset222# #argv <- list(structure(list(A = c(1L, NA, 1L), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA, NA, NA), E = c(FALSE, NA, TRUE), F = structure(c(1L, NA, 2L), .Label = c('abc', 'def'), class = 'factor')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')), 5L);.subset2(argv[[1]],argv[[2]]); [1] FALSE NA TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset223# #argv <- list(structure(list(srcfile = '/home/lzhao/tmp/RtmpS45wYI/R.INSTALL2aa62411bcd3/rpart/R/rpart.R', frow = 187L, lrow = 187L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L), class = 'data.frame'), 2L);.subset2(argv[[1]],argv[[2]]); [1] 187 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset224# #argv <- list(structure(list(y = c(78.5, 74.3, 104.3, 87.6, 95.9, 109.2, 102.7, 72.5, 93.1, 115.9, 83.8, 113.3, 109.4), x1 = c(7, 1, 11, 11, 7, 11, 3, 1, 2, 21, 1, 11, 10), x2 = c(26, 29, 56, 31, 52, 55, 71, 31, 54, 47, 40, 66, 68), x4 = c(60, 52, 20, 47, 33, 22, 6, 44, 22, 26, 34, 12, 12)), .Names = c('y', 'x1', 'x2', 'x4'), class = 'data.frame', row.names = c(NA, 13L), terms = quote(y ~ x1 + x2 + x4)), 3L);.subset2(argv[[1]],argv[[2]]); [1] 26 29 56 31 52 55 71 31 54 47 40 66 68 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset225# #argv <- list(structure(list(`cbind(X, M)` = structure(c(68, 42, 37, 24, 66, 33, 47, 23, 63, 29, 57, 19, 42, 30, 52, 43, 50, 23, 55, 47, 53, 27, 49, 29), .Dim = c(12L, 2L), .Dimnames = list(NULL, c('X', 'M'))), M.user = structure(c(1L, 1L, 2L, 2L, 1L, 1L, 2L, 2L, 1L, 1L, 2L, 2L), .Label = c('N', 'Y'), class = 'factor'), Temp = structure(c(2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L), .Label = c('High', 'Low'), class = 'factor'), Soft = structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L), .Label = c('Hard', 'Medium', 'Soft'), class = 'factor')), .Names = c('cbind(X, M)', 'M.user', 'Temp', 'Soft'), terms = quote(cbind(X, M) ~ M.user + Temp + Soft + M.user:Temp), row.names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23'), class = 'data.frame'), 'cbind(X, M)');.subset2(argv[[1]],argv[[2]]); X M [1,] 68 42 [2,] 42 30 [3,] 37 52 [4,] 24 43 [5,] 66 50 [6,] 33 23 [7,] 47 55 [8,] 23 47 [9,] 63 53 [10,] 29 27 [11,] 57 49 [12,] 19 29 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset226# #argv <- list(structure(list(Df = 10L, `Sum Sq` = 2.74035772634541, `Mean Sq` = 0.274035772634541, `F value` = NA_real_, `Pr(>F)` = NA_real_), .Names = c('Df', 'Sum Sq', 'Mean Sq', 'F value', 'Pr(>F)'), row.names = 'Residuals', class = c('anova', 'data.frame'), heading = c('Analysis of Variance Table\n', 'Response: y')), 5L);.subset2(argv[[1]],argv[[2]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset227# #argv <- list(structure(list(surname = structure(1:5, .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(c(1L, 2L, 3L, 3L, 1L), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(1L, 1L, 1L, 2L, 1L), .Label = c('no', 'yes'), class = 'factor'), title = structure(c(NA_integer_, NA_integer_, NA_integer_, NA_integer_, NA_integer_), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA_integer_, NA_integer_, NA_integer_, NA_integer_, NA_integer_), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased', 'title', 'other.author'), row.names = c(NA, -5L), class = 'data.frame'), 4L);.subset2(argv[[1]],argv[[2]]); [1] 7 Levels: An Introduction to R ... Stochastic Simulation ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset228# #argv <- list(structure(list(Df = c(NA, 1, 1, 1, 1), `Sum of Sq` = c(NA, 25.9509113775335, 2.97247824113524, 0.109090049888117, 0.246974722154086), RSS = c(47.863639350499, 73.8145507280325, 50.8361175916342, 47.9727294003871, 48.1106140726531), AIC = c(26.9442879283302, 30.5758847476115, 25.7275503692601, 24.9738836085411, 25.0111950072736)), .Names = c('Df', 'Sum of Sq', 'RSS', 'AIC'), row.names = c('', '- x1', '- x2', '- x3', '- x4'), class = c('anova', 'data.frame')), 2L);.subset2(argv[[1]],argv[[2]]); [1] NA 25.9509114 2.9724782 0.1090900 0.2469747 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset229# #argv <- list(structure(list(mtime = structure(1342423171, class = c('POSIXct', 'POSIXt'))), .Names = 'mtime'), 1L);.subset2(argv[[1]],argv[[2]]); [1] "2012-07-16 07:19:31 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset23# #argv <- list(structure(list(x = c(0, 0, 1, 1), y = c(2, 2, 9, 9), z = c(0, 0, -3, -3), u = c(34, 35, 19, 37)), .Names = c('x', 'y', 'z', 'u'), row.names = c(2L, 90L, 25L, 50L), class = 'data.frame'), 4L);.subset2(argv[[1]],argv[[2]]); [1] 34 35 19 37 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset230# #argv <- list(structure(list(df0 = structure(list(structure(integer(0), .Label = character(0), class = 'factor')), row.names = character(0), class = 'data.frame')), .Names = 'df0', row.names = 'c0', class = 'data.frame'), 1L);.subset2(argv[[1]],argv[[2]]); NULL <0 rows> (or 0-length row.names) ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset231# #argv <- list(structure(list(y = structure(c(8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536, 9.79424), .Tsp = c(1962.25, 1971.75, 4), class = 'ts'), lag.quarterly.revenue = c(8.79636, 8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536), price.index = c(4.70997, 4.70217, 4.68944, 4.68558, 4.64019, 4.62553, 4.61991, 4.61654, 4.61407, 4.60766, 4.60227, 4.5896, 4.57592, 4.58661, 4.57997, 4.57176, 4.56104, 4.54906, 4.53957, 4.51018, 4.50352, 4.4936, 4.46505, 4.44924, 4.43966, 4.42025, 4.4106, 4.41151, 4.3981, 4.38513, 4.3732, 4.3277, 4.32023, 4.30909, 4.30909, 4.30552, 4.29627, 4.27839, 4.27789), income.level = c(5.8211, 5.82558, 5.83112, 5.84046, 5.85036, 5.86464, 5.87769, 5.89763, 5.92574, 5.94232, 5.95365, 5.9612, 5.97805, 6.00377, 6.02829, 6.03475, 6.03906, 6.05046, 6.05563, 6.06093, 6.07103, 6.08018, 6.08858, 6.10199, 6.11207, 6.11596, 6.12129, 6.122, 6.13119, 6.14705, 6.15336, 6.15627, 6.16274, 6.17369, 6.16135, 6.18231, 6.18768, 6.19377, 6.2003), market.potential = c(12.9699, 12.9733, 12.9774, 12.9806, 12.9831, 12.9854, 12.99, 12.9943, 12.9992, 13.0033, 13.0099, 13.0159, 13.0212, 13.0265, 13.0351, 13.0429, 13.0497, 13.0551, 13.0634, 13.0693, 13.0737, 13.077, 13.0849, 13.0918, 13.095, 13.0984, 13.1089, 13.1169, 13.1222, 13.1266, 13.1356, 13.1415, 13.1444, 13.1459, 13.152, 13.1593, 13.1579, 13.1625, 13.1664)), .Names = c('y', 'lag.quarterly.revenue', 'price.index', 'income.level', 'market.potential'), row.names = c('1962.25', '1962.5', '1962.75', '1963', '1963.25', '1963.5', '1963.75', '1964', '1964.25', '1964.5', '1964.75', '1965', '1965.25', '1965.5', '1965.75', '1966', '1966.25', '1966.5', '1966.75', '1967', '1967.25', '1967.5', '1967.75', '1968', '1968.25', '1968.5', '1968.75', '1969', '1969.25', '1969.5', '1969.75', '1970', '1970.25', '1970.5', '1970.75', '1971', '1971.25', '1971.5', '1971.75'), class = 'data.frame'), 4L);.subset2(argv[[1]],argv[[2]]); [1] 5.82110 5.82558 5.83112 5.84046 5.85036 5.86464 5.87769 5.89763 5.92574 [10] 5.94232 5.95365 5.96120 5.97805 6.00377 6.02829 6.03475 6.03906 6.05046 [19] 6.05563 6.06093 6.07103 6.08018 6.08858 6.10199 6.11207 6.11596 6.12129 [28] 6.12200 6.13119 6.14705 6.15336 6.15627 6.16274 6.17369 6.16135 6.18231 [37] 6.18768 6.19377 6.20030 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset233# #argv <- list(structure(list(A = c(1L, NA, 1L), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA, NA, NA), E = c(FALSE, NA, TRUE), F = structure(c(1L, NA, 2L), .Label = c('abc', 'def'), class = 'factor')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), class = 'data.frame', row.names = c('1', '2', '3')), 6L);.subset2(argv[[1]],argv[[2]]); [1] abc def Levels: abc def ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset234# #argv <- list(structure(list(variog = c(0.00723952158228125, 0.014584633605134, 0.0142079356273193, 0.0184422668389517, 0.0111285046171491, 0.0199100817701382, 0.0270723108677323, 0.0341403794476899, 0.0283206569034573, 0.03752550654923), dist = c(1, 6, 7, 8, 13, 14, 15, 20, 21, 22), n.pairs = structure(c(16L, 16L, 144L, 16L, 16L, 128L, 16L, 16L, 112L, 16L), .Dim = 10L, .Dimnames = structure(list(c('1', '6', '7', '8', '13', '14', '15', '20', '21', '22')), .Names = ''))), .Names = c('variog', 'dist', 'n.pairs'), collapse = TRUE, row.names = c(NA, 10L), class = c('Variogram', 'data.frame')), 3L);.subset2(argv[[1]],argv[[2]]); 1 6 7 8 13 14 15 20 21 22 16 16 144 16 16 128 16 16 112 16 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset24# #argv <- list(NULL, NULL);.subset2(argv[[1]],argv[[2]]); NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset25# #argv <- list(structure(list(V1 = c(1L, 9L), V2 = c(NA, NA), V3 = c(23L, 87L), V4 = c(NA, 654L)), .Names = c('V1', 'V2', 'V3', 'V4'), class = 'data.frame', row.names = c(NA, -2L)), 2L);.subset2(argv[[1]],argv[[2]]); [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset26# #argv <- list(structure(list(Df = c(NA, 2L, 2L), Deviance = c(NA, 5.45230478674972, 2.66453525910038e-15), `Resid. Df` = c(8L, 6L, 4L), `Resid. Dev` = c(10.5814458637509, 5.12914107700115, 5.12914107700115)), .Names = c('Df', 'Deviance', 'Resid. Df', 'Resid. Dev'), row.names = c('NULL', 'outcome', 'treatment'), class = c('anova', 'data.frame'), heading = 'Analysis of Deviance Table\n\nModel: poisson, link: log\n\nResponse: counts\n\nTerms added sequentially (first to last)\n\n'), 4L);.subset2(argv[[1]],argv[[2]]); [1] 10.581446 5.129141 5.129141 ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset27# #argv <- list(structure(list(surname = structure(c('Tukey', 'Venables', 'Tierney', 'Ripley', 'McNeil'), class = 'AsIs')), .Names = 'surname'), 1L);.subset2(argv[[1]],argv[[2]]); [1] "Tukey" "Venables" "Tierney" "Ripley" "McNeil" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset28# #argv <- list(structure(list(surname = structure('R Core', class = 'AsIs'), nationality = structure(NA_integer_, .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(NA_integer_, .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = 7L, class = 'data.frame'), 1L);.subset2(argv[[1]],argv[[2]]); [1] "R Core" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset2.testsubset29# #argv <- list(structure(list(z = structure(c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i'), .Dim = c(3L, 3L), class = 'AsIs')), .Names = 'z'), 1L);.subset2(argv[[1]],argv[[2]]); [,1] [,2] [,3] [1,] "a" "d" "g" [2,] "b" "e" "h" [3,] "c" "f" "i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_dataframe1#Output.IgnoreWarningContext# #argv <- structure(list(x = structure(list(ID = c(13, 41, 121, 202, 247, 292, 415, 492), Location = c(0.15998329123474, 0.533277637449134, 1.5998329123474, 2.6797201281819, 3.27965747031217, 3.87959481244245, 5.51942354759854, 6.54598299968812), Peak_Value = c(0.997547264684804, 0.949162789397664, 0.990440013891923, 0.973478735915337, 0.93861267739627, 0.957347289323235, 0.924803043529451, 0.968307855031101)), .Names = c('ID', 'Location', 'Peak_Value'), row.names = c(NA, -8L), class = 'data.frame'), i = 2), .Names = c('x', 'i'));do.call('[.data.frame', argv) Location 1 0.1599833 2 0.5332776 3 1.5998329 4 2.6797201 5 3.2796575 6 3.8795948 7 5.5194235 8 6.5459830 Warning message: In `[.data.frame`(x = list(ID = c(13, 41, 121, 202, 247, 292, 415, : named arguments other than 'drop' are discouraged ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_dataframe2#Output.IgnoreWarningContext# #argv <- structure(list(x = structure(list(Satellites = c(8L, 0L, 9L, 0L, 4L, 0L, 0L, 0L, 0L, 0L, 0L, 0L, 11L, 0L, 14L, 8L, 1L, 1L, 0L, 5L, 4L, 3L, 1L, 2L, 3L, 0L, 3L, 5L, 0L, 0L, 4L, 0L, 0L, 8L, 5L, 0L, 0L, 6L, 0L, 6L, 3L, 5L, 6L, 5L, 9L, 4L, 6L, 4L, 3L, 3L, 5L, 5L, 6L, 4L, 5L, 15L, 3L, 3L, 0L, 0L, 0L, 5L, 3L, 5L, 1L, 8L, 10L, 0L, 0L, 3L, 7L, 1L, 0L, 6L, 0L, 0L, 3L, 4L, 0L, 5L, 0L, 0L, 0L, 4L, 0L, 3L, 0L, 0L, 0L, 0L, 5L, 0L, 0L, 0L, 0L, 1L, 0L, 1L, 1L, 1L, 1L, 1L, 1L, 4L, 1L, 1L, 1L, 1L, 2L, 4L, 3L, 6L, 0L, 2L, 2L, 0L, 12L, 0L, 5L, 6L, 6L, 2L, 0L, 2L, 3L, 0L, 3L, 4L, 2L, 6L, 6L, 0L, 4L, 10L, 7L, 0L, 5L, 5L, 6L, 6L, 7L, 3L, 3L, 0L, 0L, 8L, 4L, 4L, 10L, 9L, 4L, 0L, 0L, 0L, 0L, 4L, 0L, 2L, 0L, 4L, 4L, 3L, 8L, 0L, 7L, 0L, 0L, 2L, 3L, 4L, 0L, 0L, 0L), Width = c(28.3, 22.5, 26, 24.8, 26, 23.8, 26.5, 24.7, 23.7, 25.6, 24.3, 25.8, 28.2, 21, 26, 27.1, 25.2, 29, 24.7, 27.4, 23.2, 25, 22.5, 26.7, 25.8, 26.2, 28.7, 26.8, 27.5, 24.9, 29.3, 25.8, 25.7, 25.7, 26.7, 23.7, 26.8, 27.5, 23.4, 27.9, 27.5, 26.1, 27.7, 30, 28.5, 28.9, 28.2, 25, 28.5, 30.3, 24.7, 27.7, 27.4, 22.9, 25.7, 28.3, 27.2, 26.2, 27.8, 25.5, 27.1, 24.5, 27, 26, 28, 30, 29, 26.2, 26.5, 26.2, 25.6, 23, 23, 25.4, 24.2, 22.9, 26, 25.4, 25.7, 25.1, 24.5, 27.5, 23.1, 25.9, 25.8, 27, 28.5, 25.5, 23.5, 24, 29.7, 26.8, 26.7, 28.7, 23.1, 29, 25.5, 26.5, 24.5, 28.5, 28.2, 24.5, 27.5, 24.7, 25.2, 27.3, 26.3, 29, 25.3, 26.5, 27.8, 27, 25.7, 25, 31.9, 23.7, 29.3, 22, 25, 27, 23.8, 30.2, 26.2, 24.2, 27.4, 25.4, 28.4, 22.5, 26.2, 24.9, 24.5, 25.1, 28, 25.8, 27.9, 24.9, 28.4, 27.2, 25, 27.5, 33.5, 30.5, 29, 24.3, 25.8, 25, 31.7, 29.5, 24, 30, 27.6, 26.2, 23.1, 22.9, 24.5, 24.7, 28.3, 23.9, 23.8, 29.8, 26.5, 26, 28.2, 25.7, 26.5, 25.8, 24.1, 26.2, 26.1, 29, 28, 27, 24.5), Dark = structure(c(1L, 2L, 1L, 2L, 2L, 1L, 1L, 2L, 1L, 2L, 2L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 1L, 2L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 1L, 2L, 2L, 1L, 1L, 1L, 2L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 2L, 2L, 1L, 2L, 2L, 1L, 2L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 1L), .Label = c('no', 'yes'), class = 'factor'), GoodSpine = structure(c(1L, 1L, 2L, 1L, 1L, 1L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 1L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 2L, 2L, 2L, 1L, 2L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 2L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 2L, 1L, 2L, 1L, 1L, 2L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 1L, 2L), .Label = c('no', 'yes'), class = 'factor'), Rep1 = c(2, 4, 5, 6, 6, 8, 9, 9, 10, 10, 11, 11, 13, 15, 15, 15, 15, 15, 17, 18, 19, 19, 19, 20, 20, 21, 21, 22, 23, 25, 25, 26, 27, 27, 28, 29, 29, 31, 33, 33, 36, 39, 40, 40, 41, 42, 43, 44, 45, 45, 49, 50, 51, 53, 55, 55, 56, 56, 56, 58, 59, 59, 60, 60, 62, 63, 64, 64, 64, 65, 66, 66, 67, 68, 70, 70, 71, 74, 75, 76, 76, 77, 79, 79, 79, 80, 80, 81, 82, 83, 83, 84, 87, 88, 88, 91, 92, 95, 97, 97, 97, 98, 98, 99, 100, 100, 101, 101, 103, 103, 103, 106, 107, 107, 111, 112, 112, 113, 113, 116, 116, 117, 117, 120, 122, 122, 122, 124, 125, 126, 127, 128, 128, 129, 130, 131, 133, 134, 134, 135, 141, 144, 146, 147, 147, 153, 153, 154, 154, 155, 155, 155, 156, 157, 157, 161, 163, 163, 164, 164, 164, 165, 167, 168, 168, 169, 170, 170, 170, 171, 171, 173, 173), Rep2 = c(2, 5, 6, 6, 8, 8, 9, 11, 12, 13, 13, 15, 15, 15, 16, 17, 17, 18, 19, 20, 23, 24, 24, 24, 25, 25, 26, 26, 27, 28, 29, 30, 30, 32, 33, 34, 38, 39, 39, 41, 42, 47, 48, 49, 49, 51, 54, 55, 55, 56, 57, 59, 59, 62, 63, 65, 67, 68, 69, 69, 70, 73, 75, 76, 76, 77, 78, 79, 81, 82, 83, 84, 85, 85, 85, 86, 87, 88, 89, 91, 92, 92, 92, 92, 96, 98, 98, 99, 100, 101, 101, 102, 103, 104, 104, 104, 105, 107, 107, 107, 108, 109, 109, 110, 111, 111, 111, 112, 112, 112, 113, 113, 115, 116, 117, 120, 122, 123, 123, 124, 124, 125, 125, 126, 128, 130, 131, 131, 131, 131, 132, 133, 133, 134, 134, 136, 137, 138, 139, 139, 141, 143, 144, 144, 145, 145, 150, 150, 150, 152, 152, 153, 154, 155, 155, 156, 157, 157, 158, 159, 160, 161, 163, 163, 166, 167, 169, 170, 172, 173, 173, 173, 173)), .Names = c('Satellites', 'Width', 'Dark', 'GoodSpine', 'Rep1', 'Rep2'), row.names = c(NA, -173L), class = 'data.frame'), i = c(2, 4, 5, 6, 6, 8, 9, 9, 10, 10, 11, 11, 13, 15, 15, 15, 15, 15, 17, 18, 19, 19, 19, 20, 20, 21, 21, 22, 23, 25, 25, 26, 27, 27, 28, 29, 29, 31, 33, 33, 36, 39, 40, 40, 41, 42, 43, 44, 45, 45, 49, 50, 51, 53, 55, 55, 56, 56, 56, 58, 59, 59, 60, 60, 62, 63, 64, 64, 64, 65, 66, 66, 67, 68, 70, 70, 71, 74, 75, 76, 76, 77, 79, 79, 79, 80, 80, 81, 82, 83, 83, 84, 87, 88, 88, 91, 92, 95, 97, 97, 97, 98, 98, 99, 100, 100, 101, 101, 103, 103, 103, 106, 107, 107, 111, 112, 112, 113, 113, 116, 116, 117, 117, 120, 122, 122, 122, 124, 125, 126, 127, 128, 128, 129, 130, 131, 133, 134, 134, 135, 141, 144, 146, 147, 147, 153, 153, 154, 154, 155, 155, 155, 156, 157, 157, 161, 163, 163, 164, 164, 164, 165, 167, 168, 168, 169, 170, 170, 170, 171, 171, 173, 173), j = c(-5L, -6L)), .Names = c('x', 'i', 'j'));do.call('[.data.frame', argv) Satellites Width Dark GoodSpine 2 0 22.5 yes no 4 0 24.8 yes no 5 4 26.0 yes no 6 0 23.8 no no 6.1 0 23.8 no no 8 0 24.7 yes yes 9 0 23.7 no yes 9.1 0 23.7 no yes 10 0 25.6 yes no 10.1 0 25.6 yes no 11 0 24.3 yes no 11.1 0 24.3 yes no 13 11 28.2 no no 15 14 26.0 no yes 15.1 14 26.0 no yes 15.2 14 26.0 no yes 15.3 14 26.0 no yes 15.4 14 26.0 no yes 17 1 25.2 no no 18 1 29.0 no no 19 0 24.7 yes no 19.1 0 24.7 yes no 19.2 0 24.7 yes no 20 5 27.4 no no 20.1 5 27.4 no no 21 4 23.2 no yes 21.1 4 23.2 no yes 22 3 25.0 no yes 23 1 22.5 no yes 25 3 25.8 yes no 25.1 3 25.8 yes no 26 0 26.2 yes no 27 3 28.7 no no 27.1 3 28.7 no no 28 5 26.8 no yes 29 0 27.5 yes no 29.1 0 27.5 yes no 31 4 29.3 no yes 33 0 25.7 no yes 33.1 0 25.7 no yes 36 0 23.7 yes no 39 0 23.4 yes no 40 6 27.9 no no 40.1 6 27.9 no no 41 3 27.5 yes no 42 5 26.1 no yes 43 6 27.7 no yes 44 5 30.0 no yes 45 9 28.5 yes yes 45.1 9 28.5 yes yes 49 3 28.5 no no 50 3 30.3 no yes 51 5 24.7 yes no 53 6 27.4 no yes 55 5 25.7 no yes 55.1 5 25.7 no yes 56 15 28.3 no no 56.1 15 28.3 no no 56.2 15 28.3 no no 58 3 26.2 yes no 59 0 27.8 no yes 59.1 0 27.8 no yes 60 0 25.5 yes no 60.1 0 25.5 yes no 62 5 24.5 yes no 63 3 27.0 yes yes 64 5 26.0 no no 64.1 5 26.0 no no 64.2 5 26.0 no no 65 1 28.0 no no 66 8 30.0 no no 66.1 8 30.0 no no 67 10 29.0 no no 68 0 26.2 no no 70 3 26.2 no no 70.1 3 26.2 no no 71 7 25.6 yes no 74 6 25.4 no no 75 0 24.2 yes no 76 0 22.9 no yes 76.1 0 22.9 no yes 77 3 26.0 yes yes 79 0 25.7 yes no 79.1 0 25.7 yes no 79.2 0 25.7 yes no 80 5 25.1 no no 80.1 5 25.1 no no 81 0 24.5 yes yes 82 0 27.5 yes no 83 0 23.1 yes no 83.1 0 23.1 yes no 84 4 25.9 yes yes 87 0 28.5 no no 88 0 25.5 yes yes 88.1 0 25.5 yes yes 91 5 29.7 no yes 92 0 26.8 no yes 95 0 23.1 yes no 97 0 25.5 yes no 97.1 0 25.5 yes no 97.2 0 25.5 yes no 98 1 26.5 yes no 98.1 1 26.5 yes no 99 1 24.5 yes no 100 1 28.5 yes no 100.1 1 28.5 yes no 101 1 28.2 no no 101.1 1 28.2 no no 103 1 27.5 no no 103.1 1 27.5 no no 103.2 1 27.5 no no 106 1 27.3 yes no 107 1 26.3 no no 107.1 1 26.3 no no 111 3 27.8 no no 112 6 27.0 no no 112.1 6 27.0 no no 113 0 25.7 yes no 113.1 0 25.7 yes no 116 0 23.7 yes no 116.1 0 23.7 yes no 117 12 29.3 yes no 117.1 12 29.3 yes no 120 6 27.0 yes no 122 2 30.2 no yes 122.1 2 30.2 no yes 122.2 2 30.2 no yes 124 2 24.2 no no 125 3 27.4 no no 126 0 25.4 no yes 127 3 28.4 yes no 128 4 22.5 yes no 128.1 4 22.5 yes no 129 2 26.2 no no 130 6 24.9 no yes 131 6 24.5 no yes 133 4 28.0 no yes 134 10 25.8 yes no 134.1 10 25.8 yes no 135 7 27.9 no no 141 7 33.5 no yes 144 0 24.3 no yes 146 8 25.0 yes no 147 4 31.7 no yes 147.1 4 31.7 no yes 153 0 23.1 no yes 153.1 0 23.1 no yes 154 0 22.9 no yes 154.1 0 22.9 no yes 155 0 24.5 yes no 155.1 0 24.5 yes no 155.2 0 24.5 yes no 156 4 24.7 no no 157 0 28.3 no no 157.1 0 28.3 no no 161 4 26.5 no no 163 8 28.2 no no 163.1 8 28.2 no no 164 0 25.7 yes no 164.1 0 25.7 yes no 164.2 0 25.7 yes no 165 7 26.5 no no 167 0 24.1 yes no 168 2 26.2 yes no 168.1 2 26.2 yes no 169 3 26.1 yes no 170 4 29.0 yes no 170.1 4 29.0 yes no 170.2 4 29.0 yes no 171 0 28.0 no yes 171.1 0 28.0 no yes 173 0 24.5 no yes 173.1 0 24.5 no yes Warning message: In `[.data.frame`(x = list(Satellites = c(8L, 0L, 9L, 0L, 4L, 0L, : named arguments other than 'drop' are discouraged ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_missing# #df <- data.frame(x='a', y='b'); f <- function(df, missng) {.subset(df, missng)}; f(df) Error in f(df) : argument "missng" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_missing#Output.IgnoreErrorContext# #df <- data.frame(x='a', y='b'); f <- function(df, missng) {df[,,missng]}; f(df) Error in `[.data.frame`(df, , , missng) : argument "missng" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_missing# #df <- data.frame(x='a', y='b'); f <- function(df, missng) {df[,missng]}; f(df) x y 1 a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_missing# #df <- data.frame(x='a', y='b'); f <- function(df, missng) {df[1,missng]}; f(df) x y 1 a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_missing#Output.IgnoreErrorContext#Output.IgnoreErrorMessage# #df <- data.frame(x='a', y='b'); f <- function(df, missng) {df[[missng]]}; f(df) Error in (function(x, i, exact) if (is.matrix(i)) as.matrix(x)[[i]] else .subset2(x, : argument "missng" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_missing# #df <- data.frame(x='a', y='b'); f <- function(df, missng) {df[missng,1]}; f(df) [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_missing# #df <- data.frame(x='a', y='b'); f <- function(df, missng) {df[missng,]}; f(df) x y 1 a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_missing# #df <- data.frame(x='a', y='b'); f <- function(df, missng) {df[missng,missng]}; f(df) x y 1 a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_subset_dataframe.testsubset_missing# #df <- data.frame(x='a', y='b'); f <- function(df, missng) {df[missng]}; f(df) x y 1 a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+1), NA); a Error in substitute(quote(x + 1), NA) : invalid environment specified ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+1), NULL); a quote(x + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+1), c(c(list(x=1)))); a quote(1 + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+1), c(list(x=1), 'breakme')); a quote(1 + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+1), c(list(x=1, 1))); a quote(1 + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+1), list(1)); a quote(x + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+1), list(c(c(list(x=1))))); a quote(x + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+1), list(list(x=1))); a quote(x + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+1), list(x=1)); a quote(1 + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+1), list(y=1)); a quote(x + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #a<-substitute(quote(x+y), c(list(x=1), list(y=1))); a quote(1 + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function() {}; substitute(quote(x+1), f) Error in substitute(quote(x + 1), f) : invalid environment specified ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function(...) { print(typeof(get('...'))); environment() }; e <- f(c(1,2), b=15, c=44); substitute(foo2({...}), e) [1] "..." foo2({ c(1, 2) 15 44 }) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function(..., list=character()) { substitute(list(...))[-1L] }; as.character(f("config")) [1] "config" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function(x,name) substitute(x$name <- 5); f(foo, bar); foo <- new.env(); eval(f(foo,bar)); foo$bar foo$bar <- 5 [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function(x,name) substitute(x$name); f(foo, bar) foo$bar ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function(x,name) substitute(x$name); f(foo, bar); foo <- new.env(); foo$bar <- 1; eval(f(foo,bar)) foo$bar [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function(x,name) substitute(x$name<-1); f(foo, bar) foo$bar <- 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function(x,name) substitute(x@name <- 5); f(foo, bar); setClass('cl', representation(bar='numeric')); foo <- new('cl'); eval(f(foo,bar)); foo@bar foo@bar <- 5 [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function(x,name) substitute(x@name); f(foo, bar) foo@bar ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function(x,name) substitute(x@name); f(foo, bar); setClass('cl', representation(bar='numeric')); foo <- new('cl'); foo@bar <- 1; eval(f(foo,bar)) foo@bar [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #f<-function(x,name) substitute(x@name<-2); f(foo, bar) foo@bar <- 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(1, 1) Error in substitute(1, 1) : invalid environment specified ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(1, 1, 1) Error in substitute(1, 1, 1) : unused argument (1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(1, NA) Error in substitute(1, NA) : invalid environment specified ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(1, NULL) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(1, c(list(1))) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(1, list(c(list(1)))) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(1, list(list(1))) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(`:=`(a=3,b=3)) `:=`(a = 3, b = 3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(expr=1, env=1) Error in substitute(expr = 1, env = 1) : invalid environment specified ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(quote(x+1), environment()) quote(x + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #substitute(quote(x+1), setClass('a')) Error in substitute(quote(x + 1), setClass("a")) : invalid environment specified ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #typeof(substitute()) [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #typeof(substitute(set)) [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ delayedAssign("expr", a * b) ; substitute(expr) } expr ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ env <- new.env() ; z <- 0 ; delayedAssign("var", z+2, assign.env=env) ; substitute(var, env=env) } z + 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ env <- new.env() ; z <- 0 ; delayedAssign("var", z+2, assign.env=env) ; z <- 10 ; substitute(var, env=env) } z + 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function() { delayedAssign("expr", a * b) ; substitute(dummy) } ; f() } dummy ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function() { delayedAssign("expr", a * b) ; substitute(expr) } ; f() } a * b ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function() { substitute(list(a=1,b=2,...,3,...)) } ; f() } list(a = 1, b = 2, ..., 3, ...) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function() { substitute(x(1:10), list(x=quote(sum))) } ; f() } sum(1:10) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(...) { substitute(...()) } ; f() } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(...) { substitute(...()) } ; f(x + z) } [[1]] x + z ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(...) { substitute(...()) } ; f(x + z, z + y) } [[1]] x + z [[2]] z + y ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(...) { substitute(list(...)) } ; f(x + z, a * b) } list(x + z, a * b) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(...) { substitute(list(a=1,b=2,...,3,...)) } ; f() } list(a = 1, b = 2, 3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(...) { substitute(list(a=1,b=2,...,3,...)) } ; f(x + z, a * b) } list(a = 1, b = 2, x + z, a * b, 3, x + z, a * b) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(...) { substitute(list(a=1,b=2,...,3,...,c=8)) } ; f() } list(a = 1, b = 2, 3, c = 8) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(a, b=a, c=b, d=c) { substitute(d) } ; f(x + y) } c ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(expr) { expr ; substitute(expr) } ; a <- 10; b <- 2; f(a * b) } a * b ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(expr) { substitute(expr) } ; f(a * b) } a * b ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(expra, exprb) { substitute(expra + exprb) } ; f(a * b, a + b) } a * b + (a + b) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(x = y, y = x) { substitute(x) } ; f() } y ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(x) { g <- function() { substitute(x) } ; g() } ; f(a * b) } x ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(x) { substitute(x, list(a=1,b=2)) } ; f(a + b) } x ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(y) { as.character(substitute(y)) } ; f("a") } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(y) { substitute(y) } ; f() } ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(y) { substitute(y) } ; typeof(f()) } [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f <- function(z) { g <- function(y) { substitute(y) } ; g(z) } ; f(a + d) } z ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f<-function(...) { substitute(list(...)) }; f(c(1,2)) } list(c(1, 2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f<-function(...) { substitute(list(...)) }; f(c(x=1, 2)) } list(c(x = 1, 2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f<-function(...) { substitute(list(...)) }; f(c(x=1, 2, z=3)) } list(c(x = 1, 2, z = 3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f<-function(...) { substitute(list(...)) }; is.double(f(c(x=1,2))[[2]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f<-function(...) { substitute(list(...)) }; is.language(f(c(1,2))) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f<-function(...) { substitute(list(...)) }; is.language(f(c(x=1,2))[[2]]) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f<-function(...) { substitute(list(...)) }; is.symbol(f(c(x=1,2))[[1]]) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f<-function(...) { substitute(list(...)) }; is.symbol(f(c(x=1,2))[[2]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f<-function(...) { substitute(list(...)) }; length(f(c(1,2))) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ f<-function(...) { substitute(list(...)) }; typeof(f(c(1,2))) } [1] "language" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) assign.dots(...); assign.dots <- function (...) { args <- list(...); sapply(substitute(list(...))[-1], deparse) }; q <- 1; foo(q); } [1] "q" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(...); bar <- function(...) { ..1; substitute(..1); }; foo(1+2); } ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(...); bar <- function(...) { list(...); substitute(list(...)); }; foo(1+2); } list(1 + 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(...); bar <- function(...) { substitute(..1); }; foo(1+2); } ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(...); bar <- function(...) { substitute(list(...)); }; foo(1+2); } list(1 + 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(...); bar <- function(x) { substitute(x); }; foo(1+2); } 1 + 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(...); bar <- function(x) { x; substitute(x); }; foo(1+2); } 1 + 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(..1); bar <- function(...) { ..1; substitute(..1); }; foo(1+2); } ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(..1); bar <- function(...) { list(...); substitute(list(...)); }; foo(1+2); } list(..1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(..1); bar <- function(...) { substitute(..1); }; foo(1+2); } ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(..1); bar <- function(...) { substitute(list(...)); }; foo(1+2); } list(..1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(..1); bar <- function(x) { substitute(x); }; foo(1+2); } ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(..1); bar <- function(x) { x; substitute(x); }; foo(1+2); } ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(3+2); bar <- function(...) { ..1; substitute(..1); }; foo(1+2); } ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(3+2); bar <- function(...) { list(...); substitute(list(...)); }; foo(1+2); } list(3 + 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(3+2); bar <- function(...) { substitute(..1); }; foo(1+2); } ..1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(3+2); bar <- function(...) { substitute(list(...)); }; foo(1+2); } list(3 + 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(3+2); bar <- function(x) { substitute(x); }; foo(1+2); } 3 + 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ foo <- function(...) bar(3+2); bar <- function(x) { x; substitute(x); }; foo(1+2); } 3 + 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ g<-function() { f<-function() { 42 }; substitute(f()) } ; typeof(g()[[1]]) } [1] "closure" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ substitute(a, list(a = quote(x + y), x = 1)) } x + y ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ substitute(a[x], list(a = quote(x + y), x = 1)) } (x + y)[1] ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute#Output.IgnoreWhitespace# #{ substitute(function(x, a) { x + a }, list(a = quote(x + y), x = 1)) } function(x, a) { 1 + (x + y) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ substitute(if(a) { x } else { x * a }, list(a = quote(x + y), x = 1)) } if (x + y) { 1 } else { 1 * (x + y) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ substitute(x + y, list(x=1)) } 1 + y ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ substitute(x <- x + 1, list(x = 1)) } 1 <- 1 + 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_substitute.testSubstitute# #{ substitute({class(y) <- x; y}, list(x=42)) } { class(y) <- 42 y } ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("123456", -1, 3) } [1] "123" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("123456", -20, -100) } [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("123456", -5, -1) } [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("123456", 2, 4) } [1] "234" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("123456", 2.8, 4) } [1] "234" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("123456", 2L, 4L) } [1] "234" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("123456", 4, 2) } [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("123456", 4, 8) } [1] "456" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("123456", 7, 8) } [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("abcdef",c(1,2),c(3L,5L)) } [1] "abc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("fastr", 1, NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr("fastr", NA, 2) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(1234,2,3) } [1] "23" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(1234L,2,3) } [1] "23" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(NA,1,2) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(c("abcdef", "aa"), 2, integer()) } Error in substr(c("abcdef", "aa"), 2, integer()) : invalid substring arguments ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(c("abcdef", "aa"), 3, NA) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(c("abcdef", "aa"), NA, 4) } [1] NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(c("abcdef", "aa"), c(1,NA), 4) } [1] "abcd" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(c("abcdef", "aa"), c(NA,8), 4) } [1] NA "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(c("abcdef", "aa"), integer(), 2) } Error in substr(c("abcdef", "aa"), integer(), 2) : invalid substring arguments ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(c("hello", "bye"), 1, 2) } [1] "he" "by" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(c("hello", "bye"), 1, c(1,2,3)) } [1] "h" "by" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(c("hello", "bye"), c(1,2), c(2,3)) } [1] "he" "ye" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(c("hello", "bye"), c(1,2,3), 4) } [1] "hell" "ye" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ substr(character(), integer(), integer()) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-"abcdef"; substr(x,1,3)<-"0"; x } [1] "0bcdef" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-"abcdef"; substr(x,1,3)<-"0000"; x } [1] "000def" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring#Output.ImprovedErrorContext# #{ x<-"abcdef"; substr(x,1,3)<-NULL; x } Error in `substr<-`(`*tmp*`, 1, 3, value = NULL) : invalid value ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring#Output.ImprovedErrorContext# #{ x<-"abcdef"; substr(x,1,3)<-character(); x } Error in `substr<-`(`*tmp*`, 1, 3, value = character(0)) : invalid value ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-"abcdef"; substr(x,1,4)<-"0000"; x } [1] "0000ef" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-"abcdef"; substr(x,1,NA)<-"0"; x } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring#Output.ImprovedErrorContext# #{ x<-"abcdef"; substr(x,3,1)<-0; x } Error in `substr<-`(`*tmp*`, 3, 1, value = 0) : invalid value ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-"abcdef"; substr(x,NA,3)<-"0"; x } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring#Output.ImprovedErrorContext# #{ x<-"abcdef"; substr(x,integer(),3)<-NULL; x } Error in `substr<-`(`*tmp*`, integer(), 3, value = NULL) : invalid substring arguments ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-c("abcdef"); substr(x[1], 2, 3)<-"0"; x } [1] "a0cdef" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-c("abcdef", "ghijklm"); substr(x, c(1,NA), 4)<-"0"; x } [1] "0bcdef" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-character(); substr(x,1,3)<-"0"; x } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-character(); substr(x,1,3)<-0; x } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-character(); substr(x,1,3)<-NULL; x } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testSubstring# #{ x<-character(); substr(x,integer(),3)<-NULL; x } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testsubstr1# #argv <- list('weight', 1L, 2L); .Internal(substr(argv[[1]], argv[[2]], argv[[3]])) [1] "we" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testsubstr2# #argv <- list(c(' ', ' '), 1L, c(4L, -16L)); .Internal(substr(argv[[1]], argv[[2]], argv[[3]])) [1] " " "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testsubstr3# #argv <- list(structure(c('as.formula', 'coef', 'makepredictcall', 'na.fail', 'predict'), .Names = c('as.formula', 'coef', 'makepredictcall', 'na.fail', 'predict')), 1L, 6L); .Internal(substr(argv[[1]], argv[[2]], argv[[3]])) as.formula coef makepredictcall na.fail predict "as.for" "coef" "makepr" "na.fai" "predic" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testsubstr4# #argv <- list(character(0), 7L, 1000000L); .Internal(substr(argv[[1]], argv[[2]], argv[[3]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testsubstr5# #argv <- list(structure('to be supported).', Rd_tag = 'TEXT'), 17L, 17L); .Internal(substr(argv[[1]], argv[[2]], argv[[3]])) [1] "." attr(,"Rd_tag") [1] "TEXT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testsubstr6# #argv <- list(character(0), 1L, 5L); .Internal(substr(argv[[1]], argv[[2]], argv[[3]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testsubstr7# #argv <- list('', 1L, 2L); .Internal(substr(argv[[1]], argv[[2]], argv[[3]])) [1] "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testsubstr8# #argv <- list(structure(c('model.frame', 'predict', 'residuals'), .Names = c('model.frame', 'predict', 'residuals')), 1L, 6L); .Internal(substr(argv[[1]], argv[[2]], argv[[3]])) model.frame predict residuals "model." "predic" "residu" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substr.testsubstr9# #argv <- list('> ### R code from vignette source \'parallel.Rnw\'\n> \n> ###################################################\n> ### code chunk number 1: parallel.Rnw:474-475 (eval = FALSE)\n> ###################################################\n> ## library(parallel)\n> \n> \n> ###################################################\n> ### code chunk number 2: parallel.Rnw:500-507 (eval = FALSE)\n> ###################################################\n> ## library(boot)\n> ## cd4.rg <- function(data, mle) MASS::mvrnorm(nrow(data), mle$m, mle$v)\n> ## cd4.mle <- list(m = colMeans(cd4), v = var(cd4))\n> ## cd4.boot <- boot(cd4, corr, R = 999, sim = \'parametric\',\n> ## ran.gen = cd4.rg, mle = cd4.mle)\n> ## boot.ci(cd4.boot, type = c(\'norm\', \'basic\', \'perc\'),\n> ## conf = 0.9, h = atanh, hinv = tanh)\n> \n> \n> ###################################################\n> ### code chunk number 3: parallel.Rnw:512-522 (eval = FALSE)\n> ###################################################\n> ## cd4.rg <- function(data, mle) MASS::mvrnorm(nrow(data), mle$m, mle$v)\n> ## cd4.mle <- list(m = colMeans(cd4), v = var(cd4))\n> ## run1 <- function(...) boot(cd4, corr, R = 500, sim = \'parametric\',\n> ## ran.gen = cd4.rg, mle = cd4.mle)\n> ## mc <- 2 # set as appropriate for your hardware\n> ## ## To make this reproducible:\n> ## set.seed(123, \'L\'Ecuyer\')\n> ## cd4.boot <- do.call(c, mclapply(seq_len(mc), run1) )\n> ## boot.ci(cd4.boot, type = c(\'norm\', \'basic\', \'perc\'),\n> ## conf = 0.9, h = atanh, hinv = tanh)\n> \n> \n> ###################################################\n> ### code chunk number 4: parallel.Rnw:527-528 (eval = FALSE)\n> ###################################################\n> ## do.call(c, lapply(seq_len(mc), run1))\n> \n> \n> ###################################################\n> ### code chunk number 5: parallel.Rnw:532-547 (eval = FALSE)\n> ###################################################\n> ## run1 <- function(...) {\n> ## library(boot)\n> ## cd4.rg <- function(data, mle) MASS::mvrnorm(nrow(data), mle$m, mle$v)\n> ## cd4.mle <- list(m = colMeans(cd4), v = var(cd4))\n> ## boot(cd4, corr, R = 500, sim = \'parametric\',\n> ## ran.gen = cd4.rg, mle = cd4.mle)\n> ## }\n> ## cl <- makeCluster(mc)\n> ## ## make this reproducible\n> ## clusterSetRNGStream(cl, 123)\n> ## library(boot) # needed for c() method on main\n> ## cd4.boot <- do.call(c, parLapply(cl, seq_len(mc), run1) )\n> ## boot.ci(cd4.boot, type = c(\'norm\', \'basic\', \'perc\'),\n> ## conf = 0.9, h = atanh, hinv = tanh)\n> ## stopCluster(cl)\n> \n> \n> ###################################################\n> ### code chunk number 6: parallel.Rnw:557-570 (eval = FALSE)\n> ###################################################\n> ## cl <- makeCluster(mc)\n> ## cd4.rg <- function(data, mle) MASS::mvrnorm(nrow(data), mle$m, mle$v)\n> ## cd4.mle <- list(m = colMeans(cd4), v = var(cd4))\n> ## clusterExport(cl, c(\'cd4.rg\', \'cd4.mle\'))\n> ## junk <- clusterEvalQ(cl, library(boot)) # discard result\n> ## clusterSetRNGStream(cl, 123)\n> ## res <- clusterEvalQ(cl, boot(cd4, corr, R = 500,\n> ## sim = \'parametric\', ran.gen = cd4.rg, mle = cd4.mle))\n> ## library(boot) # needed for c() method on main\n> ## cd4.boot <- do.call(c, res)\n> ## boot.ci(cd4.boot, type = c(\'norm\', \'basic\', \'perc\'),\n> ## conf = 0.9, h = atanh, hinv = tanh)\n> ## stopCluster(cl)\n> \n> \n> ###################################################\n> ### code chunk number 7: parallel.Rnw:575-589 (eval = FALSE)\n> ###################################################\n> ## R <- 999; M <- 999 ## we would like at least 999 each\n> ## cd4.nest <- boot(cd4, nested.corr, R=R, stype=\'w\', t0=corr(cd4), M=M)\n> ## ## nested.corr is a function in package boot\n> ## op <- par(pty = \'s\', xaxs = \'i\', yaxs = \'i\')\n> ## qqplot((1:R)/(R+1), cd4.nest$t[, 2], pch = \'.\', asp = 1,\n> ## xlab = \'nominal\', ylab = \'estimated\')\n> ## abline(a = 0, b = 1, col = \'grey\')\n> ## abline(h = 0.05, col = \'grey\')\n> ## abline(h = 0.95, col = \'grey\')\n> ## par(op)\n> ## \n> ## nominal <- (1:R)/(R+1)\n> ## actual <- cd4.nest$t[, 2]\n> ## 100*nominal[c(sum(actual <= 0.05), sum(actual < 0.95))]\n> \n> \n> ###################################################\n> ### code chunk number 8: parallel.Rnw:594-602 (eval = FALSE)\n> ###################################################\n> ## mc <- 9\n> ## R <- 999; M <- 999; RR <- floor(R/mc)\n> ## run2 <- function(...)\n> ## cd4.nest <- boot(cd4, nested.corr, R=RR, stype=\'w\', t0=corr(cd4), M=M)\n> ## cd4.nest <- do.call(c, mclapply(seq_len(mc), run2, mc.cores = mc) )\n> ## nominal <- (1:R)/(R+1)\n> ## actual <- cd4.nest$t[, 2]\n> ## 100*nominal[c(sum(actual <= 0.05), sum(actual < 0.95))]\n> \n> \n> ###################################################\n> ### code chunk number 9: parallel.Rnw:616-627 (eval = FALSE)\n> ###################################################\n> ## library(spatial)\n> ## towns <- ppinit(\'towns.dat\')\n> ## tget <- function(x, r=3.5) sum(dist(cbind(x$x, x$y)) < r)\n> ## t0 <- tget(towns)\n> ## R <- 1000\n> ## c <- seq(0, 1, 0.1)\n> ## ## res[1] = 0\n> ## res <- c(0, sapply(c[-1], function(c)\n> ## mean(replicate(R, tget(Strauss(69, c=c, r=3.5))))))\n> ## plot(c, res, type=\'l\', ylab=\'E t\')\n> ## abline(h=t0, col=\'grey\')\n> \n> \n> ###################################################\n> ### code chunk number 10: parallel.Rnw:631-640 (eval = FALSE)\n> ###################################################\n> ## run3 <- function(c) {\n> ## library(spatial)\n> ## towns <- ppinit(\'towns.dat\') # has side effects\n> ## mean(replicate(R, tget(Strauss(69, c=c, r=3.5))))\n> ## }\n> ## cl <- makeCluster(10, methods = FALSE)\n> ## clusterExport(cl, c(\'R\', \'towns\', \'tget\'))\n> ## res <- c(0, parSapply(cl, c[-1], run3)) # 10 tasks\n> ## stopCluster(cl)\n> \n> \n> ###################################################\n> ### code chunk number 11: parallel.Rnw:644-648 (eval = FALSE)\n> ###################################################\n> ## cl <- makeForkCluster(10) # fork after the variables have been set up\n> ## run4 <- function(c) mean(replicate(R, tget(Strauss(69, c=c, r=3.5))))\n> ## res <- c(0, parSapply(cl, c[-1], run4))\n> ## stopCluster(cl)\n> \n> \n> ###################################################\n> ### code chunk number 12: parallel.Rnw:651-653 (eval = FALSE)\n> ###################################################\n> ## run4 <- function(c) mean(replicate(R, tget(Strauss(69, c=c, r=3.5))))\n> ## res <- c(0, unlist(mclapply(c[-1], run4, mc.cores = 10)))\n> \n> \n> ###################################################\n> ### code chunk number 13: parallel.Rnw:684-718 (eval = FALSE)\n> ###################################################\n> ## pkgs <- \'\'\n> ## M <- 20 # number of parallel installs\n> ## M <- min(M, length(pkgs))\n> ## library(parallel)\n> ## unlink(\'install_log\')\n> ## cl <- makeCluster(M, outfile = \'install_log\')\n> ## clusterExport(cl, c(\'tars\', \'fakes\', \'gcc\')) # variables needed by do_one\n> ## \n> ## ## set up available via a call to available.packages() for\n> ## ## repositories containing all the packages involved and all their\n> ## ## dependencies.\n> ## DL <- utils:::.make_dependency_list(pkgs, available, recursive = TRUE)\n> ## DL <- lapply(DL, function(x) x[x %in% pkgs])\n> ## lens <- sapply(DL, length)\n> ## ready <- names(DL[lens == 0L])\n> ## done <- character() # packages already installed\n> ## n <- length(ready)\n> ## submit <- function(node, pkg)\n> ## parallel:::sendCall(cl[[node]], do_one, list(pkg), tag = pkg)\n> ## for (i in 1:min(n, M)) submit(i, ready[i])\n> ## DL <- DL[!names(DL) %in% ready[1:min(n, M)]]\n> ## av <- if(n < M) (n+1L):M else integer() # available workers\n> ## while(length(done) < length(pkgs)) {\n> ## d <- parallel:::recvOneResult(cl)\n> ## av <- c(av, d$node)\n> ## done <- c(done, d$tag)\n> ## OK <- unlist(lapply(DL, function(x) all(x %in% done) ))\n> ## if (!any(OK)) next\n> ## p <- names(DL)[OK]\n> ## m <- min(length(p), length(av)) # >= 1\n> ## for (i in 1:m) submit(av[i], p[i])\n> ## av <- av[-(1:m)]\n> ## DL <- DL[!names(DL) %in% p[1:m]]\n> ## }\n> \n> \n> ###################################################\n> ### code chunk number 14: parallel.Rnw:731-748 (eval = FALSE)\n> ###################################################\n> ## fn <- function(r) statistic(data, i[r, ], ...)\n> ## RR <- sum(R)\n> ## res <- if (ncpus > 1L && (have_mc || have_snow)) {\n> ## if (have_mc) {\n> ## parallel::mclapply(seq_len(RR), fn, mc.cores = ncpus)\n> ## } else if (have_snow) {\n> ## list(...) # evaluate any promises\n> ## if (is.null(cl)) {\n> ## cl <- parallel::makePSOCKcluster(rep(\'localhost\', ncpus))\n> ## if(RNGkind()[1L] == \'L\'Ecuyer-CMRG\')\n> ## parallel::clusterSetRNGStream(cl)\n> ## res <- parallel::parLapply(cl, seq_len(RR), fn)\n> ## parallel::stopCluster(cl)\n> ## res\n> ## } else parallel::parLapply(cl, seq_len(RR), fn)\n> ## }\n> ## } else lapply(seq_len(RR), fn)\n> \n> \n> ###################################################\n> ### code chunk number 15: parallel.Rnw:751-752 (eval = FALSE)\n> ###################################################\n> ## list(...) # evaluate any promises\n> \n> ', 1L, 150L); .Internal(substr(argv[[1]], argv[[2]], argv[[3]])) [1] "> ### R code from vignette source 'parallel.Rnw'\n> \n> ###################################################\n> ### code chunk number 1: parallel.Rnw:474-" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', -1L, -1L, 'xyz') [1] "xyzf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', -1L, -2L, 'xyz') [1] "xyzf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', -1L, 0L, 'xyz') [1] "ffff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', -1L, 1L, 'xyz') [1] "xfff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', -1L, 2L, 'xyz') [1] "xyff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', -2L, -1L, 'xyz') [1] "xyzf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', -2L, -2L, 'xyz') [1] "xyzf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', -2L, 0L, 'xyz') [1] "ffff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', -2L, 1L, 'xyz') [1] "xfff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', -2L, 2L, 'xyz') [1] "xyff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 0L, -1L, 'xyz') [1] "xyzf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 0L, -2L, 'xyz') [1] "xyzf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 0L, 0L, 'xyz') [1] "ffff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 0L, 1L, 'xyz') [1] "xfff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 0L, 2L, 'xyz') [1] "xyff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 1L, -1L, 'xyz') [1] "xyzf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 1L, -2L, 'xyz') [1] "xyzf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 1L, 0L, 'xyz') [1] "ffff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 1L, 1L, 'xyz') [1] "xfff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 1L, 2L, 'xyz') [1] "xyff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 2L, -1L, 'xyz') [1] "fxyz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 2L, -2L, 'xyz') [1] "fxyz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 2L, 0L, 'xyz') [1] "ffff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 2L, 1L, 'xyz') [1] "ffff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`('ffff', 2L, 2L, 'xyz') [1] "fxff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`(c('asdfasdf', 'jfjfjf', 'ffff'), 2, 5, 1) Error in `substr<-`(c("asdfasdf", "jfjfjf", "ffff"), 2, 5, 1) : invalid value ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`(c('asdfasdf', 'jfjfjf', 'ffff'), 2, 5, NULL) Error in `substr<-`(c("asdfasdf", "jfjfjf", "ffff"), 2, 5, NULL) : invalid value ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`(c('asdfasdf', 'jfjfjf', 'ffff'), 2, 5, c('a', 'asdf')) [1] "aadfasdf" "jasdff" "faff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`(c('asdfasdf', 'jfjfjf', 'ffff'), 2, c(5,15,-6), c('a', 'asdf')) [1] "aadfasdf" "jasdff" "faff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign# #`substr<-`(c('asdfasdf', 'jfjfjf', 'ffff'), c(1,10,-6), 5, c('a', 'asdf')) [1] "asdfasdf" "jfjfjf" "afff" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign1# #argv <- list('(0,5]', 1L, 1L, '['); .Internal(`substr<-`(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] "[0,5]" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign2# #argv <- list(c('asfef', 'qwerty', 'yuiop[', 'b', 'stuff.blah.yech'), 2L, 1000000L, c('..', '+++')); .Internal(`substr<-`(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] "a..ef" "q+++ty" "y..op[" "b" [5] "s..ff.blah.yech" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign_1# #argv <- structure(list(x = c('NA', NA, 'BANANA'), start = 1, stop = 2, value = 'na'), .Names = c('x', 'start', 'stop', 'value'));do.call('substr<-', argv) [1] "na" NA "naNANA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substrassign.testsubstrassign_2# #argv <- structure(list(x = 'abcde', start = NA, stop = 3, value = 'abc'), .Names = c('x', 'start', 'stop', 'value'));do.call('substr<-', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substring.testSubstring# #{ substring("123456", first=2, last=4) } [1] "234" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substring.testSubstring# #{ substring("123456", first=2.8, last=4) } [1] "234" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substring.testSubstring# #{ substring("fastr", first=NA, last=2) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_substring.testSubstring# #{ substring(c("hello", "bye"), first=c(1,2,3), last=4) } [1] "hell" "ye" "ll" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substring.testsubstring1# #argv <- structure(list(text = c('NA', NA, 'BANANA'), first = 1, last = 1), .Names = c('text', 'first', 'last'));do.call('substring', argv) [1] "N" NA "B" ##com.oracle.truffle.r.test.builtins.TestBuiltin_substring.testsubstring2# #argv <- structure(list(text = 'abcdef', first = 1:6, last = 1:6), .Names = c('text', 'first', 'last'));do.call('substring', argv) [1] "a" "b" "c" "d" "e" "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(-1:-100000) [1] -5000050000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(1:100000) [1] 5000050000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(c(-2147483647L), -1) [1] -2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(c(-2147483647L), c(-1L)) [1] -2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(c(-2147483647L, -1L)) [1] -2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(c(2147483647L), 1) [1] 2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(c(2147483647L), TRUE) [1] 2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(c(2147483647L, 1L)) [1] 2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(seq.int(-1, -100000)) [1] -5000050000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(seq.int(1, 100000)) [1] 5000050000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(seq.int(from=-1, by=-1, length.out=100000)) [1] -5000050000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testOveflow# #sum(seq.int(from=1, by=1, length.out=100000)) [1] 5000050000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSideEffect# #{ x <- c(1, 2, 3); f <- function() { x[1] <<- 10; 2 }; g <- function(){ x[1] <<- 100; 0 }; sum(x, f(), x, g()) } [1] 23 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #sum(c(1,2,NA,3), na.rm=NA) [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #sum(v <- 42) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ `sum`(1:10) } [1] 55 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ is.logical(sum(TRUE)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ is.logical(sum(TRUE, FALSE)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum("42", "7") } Error in sum("42", "7") : invalid 'type' (character) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum("42", as.character(NA), "7", na.rm=FALSE) } Error in sum("42", as.character(NA), "7", na.rm = FALSE) : invalid 'type' (character) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum("42", as.character(NA), "7", na.rm=TRUE) } Error in sum("42", as.character(NA), "7", na.rm = TRUE) : invalid 'type' (character) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum("42", as.character(NA), na.rm=FALSE) } Error in sum("42", as.character(NA), na.rm = FALSE) : invalid 'type' (character) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum("42", as.character(NA), na.rm=TRUE) } Error in sum("42", as.character(NA), na.rm = TRUE) : invalid 'type' (character) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum() } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(0, 1, 2, 3) } [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(0, 1[3]) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(0, 1[3], na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(0, 1[3], na.rm=TRUE) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(0, na.rm=FALSE, 1[3]) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(1+1i,2,NA, na.rm=TRUE) } [1] 3+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(1:6, 3, 4) } [1] 28 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(1:6, 3L, TRUE) } [1] 25 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(42+42i, 7+7i) } [1] 49+49i ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(42, as.double(NA), 7, na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(42, as.double(NA), 7, na.rm=TRUE) } [1] 49 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(42, as.double(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(42, as.double(NA), na.rm=TRUE) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(42L, as.integer(NA), 7L, na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(42L, as.integer(NA), 7L, na.rm=TRUE) } [1] 49 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(42L, as.integer(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(42L, as.integer(NA), na.rm=TRUE) } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.character(NA), as.character(NA), na.rm=FALSE) } Error in sum(as.character(NA), as.character(NA), na.rm = FALSE) : invalid 'type' (character) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.character(NA), as.character(NA), na.rm=TRUE) } Error in sum(as.character(NA), as.character(NA), na.rm = TRUE) : invalid 'type' (character) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.character(NA), na.rm=FALSE) } Error in sum(as.character(NA), na.rm = FALSE) : invalid 'type' (character) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.character(NA), na.rm=TRUE) } Error in sum(as.character(NA), na.rm = TRUE) : invalid 'type' (character) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.double(NA), as.double(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.double(NA), as.double(NA), na.rm=TRUE) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.double(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.double(NA), na.rm=TRUE) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.integer(NA), as.integer(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.integer(NA), as.integer(NA), na.rm=TRUE) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.integer(NA), na.rm=FALSE) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.integer(NA), na.rm=TRUE) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(as.raw(42), as.raw(7)) } Error in sum(as.raw(42), as.raw(7)) : invalid 'type' (raw) of argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(c(0, 1, 2, 3)) } [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(c(0, 1, 2, 3), 4) } [1] 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ sum(na.rm=FALSE, 0, 1[3]) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ x<-c(FALSE, FALSE); is.double(sum(x)) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testSum# #{ x<-c(FALSE, FALSE); is.integer(sum(x)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum1# #argv <- list(structure(313, .Names = ''));sum(argv[[1]]); [1] 313 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum10# #argv <- list(structure(c(1.40573809911564e-05, 2.82275077233781e-31, 298891091593544, 127.398214346512, 1.96341150816547e-14, 0.100886417276321, 18137216711891664896, 75471627676.8224, 1.0423615801344e-05, 4184414.04436152, 0.00284364073413795, 0.124845661512668, 6.26689770279226e-09, 137507212543972912, 2.4515242751977e-06, 17279.5247449809, 9.31653241445582, 2.95260115615331e-07, 2.47540394744834e+33, 1.06282257391682e-08, 280.577969261283, 2.2306055461863e-12, 28194894.3770164, 3.27212932994522e+56, 2.35217223982607e-15, 1.93298541124412e-16, 3.82110080220967e-22, 0.020664532453814, 838.952367401989, 1.48989538272057, 58.0422958839475, 25315229.2305008, 1.14418993503202e-07, 0.141089233086962, 385551.97528297, 72589269069.5057, 3.63818589408037, 3.93055539198144e-15, 0.484224006687325, 0.00122384090262982, 509.681530848699, 1.09212481089264e-13, 4.20671904141446e-12, 1.41116557356417, 0.161225941178553, 0.369883152940699, 0.000211066453902523, 1536.88854142326, 1.21220206873588e-13, 18.2818077643159, 67.5636713643055, 33.0891402079429, 1.17150909115673e-23, 304202.728006006, 0.00353331875245541, 4.32607156718415e+28, 776642523346.066, 0.00115835488031795, 0.00496146869860724, 5.31574527522895e-12), .Dim = 60L, .Dimnames = list(c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'))));sum(argv[[1]]); [1] 3.272129e+56 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum11# #argv <- list(1:10, 1+1i);sum(argv[[1]],argv[[2]]); [1] 56+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum12# #argv <- list(structure(c(2.19172926547288, 0.330877282992322, 2.43947034322552, 1.27858232527863, 1.34995699383497, 2.31589710162493, -0.100056357529734, 2.12383938264747, 1.1838950457512, 2.61258053432978, -0.0427077741902965, 3.32267292229042, 2.72078100200188, 1.50121623996352, 0.286636947273328, 0.276805761557996, 1.58770673719377, 1.2835349906538, 2.21171702752298, 0.371840556806206, 0.185048028214896, 0.083459109156465, 0.189963621072562, 0.342346999660209, -0.144296693248728, 0.352178185375541, 0.217818647266003, 2.22181318666033, 0.121145321065238, 0.289914009178438, 0.257143390127332, -0.0394307122851858, 2.17200902055199, 0.229288363933891, 1.6805330236497, -0.20328380754072, 0.25058926631711, 1.33428464681067, -0.00502156228152353, NaN, 3.26336745706726, 1.9882766360458, 0.117868259160127, 2.69303413653791, 2.56113239793806, 0.265336044890108, 3.07945609430521, 0.221095709171114, 0.0408573043900261, 0.278444292510551, 1.33428464681067, 1.06801925109484, 0.209625992503226, 3.06212550875829, 0.116229728207572, 1.39280910631599, 2.53602717112413, 0.0457728972476921, 4.7651657207987, 0.194879213930228, 0.114591197255017, 3.26336745706726, 0.0883747020141311, 1.88846207251023, 0.119506790112683, 1.87250223559585, 2.35968057412311, 0.29974519489377, 0.29974519489377, 0.031026118674694, 1.47173382020508, 2.41624560055216, 0.167024187736788, 3.40508627615607, 3.34290799326704, 0.0113637472440299, 0.0588811448681349, 1.54990439966979, 1.35522847629799, 3.07945609430521, 0.224372771076225, 0.129337975828015, 2.99455268975735, 2.83681720000879, 0.0506884901053581, 0.334154344897433, 3.91642660780075, 1.17486192682541, 2.77775688906243, 0.194879213930228, 1.77308062628823, 0.298106663941215, 1.45438038819124, 0.193240682977673, 3.30267449277716, 1.38194860291798, 1.66007135758589, 5.1096442273052, 0.337431406802543, 0.363647902043429), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100')));sum(argv[[1]]); [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum13# #argv <- list(numeric(0));sum(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum14# #argv <- list(c(49, 61, NA, NA));sum(argv[[1]]); [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum15# #argv <- list(1073741824L, 1073741824L, 0);sum(argv[[1]],argv[[2]],argv[[3]]); [1] 2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum16# #argv <- list(1073741824L, 1073741824L);sum(argv[[1]],argv[[2]]); [1] 2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum17# #argv <- list(structure(c(TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Tsp = c(1, 101, 1), class = 'ts'));sum(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum18# #argv <- list(c(1073741824L, 1073741824L));sum(argv[[1]]); [1] 2147483648 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum19# #argv <- list(structure(c(0.0946626763551857, 1.56832184548816e-06, 0.226697441774756, 0.00453708504256956, 0.258320521579932, 2.57680524978307, 0.467122524211721, 5.16534267196331, 0.694563006492192, 0.197723848046524, 0.000799319848162311, 0.000570944537286636, 0.0654689540726797, 0.000146788076901938, 0.00669686464041458, 0.00765355286634145, 0.0786604017778045, 1.25812820036403e-06, 0.167435582495234, 0.00356206279639504, 0.25547689715822, 2.72165076185825, 0.488128793070721, 3.66078502081211, 0.898984802200849, 0.190804322887854, 0.00080933803412378, 0.000578096808847448, 0.0782510283683936, 0.000156595864868186, 0.00698171105046541, 0.00797910506602018), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32')));sum(argv[[1]]); [1] 18.32736 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum2# #argv <- list(structure(c(-3.02896519757699, -2.37177231827064, -2.49295252901048, -2.99672420295655, -2.59773735414265, -2.26026537208028, -2.74080517809177, -3.785668787425, -2.80120311135215, -2.57773983108655, -5.06092522358575, -2.25629807618983), .Names = c('1', '3', '5', '7', '9', '11', '13', '15', '17', '19', '21', '23')));sum(argv[[1]]); [1] -34.97106 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum20# #argv <- list(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE));sum(argv[[1]]); [1] 93 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum21# #argv <- list(structure(c(6L, 12L, 18L, 24L, 30L, 36L, 42L, 48L, 54L, 60L, 66L, 72L, 78L, 84L, 90L, 96L, 102L, 108L, 114L, 120L), .Dim = 4:5, .Dimnames = list(NULL, c('V5', 'V6', 'V7', 'V8', 'V9'))));sum(argv[[1]]); [1] 1260 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum23# #argv <- list(2, 3, NA);do.call('sum', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum3# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), class = 'table', .Dim = 60L, .Dimnames = structure(list(r = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60')), .Names = 'r')));sum(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum4# #argv <- list(structure(c(-1.94895827232912e-306, 0, 9.36477567902783e-210, 3.61651164350633e-272, 0, -6.24957292845831e-288, 8.01866432306958e-186, 8.68951728615672e-228, -4.51587577314873e-307, 3.44824066264446e-249, -3.07734214990199e-295, -1.63737039109249e-287, -6.4228533959362e-323, 1.99299936577426e-196, -3.77967355768316e-310, 2.99503783387623e-261, 3.69173164797792e-278, -1.16866860094119e-314, 3.18619635538936e-115, -9.28843414181544e-322, 2.14105998923225e-270, 0, 5.16415548974996e-245, 6.63795852562496, 0, 0, 0, -3.94804275684608e-291, 5.96425287032638e-268, 7.18607375106076e-283, 6.05285733998884e-274, 3.00167530091305e-245, -1.10890415661145e-316, -2.83304044404219e-287, 2.03740072057053e-254, 7.14727745939762e-228, 1.98119254926182e-280, 0, -4.86004310565019e-285, -5.29597124993551e-297, 4.62156398366003e-269, 0, 0, 4.73760851736069e-283, -5.12888870803705e-287, -1.74386324923243e-285, -1.06055701952213e-300, 1.32316178368225e-266, 0, 1.3776952356639e-276, 1.33745692946041e-273, 3.1799923028917e-275, 0, 6.14747062861386e-255, -8.73416235737445e-295, 5.68676829309248e-139, 1.04052519425852e-222, -4.06077295726178e-297, -4.44772889827087e-294, 0), .Dim = 60L, .Dimnames = list(c('1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1', '1'))));sum(argv[[1]]); [1] 6.637959 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum5# #argv <- list(c(2.24999999999999, 0.809999999999997, 3.24, 2.89, 0.0899999999999994, 1.96, 6.25, 0.490000000000001, 9.00000000000001, 0.00999999999999993, 0.249999999999998, 4.41000000000001, 3.24, 3.60999999999999));sum(argv[[1]]); [1] 38.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum6# #argv <- list(structure(c(42L, 1L, 0L, 16L, 84L, 0L, 3L, 0L, 0L), .Dim = c(3L, 3L), .Dimnames = structure(list(c('(0,2.5]', '(2.5,4]', NA), c('(2,5.5]', '(5.5,10]', NA)), .Names = c('', '')), class = 'table'));sum(argv[[1]]); [1] 146 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum7# #argv <- list(structure(c(TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = c(101L, 3L), .Dimnames = list(NULL, c('t1', '10 * t1', 't1 - 4')), .Tsp = c(1, 101, 1), class = c('mts', 'ts', 'matrix')));sum(argv[[1]]); [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum8# #argv <- list(structure(c(1, 0, 0, 0, 1, 0, 0, 0, 1), .Dim = c(3L, 3L)), extrarg = FALSE);sum(argv[[1]],argv[[2]]); [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sum.testsum9# #sum( ); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_summary.testSummary# #summary(c(1.601,1.616)) Min. 1st Qu. Median Mean 3rd Qu. Max. 1.601 1.605 1.609 1.609 1.612 1.616 ##com.oracle.truffle.r.test.builtins.TestBuiltin_summary.testsummary1# #argv <- structure(list(object = structure(c(4L, 4L, 4L, 4L, 4L, 3L, 4L, 4L, 4L, 4L, 3L, 4L, 3L, 4L, 4L, 4L, 4L, 2L, 4L, 3L, 4L, 4L, 4L, 2L), .Dim = c(6L, 4L), .Dimnames = structure(list(c('25-34', '35-44', '45-54', '55-64', '65-74', '75+'), c('0-39g/day', '40-79', '80-119', '120+')), .Names = c('', '')), class = 'table')), .Names = 'object');do.call('summary', argv) Number of cases in table: 88 Number of factors: 2 Test for independence of all factors: Chisq = 1.4189, df = 15, p-value = 1 Chi-squared approximation may be incorrect ##com.oracle.truffle.r.test.builtins.TestBuiltin_summary.testsummary2# #argv <- structure(list(object = c(5.1, 5, 5.4, 5.4, 5.8, 5.7, 5.4, 5.1, 5.7, 5.1, 5.1, 4.6, 5.2, 5.2, 5.5, 5.5, 4.9, 5, 5, 5.1, 5.1, 5.3)), .Names = 'object');do.call('summary', argv) Min. 1st Qu. Median Mean 3rd Qu. Max. 4.600 5.100 5.150 5.236 5.400 5.800 ##com.oracle.truffle.r.test.builtins.TestBuiltin_summary.testsummary3# #argv <- structure(list(object = structure(list(Sepal.Length = c(5.1, 4.9, 4.7, 4.6, 5, 5.4, 4.6, 5, 4.4, 4.9, 5.4, 4.8, 4.8, 4.3, 5.8, 5.7, 5.4, 5.1, 5.7, 5.1, 5.4, 5.1, 4.6, 5.1, 4.8, 5, 5, 5.2, 5.2, 4.7, 4.8, 5.4, 5.2, 5.5, 4.9, 5, 5.5, 4.9, 4.4, 5.1, 5, 4.5, 4.4, 5, 5.1, 4.8, 5.1, 4.6, 5.3, 5, 7, 6.4, 6.9, 5.5, 6.5, 5.7, 6.3, 4.9, 6.6, 5.2, 5, 5.9, 6, 6.1, 5.6, 6.7, 5.6, 5.8, 6.2, 5.6, 5.9, 6.1, 6.3, 6.1, 6.4, 6.6, 6.8, 6.7, 6, 5.7, 5.5, 5.5, 5.8, 6, 5.4, 6, 6.7, 6.3, 5.6, 5.5, 5.5, 6.1, 5.8, 5, 5.6, 5.7, 5.7, 6.2, 5.1, 5.7, 6.3, 5.8, 7.1, 6.3, 6.5, 7.6, 4.9, 7.3, 6.7, 7.2, 6.5, 6.4, 6.8, 5.7, 5.8, 6.4, 6.5, 7.7, 7.7, 6, 6.9, 5.6, 7.7, 6.3, 6.7, 7.2, 6.2, 6.1, 6.4, 7.2, 7.4, 7.9, 6.4, 6.3, 6.1, 7.7, 6.3, 6.4, 6, 6.9, 6.7, 6.9, 5.8, 6.8, 6.7, 6.7, 6.3, 6.5, 6.2, 5.9), Sepal.Width = c(3.5, 3, 3.2, 3.1, 3.6, 3.9, 3.4, 3.4, 2.9, 3.1, 3.7, 3.4, 3, 3, 4, 4.4, 3.9, 3.5, 3.8, 3.8, 3.4, 3.7, 3.6, 3.3, 3.4, 3, 3.4, 3.5, 3.4, 3.2, 3.1, 3.4, 4.1, 4.2, 3.1, 3.2, 3.5, 3.6, 3, 3.4, 3.5, 2.3, 3.2, 3.5, 3.8, 3, 3.8, 3.2, 3.7, 3.3, 3.2, 3.2, 3.1, 2.3, 2.8, 2.8, 3.3, 2.4, 2.9, 2.7, 2, 3, 2.2, 2.9, 2.9, 3.1, 3, 2.7, 2.2, 2.5, 3.2, 2.8, 2.5, 2.8, 2.9, 3, 2.8, 3, 2.9, 2.6, 2.4, 2.4, 2.7, 2.7, 3, 3.4, 3.1, 2.3, 3, 2.5, 2.6, 3, 2.6, 2.3, 2.7, 3, 2.9, 2.9, 2.5, 2.8, 3.3, 2.7, 3, 2.9, 3, 3, 2.5, 2.9, 2.5, 3.6, 3.2, 2.7, 3, 2.5, 2.8, 3.2, 3, 3.8, 2.6, 2.2, 3.2, 2.8, 2.8, 2.7, 3.3, 3.2, 2.8, 3, 2.8, 3, 2.8, 3.8, 2.8, 2.8, 2.6, 3, 3.4, 3.1, 3, 3.1, 3.1, 3.1, 2.7, 3.2, 3.3, 3, 2.5, 3, 3.4, 3), Petal.Length = c(1.4, 1.4, 1.3, 1.5, 1.4, 1.7, 1.4, 1.5, 1.4, 1.5, 1.5, 1.6, 1.4, 1.1, 1.2, 1.5, 1.3, 1.4, 1.7, 1.5, 1.7, 1.5, 1, 1.7, 1.9, 1.6, 1.6, 1.5, 1.4, 1.6, 1.6, 1.5, 1.5, 1.4, 1.5, 1.2, 1.3, 1.4, 1.3, 1.5, 1.3, 1.3, 1.3, 1.6, 1.9, 1.4, 1.6, 1.4, 1.5, 1.4, 4.7, 4.5, 4.9, 4, 4.6, 4.5, 4.7, 3.3, 4.6, 3.9, 3.5, 4.2, 4, 4.7, 3.6, 4.4, 4.5, 4.1, 4.5, 3.9, 4.8, 4, 4.9, 4.7, 4.3, 4.4, 4.8, 5, 4.5, 3.5, 3.8, 3.7, 3.9, 5.1, 4.5, 4.5, 4.7, 4.4, 4.1, 4, 4.4, 4.6, 4, 3.3, 4.2, 4.2, 4.2, 4.3, 3, 4.1, 6, 5.1, 5.9, 5.6, 5.8, 6.6, 4.5, 6.3, 5.8, 6.1, 5.1, 5.3, 5.5, 5, 5.1, 5.3, 5.5, 6.7, 6.9, 5, 5.7, 4.9, 6.7, 4.9, 5.7, 6, 4.8, 4.9, 5.6, 5.8, 6.1, 6.4, 5.6, 5.1, 5.6, 6.1, 5.6, 5.5, 4.8, 5.4, 5.6, 5.1, 5.1, 5.9, 5.7, 5.2, 5, 5.2, 5.4, 5.1), Petal.Width = c(0.2, 0.2, 0.2, 0.2, 0.2, 0.4, 0.3, 0.2, 0.2, 0.1, 0.2, 0.2, 0.1, 0.1, 0.2, 0.4, 0.4, 0.3, 0.3, 0.3, 0.2, 0.4, 0.2, 0.5, 0.2, 0.2, 0.4, 0.2, 0.2, 0.2, 0.2, 0.4, 0.1, 0.2, 0.2, 0.2, 0.2, 0.1, 0.2, 0.2, 0.3, 0.3, 0.2, 0.6, 0.4, 0.3, 0.2, 0.2, 0.2, 0.2, 1.4, 1.5, 1.5, 1.3, 1.5, 1.3, 1.6, 1, 1.3, 1.4, 1, 1.5, 1, 1.4, 1.3, 1.4, 1.5, 1, 1.5, 1.1, 1.8, 1.3, 1.5, 1.2, 1.3, 1.4, 1.4, 1.7, 1.5, 1, 1.1, 1, 1.2, 1.6, 1.5, 1.6, 1.5, 1.3, 1.3, 1.3, 1.2, 1.4, 1.2, 1, 1.3, 1.2, 1.3, 1.3, 1.1, 1.3, 2.5, 1.9, 2.1, 1.8, 2.2, 2.1, 1.7, 1.8, 1.8, 2.5, 2, 1.9, 2.1, 2, 2.4, 2.3, 1.8, 2.2, 2.3, 1.5, 2.3, 2, 2, 1.8, 2.1, 1.8, 1.8, 1.8, 2.1, 1.6, 1.9, 2, 2.2, 1.5, 1.4, 2.3, 2.4, 1.8, 1.8, 2.1, 2.4, 2.3, 1.9, 2.3, 2.5, 2.3, 1.9, 2, 2.3, 1.8), Species = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('setosa', 'versicolor', 'virginica'), class = 'factor')), .Names = c('Sepal.Length', 'Sepal.Width', 'Petal.Length', 'Petal.Width', 'Species'), row.names = c(NA, -150L), class = 'data.frame')), .Names = 'object');do.call('summary', argv) Sepal.Length Sepal.Width Petal.Length Petal.Width Min. :4.300 Min. :2.000 Min. :1.000 Min. :0.100 1st Qu.:5.100 1st Qu.:2.800 1st Qu.:1.600 1st Qu.:0.300 Median :5.800 Median :3.000 Median :4.350 Median :1.300 Mean :5.843 Mean :3.057 Mean :3.758 Mean :1.199 3rd Qu.:6.400 3rd Qu.:3.300 3rd Qu.:5.100 3rd Qu.:1.800 Max. :7.900 Max. :4.400 Max. :6.900 Max. :2.500 Species setosa :50 versicolor:50 virginica :50 ##com.oracle.truffle.r.test.builtins.TestBuiltin_summaryconnection.testsummaryconnection1# #argv <- list(structure(2L, class = c('terminal', 'connection'))); .Internal(summary.connection(argv[[1]])) $description [1] "stderr" $class [1] "terminal" $mode [1] "w" $text [1] "text" $opened [1] "opened" $`can read` [1] "no" $`can write` [1] "yes" ##com.oracle.truffle.r.test.builtins.TestBuiltin_svd.testSvd# #{ hilbert <- function(n) { i <- 1:n; 1 / outer(i - 1, i, '+') }; X <- hilbert(9)[, 1:6]; svd(X) } $d [1] 1.668433e+00 2.773727e-01 2.223722e-02 1.084693e-03 3.243788e-05 [6] 5.234864e-07 $u [,1] [,2] [,3] [,4] [,5] [,6] [1,] -0.7244999 0.6265620 0.27350003 -0.08526902 0.02074121 -0.00402455 [2,] -0.4281556 -0.1298781 -0.64293597 0.55047428 -0.27253421 0.09281592 [3,] -0.3121985 -0.2803679 -0.33633240 -0.31418014 0.61632113 -0.44090375 [4,] -0.2478932 -0.3141885 -0.06931246 -0.44667149 0.02945426 0.53011986 [5,] -0.2063780 -0.3140734 0.10786005 -0.30241655 -0.35566839 0.23703838 [6,] -0.1771408 -0.3026808 0.22105904 -0.09041508 -0.38878613 -0.26044927 [7,] -0.1553452 -0.2877310 0.29280775 0.11551327 -0.19285565 -0.42094482 [8,] -0.1384280 -0.2721599 0.33783778 0.29312535 0.11633231 -0.16079025 [9,] -0.1248940 -0.2571250 0.36542543 0.43884649 0.46496714 0.43459954 $v [,1] [,2] [,3] [,4] [,5] [,6] [1,] -0.7364928 0.6225002 0.2550021 -0.06976287 0.01328234 -0.001588146 [2,] -0.4432826 -0.1818705 -0.6866860 0.50860089 -0.19626669 0.041116974 [3,] -0.3274789 -0.3508553 -0.2611139 -0.50473697 0.61605641 -0.259215626 [4,] -0.2626469 -0.3921783 0.1043599 -0.43747940 -0.40833605 0.638901622 [5,] -0.2204199 -0.3945644 0.3509658 0.01612426 -0.46427916 -0.675826789 [6,] -0.1904420 -0.3831871 0.5110654 0.53856351 0.44663632 0.257248908 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sweep.testSweep# #{ A <- matrix(1:15, ncol=5); sweep(A, 2, colSums(A), "/") } [,1] [,2] [,3] [,4] [,5] [1,] 0.1666667 0.2666667 0.2916667 0.3030303 0.3095238 [2,] 0.3333333 0.3333333 0.3333333 0.3333333 0.3333333 [3,] 0.5000000 0.4000000 0.3750000 0.3636364 0.3571429 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sweep.testSweep#Output.MissingWarning# #{ A <- matrix(1:50, nrow=4); sweep(A, 1, 5, '-') } [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] [1,] -4 0 4 8 12 16 20 24 28 32 36 40 44 [2,] -3 1 5 9 13 17 21 25 29 33 37 41 45 [3,] -2 2 6 10 14 18 22 26 30 34 38 42 -4 [4,] -1 3 7 11 15 19 23 27 31 35 39 43 -3 Warning message: In matrix(1:50, nrow = 4) : data length [50] is not a sub-multiple or multiple of the number of rows [4] ##com.oracle.truffle.r.test.builtins.TestBuiltin_sweep.testSweep#Output.MissingWarning# #{ A <- matrix(7:1, nrow=5); sweep(A, 1, -1, '*') } [,1] [,2] [1,] -7 -2 [2,] -6 -1 [3,] -5 -7 [4,] -4 -6 [5,] -3 -5 Warning message: In matrix(7:1, nrow = 5) : data length [7] is not a sub-multiple or multiple of the number of rows [5] ##com.oracle.truffle.r.test.builtins.TestBuiltin_sweep.testSweep# #{ sweep(array(1:24, dim = 4:2), 1, 1:4) } , , 1 [,1] [,2] [,3] [1,] 0 4 8 [2,] 0 4 8 [3,] 0 4 8 [4,] 0 4 8 , , 2 [,1] [,2] [,3] [1,] 12 16 20 [2,] 12 16 20 [3,] 12 16 20 [4,] 12 16 20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sweep.testSweep# #{ sweep(array(1:24, dim = 4:2), 1, 5) } , , 1 [,1] [,2] [,3] [1,] -4 0 4 [2,] -3 1 5 [3,] -2 2 6 [4,] -1 3 7 , , 2 [,1] [,2] [,3] [1,] 8 12 16 [2,] 9 13 17 [3,] 10 14 18 [4,] 11 15 19 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sweep.testSweep# #{ sweep(array(1:24, dim = 4:2), 1:2, 5) } , , 1 [,1] [,2] [,3] [1,] -4 0 4 [2,] -3 1 5 [3,] -2 2 6 [4,] -1 3 7 , , 2 [,1] [,2] [,3] [1,] 8 12 16 [2,] 9 13 17 [3,] 10 14 18 [4,] 11 15 19 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sweep.testsweep1#Ignored.OutputFormatting# #argv <- structure(list(x = structure(integer(0), .Dim = c(5L, 0L)), MARGIN = 2, STATS = integer(0)), .Names = c('x', 'MARGIN', 'STATS'));do.call('sweep', argv) [1,] [2,] [3,] [4,] [5,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #f <- function(x){switch("aa", aa = , ab = 42)};f() [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #f <- function(x){switch("aa", aa = , ab = 42)};f(quote(f(1,2,))[[4]]) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #f <- function(x){switch("aa", aa = , ab = x)};f() Error in f() : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #f <- function(x){switch("aa", aa = , ab = x)};f(quote(f(1,2,))[[4]]) ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #f <- function(x){switch("aa", aa = x, ab = 42)};f() Error in f() : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #f <- function(x){switch("aa", aa = x, ab = 42)};f(quote(f(1,2,))[[4]]) ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch#Ignored.Unimplemented# #switch('q', a=42,) Error: argument is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{ a <- NULL ; switch(mode(a), NULL="naught") } [1] "naught" ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{ a <- NULL ; switch(mode(a), NULL=) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{ answer<-"no";switch(as.character(answer), yes=, YES=1, no=, NO=2,3) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{ test1 <- function(type) { switch(type, mean = 1, median = 2, trimmed = 3) };test1("median")} [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{ test1 <- function(type) { switch(type, mean = mean(c(1,2,3,4)), median = 2, trimmed = 3) };test1("mean")} [1] 2.5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{ u <- "uiui" ; switch(u, "iuiu" = "ieps", "uiui" = "miep") } [1] "miep" ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{ x <- "!"; v <- switch(x, ""=v77, "<=" =, "<" =, ">" = 99, v55)} Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch#Output.IgnoreErrorContext# #{ x <- "!"; v <- switch(x, v77, "<=" =, "<" =, ">" = 99, v55)} Error: duplicate 'switch' defaults: 'v77' and 'v55' ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{ x <- "<"; switch(x, "<=" =, "<" =, ">" = TRUE, FALSE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{ x <- "<"; switch(x, "<=" =, "<" =, ">" =, FALSE) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{ x <- "<"; v <- switch(x, "<=" =, "<" =, ">" = TRUE, FALSE); v } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{switch(3,1,2,3)} [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{switch(4,1,2,3)} ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitch# #{switch(4,1,2,z)} ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch('E'=1, 'E'=c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch('E'=1, E=c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch('E'=1, c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch('EX'=1, 'EX'=c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch('EX'=1, c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch('EXP'=1, c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch('EXPR'=1, 'EXPR'=c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch('EXPR'=1, c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(1, 'E'=c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(1, 'EX'=c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(1, 'EXPR'=c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(1, EXPR=c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(1, c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(E=1, c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(EX=1, c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(EXP=1, c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(EXPR=1, EXPR=c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(EXPR=1, c(0,0)) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchArgumentMatching# #switch(EXPR=c(0,0), EXPR=1) Error in switch(EXPR = c(0, 0), EXPR = 1) : EXPR must be a length 1 vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchInvalidExpr# #{ switch(quote(a), 1, 2, 3) } Error in switch(quote(a), 1, 2, 3) : EXPR must be a length 1 vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchInvalidExpr# #{ x <- switch(NA, 1, 2, 3); x } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchInvalidExpr# #{ x <- switch(expression(quote(1)), 1, 2, 3); x } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchInvalidExpr# #{ x <- switch(expression(quote(1), quote(2)), 1, 2, 3); x } Error in switch(expression(quote(1), quote(2)), 1, 2, 3) : EXPR must be a length 1 vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchInvalidExpr# #{ x <- switch(list(1,2,3), 1, 2, 3); x } Error in switch(list(1, 2, 3), 1, 2, 3) : EXPR must be a length 1 vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testSwitchInvalidExpr# #{ x <- switch(list(2), 1, 2, 3); x } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testswitch1# #argv <- structure(list('forward', forward = 'posS', reverse = 'negS'), .Names = c('', 'forward', 'reverse'));do.call('switch', argv) [1] "posS" ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testswitch2#Output.IgnoreWarningContext# #argv <- list(3L);do.call('switch', argv) Warning message: In switch(3L) : 'switch' with no alternatives ##com.oracle.truffle.r.test.builtins.TestBuiltin_switch.testswitch4# #argv <- list(2L, TRUE, FALSE, FALSE);do.call('switch', argv) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.frameAccessCommonTest# #options(keep.source = FALSE);{ foo <- function(x) lapply(1:7, function(i) sys.call(i))[c(-4,-7)];bar <- function(ba) do.call(foo, list(ba));boo <- function(bo) bar(bo);callboo <- function(cb) do.call("boo", list(cb));fun <- function(f) callboo(f);fun(42);} [[1]] fun(42) [[2]] callboo(f) [[3]] do.call("boo", list(cb)) [[4]] bar(bo) [[5]] do.call(foo, list(ba)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.frameAccessCommonTest# #options(keep.source = TRUE); ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = FALSE);{ bar.default<-function(a)sys.call(); bar<-function(a)UseMethod('bar'); bar(a=42); } bar.default(a = 42) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = FALSE);{ bar.default<-function(a,...,b)sys.call(); bar<-function(a,x,...)UseMethod('bar'); bar(1,x=2,b=3,c=4); } bar.default(1, x = 2, b = 3, c = 4) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = FALSE);{ f <- function() sys.call() ; g <- function() f() ; h <- function() g() ; h() } f() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = FALSE);{ f <- function() sys.call() ; g <- function(a=1,b=3,...) f() ; h <- function(q=33) g() ; h() } f() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = FALSE);{ f <- function() sys.call(-1) ; g <- function() f() ; h <- function() g() ; h() } g() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = FALSE);{ f <- function() sys.call(2) ; g <- function() f() ; h <- function() g() ; h() } g() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = FALSE);{ f <- function(x, y) sys.call() ; f(1, y=2) } f(1, y = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = FALSE);{ f <- function(x, y) sys.call() ; f(x=1, 2) } f(x = 1, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = FALSE);{ f <- function(x, y) sys.call() ; f(y=1, 2) } f(y = 1, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = FALSE);{ f <- function(x, y) sys.call() ; f(y=1, x=2) } f(y = 1, x = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #options(keep.source = TRUE); ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall#Output.IgnoreWhitespace# #{ (function() sys.call())() } (function() sys.call())() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function() sys.call() ; f() } f() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function() sys.call() ; typeof(f()[[1]]) } [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function() sys.call(-2) ; g <- function() f() ; h <- function() g() ; h() } h() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function() sys.call(1) ; g <- function() f() ; g() } g() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function() sys.call(1) ; g <- function() f() ; h <- function() g() ; h() } h() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function(x) sys.call() ; f(2) } f(2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function(x) sys.call() ; f(x = 2) } f(x = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function(x) sys.call() ; g <- function() 23 ; f(g()) } f(g()) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function(x) sys.call() ; typeof(f(x = 2)[[1]]) } [1] "symbol" ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function(x) sys.call() ; typeof(f(x = 2)[[2]]) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ f <- function(x, y) sys.call() ; f(1, 2) } f(1, 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ foo<-function(x, ...) UseMethod("foo"); foo.baz<-function(x, ...) NextMethod(); y<-1; class(y)<-c("baz", "bar"); foo.bar<-function(x, ...) sys.call(0); foo(y, 42) } foo.bar(y, 42) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ foo<-function(x, z) UseMethod("foo"); foo.baz<-function(x, z) NextMethod(); y<-1; class(y)<-c("baz", "bar"); foo.bar<-function(x, z) sys.call(0); foo(y, 42) } foo.bar(y, 42) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall#Output.IgnoreWhitespace# #{ x<-(function(f) f())(function() sys.call(1)); list(x[[1]], x[[2]][[1]], x[[2]][[2]], x[[2]][[3]]) } [[1]] (function(f) f()) [[2]] `function` [[3]] NULL [[4]] sys.call(1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscall.testSysCall# #{ x<-do.call(function() sys.call(0), list()); x[[1]] } function() sys.call(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCalls# #options(keep.source = FALSE);{ f <- function(x) sys.calls(); g <- function() f(x); g() } [[1]] g() [[2]] f(x) ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCalls# #options(keep.source = TRUE); ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCalls# #sys.calls() NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCalls# #{ f <- function(x) sys.calls(); g <- function() f(x); length(try(g())) } [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCallsPromises# #options(keep.source = FALSE);{ v <- function() sys.calls(); u<- function() v(); f <- function(x) x ; g <- function(y) f(y) ; h <- function(z=u()) g(z) ; h() } [[1]] h() [[2]] g(z) [[3]] f(y) [[4]] u() [[5]] v() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCallsPromises# #options(keep.source = TRUE); ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCallsPromises# #{ f <- function(x) x; g <- function() f(sys.calls()); g() } [[1]] g() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCallsPromises# #{ f <- function(x) x; g <- function() f(sys.calls()); length(try(g())) } [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCallsWithEval# #options(keep.source = FALSE);{ foo <- function() sys.calls(); bar <- function() eval(parse(text='foo()')); bar(); } [[1]] bar() [[2]] eval(parse(text = "foo()")) [[3]] eval(parse(text = "foo()")) [[4]] foo() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCallsWithEval# #options(keep.source = FALSE);{ foo <- function() sys.calls(); bar <- function() eval(parse(text='foo()'), envir=new.env()); bar(); } [[1]] bar() [[2]] eval(parse(text = "foo()"), envir = new.env()) [[3]] eval(parse(text = "foo()"), envir = new.env()) [[4]] foo() ##com.oracle.truffle.r.test.builtins.TestBuiltin_syscalls.testSysCallsWithEval# #options(keep.source = TRUE); ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.frameAccessCommonTest# #{ foo <- function(x) lapply(1:7, function(x) ls(sys.frame(x)));bar <- function(ba) do.call(foo, list(ba));boo <- function(bo) bar(bo);callboo <- function(cb) do.call("boo", list(cb));fun <- function(f) callboo(f);fun(42);} [[1]] [1] "f" [[2]] [1] "cb" [[3]] [1] "args" "envir" "quote" "what" [[4]] [1] "bo" [[5]] [1] "ba" [[6]] [1] "args" "envir" "quote" "what" [[7]] [1] "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = -1); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = -2); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } [1] "aa" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = -3); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } Error in get("xx", envir = -3) : object 'xx' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = -4); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = -6); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } Error in get("xx", envir = -6) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 0); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } Error in get("xx", envir = 0) : object 'xx' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 1); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 2); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } Error in get("xx", envir = 2) : object 'xx' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 3); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } [1] "aa" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 4); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } [1] "xv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 5); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } Error in get("xx", envir = 5) : object 'xx' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() get('xx', envir = 6); xy <- new.env(); xy$xx <- 'aa'; eval(parse(text='f1()'), envir=xy)}; f() } Error in get("xx", envir = 6) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(-1)); eval(parse(text='f1()'), envir=environment())}; f() } [1] "f1" "xx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(-2)); eval(parse(text='f1()'), envir=environment())}; f() } [1] "enclos" "envir" "expr" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(-3)); eval(parse(text='f1()'), envir=environment())}; f() } [1] "f1" "xx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(-4)); eval(parse(text='f1()'), envir=environment())}; f() } [1] "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(-6)); eval(parse(text='f1()'), envir=environment())}; f() } Error in as.environment(pos) : no item called "sys.frame(-6)" on the search list In addition: Warning message: In ls(sys.frame(-6)) : ‘sys.frame(-6)’ converted to character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(0)); eval(parse(text='f1()'), envir=environment())}; f() } [1] "f" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(1)); eval(parse(text='f1()'), envir=environment())}; f() } [1] "f1" "xx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(2)); eval(parse(text='f1()'), envir=environment())}; f() } [1] "enclos" "envir" "expr" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(3)); eval(parse(text='f1()'), envir=environment())}; f() } [1] "f1" "xx" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(4)); eval(parse(text='f1()'), envir=environment())}; f() } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(5)); eval(parse(text='f1()'), envir=environment())}; f() } Error in as.environment(pos) : no item called "sys.frame(5)" on the search list In addition: Warning message: In ls(sys.frame(5)) : ‘sys.frame(5)’ converted to character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameViaEval# #{ f <- function() { xx <- 'xv'; f1 <- function() ls(sys.frame(6)); eval(parse(text='f1()'), envir=environment())}; f() } Error in as.environment(pos) : no item called "sys.frame(6)" on the search list In addition: Warning message: In ls(sys.frame(6)) : ‘sys.frame(6)’ converted to character string ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframe.sysFrameWithPromises# #{ top <- function(vtop) vtop;foo <- function(vfoo) top(vfoo);boo <- function(vboo) foo(sys.frame(vboo));bar <- function(vbar) do.call(boo, list(vbar), envir = parent.frame(2));baz <- function(vbaz) bar(vbaz);start <- function(vstart) baz(vstart);res <- lapply(0:7, function(i) start(i));lapply(res, function(env) sort(tolower(ls(env)))); } [[1]] [1] "bar" "baz" "boo" "foo" "res" "start" "top" [[2]] [1] "fun" "i" "x" [[3]] [1] "i" [[4]] [1] "vstart" [[5]] [1] "vbaz" [[6]] [1] "vbar" [[7]] [1] "args" "envir" "quote" "what" [[8]] [1] "vboo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframes.frameAccessCommonTest#Ignored.ImplementationError# #{ foo <- function(x) lapply(sys.frames(), function(x) ls(x));bar <- function(ba) do.call(foo, list(ba));boo <- function(bo) bar(bo);callboo <- function(cb) do.call("boo", list(cb));fun <- function(f) callboo(f);fun(42);} [[1]] [1] "f" [[2]] [1] "cb" [[3]] [1] "args" "envir" "quote" "what" [[4]] [1] "bo" [[5]] [1] "ba" [[6]] [1] "args" "envir" "quote" "what" [[7]] [1] "x" ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysframes.frameAccessCommonTest# #{ foo <- function(x) list(a = ls(sys.frames()[[1]]), b=ls(sys.frames()[[2]]), len=length(sys.frames()));bar <- function(ba) do.call(foo, list(ba));boo <- function(bo) bar(bo);callboo <- function(cb) do.call("boo", list(cb));fun <- function(f) callboo(f);fun(42);} $a [1] "f" $b [1] "cb" $len [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysfunction.testSysFunction# #foo <- function() sys.function(2); eval(quote(foo()))(42, new.env(), new.env()); [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysnframe.testSysNFrame# #{ f <- function() sys.nframe() ; f() } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysnframe.testSysNFrame# #{ f <- function() sys.nframe() ; g <- function() f() ; g() } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysnframe.testSysNFrame# #{ f <- function() sys.nframe() ; g <- function() f() ; h <- function() g() ; h() } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysnframe.testSysNFrame# #{ f <- function(x) x ; g <- function(y) f(y) ; h <- function(z=sys.nframe()) g(z) ; h() } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysnframe.testSysNFrame# #{ f <- function(x=sys.nframe()) x ; g <- function() f() ; h <- function() g() ; h() } [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysnframe.testSysNFrame# #{ sys.nframe() } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysnframe.testSysNFrame#Ignored.ImplementationError# #{ u <- function() sys.nframe() ; f <- function(x) x ; g <- function(y) f(y) ; h <- function(z=u()) g(z) ; h() } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysonexit.testsysonexit1#Ignored.Unimplemented# # .Internal(sys.on.exit()) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.frameAccessCommonTest# #{ foo <- function(x) sapply(1:7, function(i) sys.parent(i)); bar <- function(ba) do.call(foo, list(ba));boo <- function(bo) bar(bo);callboo <- function(cb) do.call("boo", list(cb));fun <- function(f) callboo(f);fun(42);} [1] 9 8 7 5 4 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParent# #{ f <- function() sys.parent() ; f() } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParent# #{ f <- function() sys.parent() ; g <- function() f() ; g() } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParent# #{ f <- function() sys.parent() ; g <- function() f() ; h <- function() g() ; h() } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParent#Ignored.ImplementationError# #{ f <- function(x) sys.parent(x); f(-4) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParent# #{ f <- function(x) sys.parent(x); f(0) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParent# #{ f <- function(x) sys.parent(x); f(4) } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParent# #{ sys.parent() } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParentPromises# #{ f <- function(x) x ; g <- function(y) f(y) ; h <- function(z=sys.parent()) g(z) ; h() } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParentPromises# #{ f <- function(x) x; g <- function() f(sys.parent()); h <- function() g(); h() } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParentPromises# #{ f <- function(x) { print(sys.parent()); x }; g <- function(x) f(x); m <- function() g(g(sys.parent())); callm <- function() m(); callm() } [1] 3 [1] 5 [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParentPromises# #{ f <- function(x=sys.parent()) x ; g <- function() f() ; h <- function() g() ; h() } [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParentPromises# #{ u <- function() sys.parent() ; f <- function(x) x ; g <- function(y) f(y) ; h <- function(z=u()) g(z) ; h() } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testSysParentPromises#Ignored.ImplementationError# #{ v <- function() sys.parent() ; u<- function() v(); f <- function(x) x ; g <- function(y) f(y) ; h <- function(z=u()) g(z) ; h() } [1] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparent.testsysparent1# #argv <- list(2); .Internal(sys.parent(argv[[1]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.frameAccessCommonTest# #{ foo <- function(x) sys.parents();bar <- function(ba) do.call(foo, list(ba));boo <- function(bo) bar(bo);callboo <- function(cb) do.call("boo", list(cb));fun <- function(f) callboo(f);fun(42);} [1] 0 1 2 2 4 5 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.testSysParents# #{ f <- function() sys.parents() ; f() } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.testSysParents# #{ f <- function() sys.parents() ; g <- function() f() ; g() } [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.testSysParents# #{ f <- function() sys.parents() ; g <- function() f() ; h <- function() g() ; h() } [1] 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.testSysParents# #{ f <- function(x) x ; g <- function(y) f(y) ; h <- function(z=sys.parents()) g(z) ; h() } [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.testSysParents# #{ f <- function(x=sys.parents()) x ; g <- function() f() ; h <- function() g() ; h() } [1] 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.testSysParents# #{ f4 <- function() sys.parents(); f3 <- function(y) y; f2 <- function(x) x; f1 <- function() f2(f3(f4())); f1(); } [1] 0 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.testSysParents# #{ sys.parents() } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.testSysParents#Ignored.ImplementationError# #{ u <- function() sys.parents() ; f <- function(x) x ; g <- function(y) f(y) ; h <- function(z=u()) g(z) ; h() } [1] 0 1 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.testSysParents#Ignored.ImplementationError# #{ u <- function() sys.parents(); g <- function(y) y; h <- function(z) g(z); h(u()); } [1] 0 1 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_sysparents.testSysParents#Ignored.ImplementationError# #{ u <- function() sys.parents(); g <- function(y) y; h <- function(z=u()) g(z); h(); } [1] 0 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_system.testSystem# #{ t <- Sys.time(); system(command='sleep 1', timeout=2); delay <- Sys.time() - t; print(delay < 2); } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_system.testSystem# #{ t <- Sys.time(); system(command='sleep 2', timeout=1); delay <- Sys.time() - t; print(delay < 2); } [1] TRUE Warning message: In system(command = "sleep 2", timeout = 1) : command 'sleep 2' timed out after 1s ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #t(1) [,1] [1,] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #t(TRUE) [,1] [1,] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #t(as.raw(c(1,2,3,4))) [,1] [,2] [,3] [,4] [1,] 01 02 03 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #t(matrix(1:6, 3, 2, dimnames=list(x=c("x1","x2","x3"),y=c("y1","y2")))) x y x1 x2 x3 y1 1 2 3 y2 4 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #t(new.env()) Error in t.default(new.env()) : argument is not a matrix ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #v <- as.complex(1:50); dim(v) <- c(5,10); dimnames(v) <- list(as.character(40:44), as.character(10:19)); t(v) 40 41 42 43 44 10 1+0i 2+0i 3+0i 4+0i 5+0i 11 6+0i 7+0i 8+0i 9+0i 10+0i 12 11+0i 12+0i 13+0i 14+0i 15+0i 13 16+0i 17+0i 18+0i 19+0i 20+0i 14 21+0i 22+0i 23+0i 24+0i 25+0i 15 26+0i 27+0i 28+0i 29+0i 30+0i 16 31+0i 32+0i 33+0i 34+0i 35+0i 17 36+0i 37+0i 38+0i 39+0i 40+0i 18 41+0i 42+0i 43+0i 44+0i 45+0i 19 46+0i 47+0i 48+0i 49+0i 50+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ m <- double() ; dim(m) <- c(0,4) ; t(m) } [1,] [2,] [3,] [4,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ m <- matrix(-5000:4999, nrow=100) ; sum(m * t(m)) } [1] 1666502500 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ m <- matrix(1:49, nrow=7) ; sum(m * t(m)) } [1] 33369 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ m <- matrix(1:81, nrow=9) ; sum(m * t(m)) } [1] 145881 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ m <- matrix(c(rep(1:10,100200),100L), nrow=1001) ; sum(m * t(m)) } [1] 38587000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ t(1:3) } [,1] [,2] [,3] [1,] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ t(matrix(1:4, nrow=2)) } [,1] [,2] [1,] 1 2 [2,] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ t(matrix(1:6, nrow=2)) } [,1] [,2] [1,] 1 2 [2,] 3 4 [3,] 5 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ t(t(matrix(1:4, nrow=2))) } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ t(t(matrix(1:6, nrow=2))) } [,1] [,2] [,3] [1,] 1 3 5 [2,] 2 4 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ t(t(t(1:3))) } [,1] [,2] [,3] [1,] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ x <- 1:3; names(x) <- c('a', 'b'); t(x) } a b [1,] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ x <- c(1,2); y <- t(x); list(x=x,y=y) } $x [1] 1 2 $y [,1] [,2] [1,] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTranspose# #{ x<-matrix(1:2, ncol=2, dimnames=list("a", c("b", "c"))); t(x) } a b 1 c 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeNonSquare# #{ m <- matrix(1:8, 2, 4) ; t(m) } [,1] [,2] [1,] 1 2 [2,] 3 4 [3,] 5 6 [4,] 7 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeNonSquare# #{ m <- matrix(as.raw(c(1:8)), 2, 4); t(m) } [,1] [,2] [1,] 01 02 [2,] 03 04 [3,] 05 06 [4,] 07 08 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeNonSquare# #{ m <- matrix(c('1', '2', '3', '4', '5', '6', '7', '8'), 2, 4); t(m) } [,1] [,2] [1,] "1" "2" [2,] "3" "4" [3,] "5" "6" [4,] "7" "8" ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeNonSquare# #{ m <- matrix(c(T, F, F, F, T, F, F, T), 2, 4); t(m) } [,1] [,2] [1,] TRUE FALSE [2,] FALSE FALSE [3,] TRUE FALSE [4,] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeNonSquare# #{ m <- matrix(list(a=1,b=2,c=3,d=4,e=5,f=6,g=7,h=8), 2, 4); t(m) } [,1] [,2] [1,] 1 2 [2,] 3 4 [3,] 5 6 [4,] 7 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeNonSquare# #{ m <- matrix(seq(0.1,0.8,0.1), 2, 4) ; t(m) } [,1] [,2] [1,] 0.1 0.2 [2,] 0.3 0.4 [3,] 0.5 0.6 [4,] 0.7 0.8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeSquare# #{ m <- matrix(1:64, 8, 8) ; sum(m * t(m)) } [1] 72976 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeSquare# #{ m <- matrix(as.raw(c(1,2,3,4)), 2, 2); t(m) } [,1] [,2] [1,] 01 02 [2,] 03 04 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeSquare# #{ m <- matrix(c('1', '2', '3', '4'), 2, 2); t(m) } [,1] [,2] [1,] "1" "2" [2,] "3" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeSquare# #{ m <- matrix(c(T, T, F, F), 2, 2); t(m) } [,1] [,2] [1,] TRUE TRUE [2,] FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeSquare# #{ m <- matrix(list(a=1,b=2,c=3,d=4), 2, 2); t(m) } [,1] [,2] [1,] 1 2 [2,] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testTransposeSquare# #{ m <- matrix(seq(0.01,0.64,0.01), 8, 8) ; sum(m * t(m)) } [1] 7.2976 ##com.oracle.truffle.r.test.builtins.TestBuiltin_t.testt1# #argv <- structure(list(x = c(-2.13777446721376, 1.17045456767922, 5.85180137819007)), .Names = 'x');do.call('t', argv) [,1] [,2] [,3] [1,] -2.137774 1.170455 5.851801 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testTabulate# #{ .Internal(tabulate(c(2,3,5), 7)) } Error: invalid input ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testTabulate# #{ .Internal(tabulate(c(2L,3L,5L), -1)) } Error: invalid 'nbin' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testTabulate# #{ .Internal(tabulate(c(2L,3L,5L), NA)) } Error: invalid 'nbin' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testTabulate# #{ .Internal(tabulate(c(2L,3L,5L), c(7, 42))) } [1] 0 1 1 0 1 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testTabulate# #{ .Internal(tabulate(c(2L,3L,5L), integer())) } Error: invalid 'nbin' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testTabulate# #{tabulate(c(-2,0,2,3,3,5))} [1] 0 1 2 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testTabulate# #{tabulate(c(-2,0,2,3,3,5), nbins = 3)} [1] 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testTabulate# #{tabulate(c(2,3,3,5), nbins = 10)} [1] 0 1 2 0 1 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testTabulate# #{tabulate(c(2,3,5))} [1] 0 1 1 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testTabulate# #{tabulate(factor(letters[1:10]))} [1] 1 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testtabulate1# #argv <- list(1L, 1L); .Internal(tabulate(argv[[1]], argv[[2]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testtabulate2# #argv <- list(1:6, 6L); .Internal(tabulate(argv[[1]], argv[[2]])) [1] 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testtabulate3# #argv <- list(integer(0), 1L); .Internal(tabulate(argv[[1]], argv[[2]])) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testtabulate4# #argv <- list(c(1L, 9L, 13L, 25L, 11L, 24L, 3L, 20L, 20L, 15L, 20L, 14L, 24L, 19L, 12L, 8L, 1L, 11L, 4L, 3L, 21L, 25L, 10L, 3L, 12L), 25L); .Internal(tabulate(argv[[1]], argv[[2]])) [1] 2 0 3 1 0 0 0 1 1 1 2 2 1 1 1 0 0 0 1 3 1 0 0 2 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testtabulate5# #argv <- list(structure(1:49, .Label = c('0', '1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48'), class = 'factor'), 49L); .Internal(tabulate(argv[[1]], argv[[2]])) [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 [39] 1 1 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testtabulate6# #argv <- list(integer(0), 0L); .Internal(tabulate(argv[[1]], argv[[2]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_tabulate.testtabulate8# #argv <- structure(list(bin = numeric(0)), .Names = 'bin');do.call('tabulate', argv) [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tan.testTrigExp# #{ tan() } Error in tan() : 0 arguments passed to 'tan' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tan.testTrigExp# #{ tan(1.2) } [1] 2.572152 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tan.testTrigExp# #{ tan(c(0.3,0.6,0.9)) } [1] 0.3093362 0.6841368 1.2601582 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tan.testtan1# #argv <- list(c(2.19881034888372+1i, 1.31241297643351+1i, -0.26514505669635+1i, 0.54319405923209+1i, -0.41433994791886+1i, -0.47624689461558+1i, -0.78860283785024+1i, -0.59461726745951+1i, 1.65090746733669+1i, -0.05402812508544+1i, 0.11924523642758+1i, 0.24368742959909+1i, 1.23247587848534+1i, -0.51606383094478+1i, -0.99250715039204+1i, 1.67569693240319+1i, -0.44116321690529+1i, -0.72306596993987+1i, -1.23627311888329+1i, -1.2847157223178+1i, -0.57397347929799+1i, 0.61798581716653+1i, 1.10984813892972+1i, 0.70758835383559+1i, -0.36365729709525+1i, 0.0597499373846+1i, -0.70459646368007+1i, -0.71721816157401+1i, 0.88465049897692+1i, -1.01559257860354+1i, 1.95529396549246+1i, -0.09031959396585+1i, 0.21453882662922+1i, -0.73852770473957+1i, -0.57438868976327+1i, -1.31701613230524+1i, -0.18292538837273+1i, 0.41898240492446+1i, 0.32430434416138+1i, -0.78153648705475+1i, -0.788621970854+1i, -0.50219871834286+1i, 1.49606066984635+1i, -1.13730362066574+1i, -0.1790515943802+1i, 1.90236182167893+1i, -0.10097488532881+1i, -1.35984070382139+1i, -0.66476943527406+1i, 0.48545997890488+1i, -0.37560287166977+1i, -0.56187636354978+1i, -0.34391723412846+1i, 0.09049664713922+1i, 1.59850877114583+1i, -0.08856511213888+1i, 1.08079949615152+1i, 0.63075411565057+1i, -0.11363989550614+1i, -1.5329020028906+1i, -0.52111731755252+1i, -0.48987045313847+1i, 0.04715443276153+1i, 1.30019867766682+1i, 2.29307897383109+1i, 1.54758105898377+1i, -0.13315096432894+1i, -1.75652739555764+1i, -0.38877986407174+1i, 0.08920722307329+1i, 0.84501300406744+1i, 0.96252796848427+1i, 0.68430942941646+1i, -1.39527434979947+1i, 0.84964304563336+1i, -0.44655721642722+1i, 0.17480270016126+1i, 0.07455117717373+1i, 0.42816676497051+1i, 0.02467498282614+1i, -1.66747509758566+1i, 0.73649596477344+1i, 0.38602656834968+1i, -0.26565162527822+1i, 0.11814451104668+1i, 0.13403864536846+1i, 0.221019468561+1i, 1.64084616597749+1i, -0.21905037893348+1i, 0.16806538388466+1i, 1.16838387306909+1i, 1.05418102337692+1i, 1.14526311038036+1i, -0.57746800105956+1i, 2.00248273029283+1i, 0.06670087093018+1i, 1.86685184470686+1i, -1.35090268603071+1i, 0.02098358635424+1i, 1.24991457096922+1i));tan(argv[[1]]); [1] -0.2754064+1.0504724i 0.1707951+1.2537653i -0.1093620+0.7842104i [4] 0.2093131+0.8578437i -0.1660731+0.8172203i -0.1876766+0.8353263i [7] -0.2662504+0.9656727i -0.2244696+0.8772046i -0.0574910+1.3069749i [10] -0.0226741+0.7625280i 0.0499032+0.7661478i 0.1008033+0.7806817i [13] 0.2099495+1.2160409i -0.2007847+0.8483508i -0.2724724+1.0795122i [16] -0.0748047+1.3026939i -0.1756020+0.8247453i -0.2553017+0.9331855i [19] -0.2082887+1.2179737i -0.1853353+1.2414535i -0.2185527+0.8692179i [22] 0.2308761+0.8865897i 0.2523046+1.1485092i 0.2522002+0.9258837i [25] -0.1474480+0.8043320i 0.0250713+0.7627364i -0.2515795+0.9244892i [28] -0.2541517+0.9304095i 0.2749971+1.0173544i -0.2700142+1.0931195i [31] -0.2284850+1.1916405i -0.0378553+0.7642052i 0.0890567+0.7763727i [34] -0.2582109+0.9406248i -0.2186740+0.8693757i -0.1682834+1.2557238i [37] -0.0761803+0.7723272i 0.1677396+0.8184877i 0.1324988+0.7955175i [40] -0.2652498+0.9620526i -0.2662530+0.9656825i -0.1962967+0.8436928i [43] 0.0536952+1.3077563i -0.2447400+1.1642958i -0.0745938+0.7718762i [46] -0.2069808+1.2194706i -0.0422997+0.7648582i -0.1436916+1.2726327i [49] -0.2426917+0.9064614i 0.1907686+0.8382440i -0.1519054+0.8072135i [52] -0.2149791+0.8646711i -0.1399980+0.7997807i 0.0379292+0.7642155i [55] -0.0200441+1.3123057i -0.0371228+0.7641047i 0.2591109+1.1315664i [58] 0.2342389+0.8918707i -0.0475729+0.7657293i -0.0273831+1.3116721i [61] -0.2023991+0.8500811i -0.1922366+0.8396611i 0.0197928+0.7623055i [64] 0.1773297+1.2484450i -0.2728167+0.9974042i 0.0167967+1.3125232i [67] -0.0556735+0.7672734i 0.1282428+1.2813959i -0.1567755+0.8105036i [70] 0.0373909+0.7641412i 0.2725317+0.9955018i 0.2746182+1.0619450i [73] 0.2471945+0.9151808i -0.1218052+1.2846714i 0.2729060+0.9980191i [76] -0.1774881+0.8263176i 0.0728517+0.7713928i 0.0312665+0.7633727i [79] 0.1710155+0.8210382i 0.0103613+0.7617889i 0.0690998+1.3042361i [82] 0.2578397+0.9396391i 0.1557621+0.8098065i -0.1095631+0.7842974i [85] 0.0494457+0.7660640i 0.0560413+0.7673495i 0.0916794+0.7772826i [88] -0.0503760+1.3083942i -0.0908832+0.7770032i 0.0700851+0.7706503i [91] 0.2348384+1.1817888i 0.2642825+1.1159058i 0.2423398+1.1688185i [94] -0.2195706+0.8705497i -0.2442035+1.1653245i 0.0279818+0.7630177i [97] -0.1903246+1.2368100i -0.1490005+1.2693076i 0.0088116+0.7617350i [100] 0.2021539+1.2248130i ##com.oracle.truffle.r.test.builtins.TestBuiltin_tan.testtan2# #argv <- list(c(0.01, 0.02, 0.03, 0.04, 0.05, 0.06, 0.07, 0.08, 0.09, 0.1, 0.11, 0.12, 0.13, 0.14, 0.15, 0.16, 0.17, 0.18, 0.19, 0.2, 0.21, 0.22, 0.23, 0.24, 0.25, 0.26, 0.27, 0.28, 0.29, 0.3, 0.31, 0.32, 0.33, 0.34, 0.35, 0.36, 0.37, 0.38, 0.39, 0.4, 0.41, 0.42, 0.43, 0.44, 0.45, 0.46, 0.47, 0.48, 0.49, 0.5, 0.51, 0.52, 0.53, 0.54, 0.55, 0.56, 0.57, 0.58, 0.59, 0.6, 0.61, 0.62, 0.63, 0.64, 0.65, 0.66, 0.67, 0.68, 0.69, 0.7, 0.71, 0.72, 0.73, 0.74, 0.75, 0.76, 0.77, 0.78, 0.79, 0.8, 0.81, 0.82, 0.83, 0.84, 0.85, 0.86, 0.87, 0.88, 0.89, 0.9, 0.91, 0.92, 0.93, 0.94, 0.95, 0.96, 0.97, 0.98, 0.99));tan(argv[[1]]); [1] 0.01000033 0.02000267 0.03000900 0.04002135 0.05004171 0.06007210 [7] 0.07011456 0.08017110 0.09024379 0.10033467 0.11044582 0.12057934 [13] 0.13073732 0.14092189 0.15113522 0.16137946 0.17165682 0.18196953 [19] 0.19231984 0.20271004 0.21314244 0.22361942 0.23414336 0.24471670 [25] 0.25534192 0.26602154 0.27675814 0.28755433 0.29841279 0.30933625 [31] 0.32032751 0.33138941 0.34252487 0.35373688 0.36502849 0.37640285 [37] 0.38786316 0.39941272 0.41105492 0.42279322 0.43463120 0.44657255 [43] 0.45862102 0.47078053 0.48305507 0.49544877 0.50796590 0.52061084 [49] 0.53338815 0.54630249 0.55935872 0.57256183 0.58591701 0.59942962 [55] 0.61310521 0.62694954 0.64096855 0.65516845 0.66955565 0.68413681 [61] 0.69891886 0.71390901 0.72911473 0.74454382 0.76020440 0.77610491 [67] 0.79225417 0.80866138 0.82533611 0.84228838 0.85952867 0.87706790 [73] 0.89491753 0.91308953 0.93159646 0.95045146 0.96966833 0.98926154 [79] 1.00924629 1.02963856 1.05045514 1.07171372 1.09343292 1.11563235 [85] 1.13833271 1.16155586 1.18532486 1.20966412 1.23459946 1.26015822 [91] 1.28636938 1.31326370 1.34087383 1.36923448 1.39838259 1.42835749 [97] 1.45920113 1.49095827 1.52367674 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tan.testtan3#Output.IgnoreWarningMessage# #argv <- list(Inf);tan(argv[[1]]); [1] NaN Warning message: In tan(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_tan.testtan4# #argv <- list(c(-6.28318530717959, -6.15752160103599, -6.0318578948924, -5.90619418874881, -5.78053048260522, -5.65486677646163, -5.52920307031804, -5.40353936417444, -5.27787565803085, -5.15221195188726, -5.02654824574367, -4.90088453960008, -4.77522083345649, -4.64955712731289, -4.5238934211693, -4.39822971502571, -4.27256600888212, -4.14690230273853, -4.02123859659494, -3.89557489045134, -3.76991118430775, -3.64424747816416, -3.51858377202057, -3.39292006587698, -3.26725635973338, -3.14159265358979, -3.0159289474462, -2.89026524130261, -2.76460153515902, -2.63893782901543, -2.51327412287183, -2.38761041672824, -2.26194671058465, -2.13628300444106, -2.01061929829747, -1.88495559215388, -1.75929188601028, -1.63362817986669, -1.5079644737231, -1.38230076757951, -1.25663706143592, -1.13097335529233, -1.00530964914873, -0.879645943005142, -0.75398223686155, -0.628318530717958, -0.502654824574367, -0.376991118430775, -0.251327412287183, -0.125663706143591, 8.88178419700125e-16, 0.125663706143592, 0.251327412287184, 0.376991118430776, 0.502654824574368, 0.62831853071796, 0.753982236861551, 0.879645943005142, 1.00530964914873, 1.13097335529233, 1.25663706143592, 1.38230076757951, 1.5079644737231, 1.63362817986669, 1.75929188601028, 1.88495559215388, 2.01061929829747, 2.13628300444106, 2.26194671058465, 2.38761041672824, 2.51327412287183, 2.63893782901543, 2.76460153515902, 2.89026524130261, 3.0159289474462, 3.14159265358979, 3.26725635973339, 3.39292006587698, 3.51858377202057, 3.64424747816416, 3.76991118430775, 3.89557489045134, 4.02123859659494, 4.14690230273853, 4.27256600888212, 4.39822971502571, 4.5238934211693, 4.64955712731289, 4.77522083345649, 4.90088453960008, 5.02654824574367, 5.15221195188726, 5.27787565803085, 5.40353936417445, 5.52920307031804, 5.65486677646163, 5.78053048260522, 5.90619418874881, 6.0318578948924, 6.157521601036, 6.28318530717959));tan(argv[[1]]); [1] -3.307784e-15 1.263294e-01 2.567564e-01 3.959280e-01 5.497547e-01 [6] 7.265425e-01 9.390625e-01 1.208792e+00 1.575748e+00 2.125108e+00 [11] 3.077684e+00 5.242184e+00 1.589454e+01 -1.589454e+01 -5.242184e+00 [16] -3.077684e+00 -2.125108e+00 -1.575748e+00 -1.208792e+00 -9.390625e-01 [21] -7.265425e-01 -5.497547e-01 -3.959280e-01 -2.567564e-01 -1.263294e-01 [26] 3.231089e-15 1.263294e-01 2.567564e-01 3.959280e-01 5.497547e-01 [31] 7.265425e-01 9.390625e-01 1.208792e+00 1.575748e+00 2.125108e+00 [36] 3.077684e+00 5.242184e+00 1.589454e+01 -1.589454e+01 -5.242184e+00 [41] -3.077684e+00 -2.125108e+00 -1.575748e+00 -1.208792e+00 -9.390625e-01 [46] -7.265425e-01 -5.497547e-01 -3.959280e-01 -2.567564e-01 -1.263294e-01 [51] 8.881784e-16 1.263294e-01 2.567564e-01 3.959280e-01 5.497547e-01 [56] 7.265425e-01 9.390625e-01 1.208792e+00 1.575748e+00 2.125108e+00 [61] 3.077684e+00 5.242184e+00 1.589454e+01 -1.589454e+01 -5.242184e+00 [66] -3.077684e+00 -2.125108e+00 -1.575748e+00 -1.208792e+00 -9.390625e-01 [71] -7.265425e-01 -5.497547e-01 -3.959280e-01 -2.567564e-01 -1.263294e-01 [76] -3.231089e-15 1.263294e-01 2.567564e-01 3.959280e-01 5.497547e-01 [81] 7.265425e-01 9.390625e-01 1.208792e+00 1.575748e+00 2.125108e+00 [86] 3.077684e+00 5.242184e+00 1.589454e+01 -1.589454e+01 -5.242184e+00 [91] -3.077684e+00 -2.125108e+00 -1.575748e+00 -1.208792e+00 -9.390625e-01 [96] -7.265425e-01 -5.497547e-01 -3.959280e-01 -2.567564e-01 -1.263294e-01 [101] 3.307784e-15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tan.testtan5#Ignored.ImplementationError# #argv <- list(1+1000i);tan(argv[[1]]); [1] 0+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanh.testtanh1# #argv <- list(c(0.57459950307683, 1.3311607364495));tanh(argv[[1]]); [1] 0.5187292 0.8695327 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanh.testtanh2# #argv <- list(FALSE);tanh(argv[[1]]); [1] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanh.testtanh3# #argv <- list(c(0.018063120710024, 0.202531388051386, 0.417573408622862, 1.63052300091743, 2.60085453772445, 2.75283670267494, 2.30083138197613, 1.47188976409943, 0.829803307993584, 0.295089115172324, 0.237719196109985, 0.617898787321681, 0.850777050382226, 0.516973890969527, 0.522699166681335, 0.850446724158497, 0.645479182912265, 0.193978409371909, 0.414456893353747, 0.492772947140595, 0.420563171733189, 0.369166401583374, 0.592867562934369, 1.21638206559229, 0.54564621330955, 0.672292186547141, 0.557193544541334, 0.112218530051911, -0.0391766542932368, 0.246991917518619, -0.0310729286667355, 0.100305401934259, 0.385595467685569, 0.347899688300561, 0.0900835492886662, -0.128526864819991));tanh(argv[[1]]); [1] 0.01806116 0.19980687 0.39488419 0.92613603 0.98904604 0.99190559 [7] 0.98012914 0.89993733 0.68037038 0.28681208 0.23334028 0.54966335 [13] 0.69147520 0.47536108 0.47978055 0.69130278 0.56861872 0.19158150 [19] 0.39225041 0.45641451 0.39740477 0.35326236 0.53195485 0.83858371 [25] 0.49725003 0.58648566 0.50589219 0.11174983 -0.03915662 0.24208894 [31] -0.03106293 0.09997035 0.36755692 0.33451157 0.08984066 -0.12782379 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanh.testtanh4# #argv <- list(c(-0.560475646552213-0.710406563699301i, -0.23017748948328+0.25688370915653i, 1.55870831414912-0.24669187846237i, 0.070508391424576-0.347542599397733i, 0.129287735160946-0.951618567265016i, 1.71506498688328-0.04502772480892i, 0.460916205989202-0.784904469457076i, -1.26506123460653-1.66794193658814i, -0.686852851893526-0.380226520287762i, -0.445661970099958+0.918996609060766i, 1.22408179743946-0.57534696260839i, 0.359813827057364+0.607964322225033i, 0.40077145059405-1.61788270828916i, 0.11068271594512-0.055561965524539i, -0.555841134754075+0.519407203943462i, 1.78691313680308+0.30115336216671i, 0.497850478229239+0.105676194148943i, -1.96661715662964-0.64070600830538i, 0.701355901563686-0.849704346033582i, -0.47279140772793-1.02412879060491i, -1.06782370598685+0.11764659710013i, -0.217974914658295-0.947474614184802i, -1.02600444830724-0.49055744370067i, -0.72889122929114-0.256092192198247i, -0.62503926784926+1.84386200523221i, -1.68669331074241-0.65194990169546i, 0.837787044494525+0.235386572284857i, 0.153373117836515+0.077960849563711i, -1.13813693701195-0.96185663413013i, 1.25381492106993-0.0713080861236i, 0.42646422147681+1.44455085842335i, -0.295071482992271+0.451504053079215i, 0.895125661045022+0.04123292199294i, 0.878133487533042-0.422496832339625i, 0.82158108163749-2.05324722154052i, 0.68864025410009+1.13133721341418i, 0.55391765353759-1.46064007092482i, -0.061911710576722+0.739947510877334i, -0.30596266373992+1.90910356921748i, -0.38047100101238-1.4438931609718i, -0.694706978920513+0.701784335374711i, -0.207917278019599-0.262197489402468i, -1.26539635156826-1.57214415914549i, 2.16895596533851-1.51466765378175i, 1.20796199830499-1.60153617357459i, -1.12310858320335-0.5309065221703i, -0.40288483529908-1.4617555849959i, -0.466655353623219+0.687916772975828i, 0.77996511833632+2.10010894052567i, -0.08336906647183-1.28703047603518i, 0.253318513994755+0.787738847475178i, -0.028546755348703+0.76904224100091i, -0.042870457291316+0.332202578950118i, 1.36860228401446-1.00837660827701i, -0.225770985659268-0.119452606630659i, 1.51647060442954-0.28039533517025i, -1.54875280423022+0.56298953322048i, 0.584613749636069-0.372438756103829i, 0.123854243844614+0.976973386685621i, 0.215941568743973-0.374580857767014i, 0.37963948275988+1.05271146557933i, -0.5023234531093-1.04917700666607i, -0.33320738366942-1.26015524475811i, -1.01857538310709+3.2410399349424i, -1.07179122647558-0.41685758816043i, 0.303528641404258+0.298227591540715i, 0.448209778629426+0.636569674033849i, 0.053004226730504-0.483780625708744i, 0.922267467879738+0.516862044313609i, 2.05008468562714+0.36896452738509i, -0.491031166056535-0.215380507641693i, -2.30916887564081+0.06529303352532i, 1.00573852446226-0.03406725373846i, -0.70920076258239+2.12845189901618i, -0.688008616467358-0.741336096272828i, 1.0255713696967-1.09599626707466i, -0.284773007051009+0.037788399171079i, -1.22071771225454+0.31048074944314i, 0.18130347974915+0.436523478910183i, -0.138891362439045-0.458365332711106i, 0.00576418589989-1.06332613397119i, 0.38528040112633+1.26318517608949i, -0.370660031792409-0.349650387953555i, 0.644376548518833-0.865512862653374i, -0.220486561818751-0.236279568941097i, 0.331781963915697-0.197175894348552i, 1.09683901314935+1.10992028971364i, 0.435181490833803+0.084737292197196i, -0.325931585531227+0.754053785184521i, 1.14880761845109-0.49929201717226i, 0.993503855962119+0.214445309581601i, 0.54839695950807-0.324685911490835i, 0.238731735111441+0.094583528173571i, -0.627906076039371-0.895363357977542i, 1.36065244853001-1.31080153332797i, -0.60025958714713+1.99721338474797i, 2.18733299301658+0.60070882367242i, 1.53261062618519-1.25127136162494i, -0.235700359100477-0.611165916680421i, -1.02642090030678-1.18548008459731i));tanh(argv[[1]]); [1] -0.7425158-0.5355457i -0.2409547+0.2483702i 0.9241602-0.0388304i [4] 0.0795770-0.3602170i 0.3696862-1.3364822i 0.9374969-0.0054663i [7] 0.7262706-0.6864223i -1.1689483+0.0361817i -0.6540480-0.2438883i [10] -0.8740881+0.8313312i 0.9207159-0.1464479i 0.4842275+0.5796214i [13] 2.5934516+0.2739606i 0.1105698-0.0549413i -0.6184095+0.3932521i [16] 0.9543474+0.0303543i 0.4644974+0.0833863i -0.9881948-0.0371033i [19] 0.9419714-0.4890693i -1.0695525-0.8691667i -0.7927689+0.0442974i [22] -0.5782396-1.2183528i -0.8482805-0.1841978i -0.6478522-0.1562632i [25] -1.5493740-0.5023022i -0.9799581-0.0648708i 0.7050075+0.1240718i [28] 0.1530888+0.0762992i -1.0530983-0.2050695i 0.8505528-0.0198275i [31] 2.2968217+0.5975852i -0.3475117+0.4365828i 0.7145115+0.0202114i [34] 0.7705579-0.2051771i 1.1780131+0.3890291i 1.2623594+0.5237715i [37] 1.9180186-0.3107690i -0.1130136+0.9066133i -1.5741787-1.5144869i [40] -2.4912001-0.7477482i -0.8190619+0.4292196i -0.2190725-0.2563248i [43] -1.1729578+0.0005066i 1.0263001-0.0030043i 1.1955899+0.0132228i [46] -0.8873771-0.1658215i -2.4458589-0.5907083i -0.6467833+0.5903525i [49] 1.1403637-0.4370981i -0.9813076-3.1490567i 0.4692629+0.8877523i [52] -0.0552282+0.9662863i -0.0479329+0.3442792i 1.0500579-0.1232018i [55] -0.2250500-0.1140272i 0.9204438-0.0472760i -0.9587429+0.0783299i [58] 0.5817268-0.2711281i 0.3809015+1.4117228i 0.2438094-0.3727600i [61] 1.0523631+1.0852739i -1.1313236-0.8267259i -1.7179811-1.3949940i [64] -0.7723935+0.0404901i -0.8419919-0.1482137i 0.3197488+0.2784453i [67] 0.5929015+0.5549577i 0.0675217-0.5235469i 0.8215623+0.2289243i [70] 0.9755385+0.0217556i -0.4721344-0.1717731i -0.9806161+0.0025207i [73] 0.7643628-0.0141785i -1.1132595-0.5142254i -0.8447513-0.4540504i [76] 1.1345191-0.2412521i -0.2776827+0.0348951i -0.8636156+0.0881328i [79] 0.2168603+0.4483956i -0.1708115-0.4817833i 0.0244046-1.7981721i [82] 1.7146144+1.1654205i -0.3951069-0.3135500i 0.9352432-0.5507671i [85] -0.2289361-0.2288164i 0.3315407-0.1785692i 1.1252528+0.2024350i [88] 0.4120990+0.0706016i -0.5449420+0.7780491i 0.8846782-0.1510171i [91] 0.7737138+0.0899197i 0.5406186-0.2457366i 0.2362893+0.0896146i [94] -0.9602986-0.5810371i 1.1185541-0.0734458i -1.3093074-0.6528741i [97] 0.9906765+0.0232708i 1.0760563-0.0600018i -0.3362039-0.6461392i [100] -1.1817248-0.2148827i ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testTrigExp#Output.IgnoreErrorContext# #{ tannpi(c(0.3,0.6,0.9)) } Error in tannpi(c(0.3, 0.6, 0.9)) : could not find function "tannpi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testTrigExp# #{ tanpi() } Error in tanpi() : 0 arguments passed to 'tanpi' which requires 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testTrigExp# #{ tanpi(1.2) } [1] 0.7265425 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testTrigExp#Output.IgnoreWarningMessage# #{ tanpi(c(0,0.5,-0.5)) } [1] 0 NaN NaN Warning message: In tanpi(c(0, 0.5, -0.5)) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testtan1# #argv <- list(c(-6.28318530717959, -6.1261056745001, -5.96902604182061, -5.81194640914112, -5.65486677646163, -5.49778714378214, -5.34070751110265, -5.18362787842316, -5.02654824574367, -4.86946861306418, -4.71238898038469, -4.5553093477052, -4.39822971502571, -4.24115008234622, -4.08407044966673, -3.92699081698724, -3.76991118430775, -3.61283155162826, -3.45575191894877, -3.29867228626928, -3.14159265358979, -2.9845130209103, -2.82743338823081, -2.67035375555132, -2.51327412287183, -2.35619449019234, -2.19911485751286, -2.04203522483337, -1.88495559215388, -1.72787595947439, -1.5707963267949, -1.41371669411541, -1.25663706143592, -1.09955742875643, -0.942477796076938, -0.785398163397448, -0.628318530717959, -0.471238898038469, -0.314159265358979, -0.15707963267949, 0, 0.15707963267949, 0.314159265358979, 0.471238898038469, 0.628318530717959, 0.785398163397448, 0.942477796076938, 1.09955742875643, 1.25663706143592, 1.41371669411541, 1.5707963267949, 1.72787595947439, 1.88495559215388, 2.04203522483337, 2.19911485751286, 2.35619449019234, 2.51327412287183, 2.67035375555133, 2.82743338823081, 2.9845130209103, 3.14159265358979, 3.29867228626928, 3.45575191894877, 3.61283155162826, 3.76991118430775, 3.92699081698724, 4.08407044966673, 4.24115008234622, 4.39822971502571, 4.5553093477052, 4.71238898038469, 4.86946861306418, 5.02654824574367, 5.18362787842316, 5.34070751110265, 5.49778714378214, 5.65486677646163, 5.81194640914112, 5.96902604182061, 6.1261056745001, 6.28318530717959, 6.44026493985908, 6.59734457253857, 6.75442420521805, 6.91150383789754, 7.06858347057704, 7.22566310325652, 7.38274273593601, 7.5398223686155, 7.69690200129499, 7.85398163397448, 8.01106126665397, 8.16814089933346, 8.32522053201295, 8.48230016469244, 8.63937979737193, 8.79645943005142, 8.95353906273091, 9.1106186954104, 9.26769832808989, 9.42477796076938));tanpi(argv[[1]]); [1] -1.23372362 -0.41828899 0.09761585 0.67069719 1.89058433 [6] -143.84339830 -1.82860922 -0.65072397 -0.08359770 0.43472209 [11] 1.26940435 5.69704626 -3.02042213 -0.94588494 -0.27043272 [16] 0.23347377 0.88211461 2.70194838 -7.14735944 -1.36437772 [21] -0.47669015 0.04869221 0.60233412 1.68662679 23.96582804 [26] -2.06079236 -0.72230246 -0.13283061 0.37802795 1.14965203 [31] 4.42175222 -3.59832344 -1.04259623 -0.32338322 0.18270451 [36] 0.79909940 2.34476934 -11.03723953 -1.51362708 -0.53786683 [41] 0.00000000 0.53786683 1.51362708 11.03723953 -2.34476934 [46] -0.79909940 -0.18270451 0.32338322 1.04259623 3.59832344 [51] -4.42175222 -1.14965203 -0.37802795 0.13283061 0.72230246 [56] 2.06079236 -23.96582804 -1.68662679 -0.60233412 -0.04869221 [61] 0.47669015 1.36437772 7.14735944 -2.70194838 -0.88211461 [66] -0.23347377 0.27043272 0.94588494 3.02042213 -5.69704626 [71] -1.26940435 -0.43472209 0.08359770 0.65072397 1.82860922 [76] 143.84339830 -1.89058433 -0.67069719 -0.09761585 0.41828899 [81] 1.23372362 5.26599273 -3.16734917 -0.97258123 -0.28541062 [86] 0.21885859 0.85768991 2.59071136 -7.95149796 -1.40493577 [91] -0.49386830 0.03476399 0.58354212 1.63439232 17.96523768 [96] -2.13590055 -0.74367617 -0.14700680 0.36221932 1.11787747 [101] 4.15253688 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testtan2# #argv <- list(c(0.0156298141969641, 0.0312596283939283, 0.0468894425908924, 0.0625192567878566, 0.0781490709848207, 0.0937788851817849, 0.109408699378749, 0.125038513575713, 0.140668327772677, 0.156298141969641, 0.171927956166606, 0.18755777036357, 0.203187584560534, 0.218817398757498, 0.234447212954462, 0.250077027151426, 0.26570684134839, 0.281336655545355, 0.296966469742319, 0.312596283939283, 0.328226098136247, 0.343855912333211, 0.359485726530175, 0.375115540727139, 0.390745354924104, 0.406375169121068, 0.422004983318032, 0.437634797514996, 0.45326461171196, 0.468894425908924, 0.484524240105888, 0.500154054302853, 0.515783868499817, 0.531413682696781, 0.547043496893745, 0.562673311090709, 0.578303125287673, 0.593932939484637, 0.609562753681602, 0.625192567878566, 0.64082238207553, 0.656452196272494, 0.672082010469458, 0.687711824666422, 0.703341638863387, 0.718971453060351, 0.734601267257315, 0.750231081454279, 0.765860895651243, 0.781490709848207, 0.797120524045171, 0.812750338242136, 0.8283801524391, 0.844009966636064, 0.859639780833028, 0.875269595029992, 0.890899409226956, 0.90652922342392, 0.922159037620885, 0.937788851817849, 0.953418666014813, 0.969048480211777, 0.984678294408741, 1.00030810860571, 1.01593792280267, 1.03156773699963, 1.0471975511966, 1.06282736539356, 1.07845717959053, 1.09408699378749, 1.10971680798445, 1.12534662218142, 1.14097643637838, 1.15660625057535, 1.17223606477231, 1.18786587896927, 1.20349569316624, 1.2191255073632, 1.23475532156017, 1.25038513575713, 1.2660149499541, 1.28164476415106, 1.29727457834802, 1.31290439254499, 1.32853420674195, 1.34416402093892, 1.35979383513588, 1.37542364933284, 1.39105346352981, 1.40668327772677, 1.42231309192374, 1.4379429061207, 1.45357272031767, 1.46920253451463, 1.48483234871159, 1.50046216290856, 1.51609197710552, 1.53172179130249, 1.54735160549945, 1.56298141969641));tanpi(argv[[1]]); [1] 4.914201e-02 9.852195e-02 1.483824e-01 1.989753e-01 2.505673e-01 [6] 3.034458e-01 3.579251e-01 4.143553e-01 4.731314e-01 5.347056e-01 [11] 5.996031e-01 6.684412e-01 7.419554e-01 8.210332e-01 9.067605e-01 [16] 1.000484e+00 1.103900e+00 1.219180e+00 1.349154e+00 1.497586e+00 [21] 1.669602e+00 1.872367e+00 2.116227e+00 2.416694e+00 2.798148e+00 [26] 3.301231e+00 3.999152e+00 5.038490e+00 6.761885e+00 1.020062e+01 [31] 2.055208e+01 -2.066219e+03 -2.015025e+01 -1.009992e+01 -6.716953e+00 [36] -5.013073e+00 -3.982767e+00 -3.289751e+00 -2.789624e+00 -2.410089e+00 [41] -2.110935e+00 -1.868013e+00 -1.665941e+00 -1.494452e+00 -1.346428e+00 [46] -1.216776e+00 -1.101755e+00 -9.985491e-01 -9.049982e-01 -8.194140e-01 [51] -7.404556e-01 -6.670416e-01 -5.982879e-01 -5.334615e-01 -4.719473e-01 [56] -4.132216e-01 -3.568336e-01 -3.023890e-01 -2.495389e-01 -1.979692e-01 [61] -1.473932e-01 -9.754469e-02 -4.817177e-02 9.679520e-04 5.011235e-02 [66] 9.949939e-02 1.493718e-01 1.999817e-01 2.515963e-01 3.045032e-01 [71] 3.590175e-01 4.154899e-01 4.743165e-01 5.359509e-01 6.009198e-01 [76] 6.698425e-01 7.434572e-01 8.226549e-01 9.085258e-01 1.002423e+00 [81] 1.106050e+00 1.221590e+00 1.351887e+00 1.500730e+00 1.673274e+00 [86] 1.876736e+00 2.121540e+00 2.423331e+00 2.806718e+00 3.312785e+00 [91] 4.015664e+00 5.064156e+00 6.807408e+00 1.030332e+01 2.097022e+01 [96] -6.887391e+02 -1.976380e+01 -1.000118e+01 -6.672602e+00 -4.987902e+00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testtan3# #argv <- list(c(0.560475646552213, 0.23017748948328, -1.55870831414912, -0.070508391424576, -0.129287735160946, -1.71506498688328, -0.460916205989202, 1.26506123460653, 0.686852851893526, 0.445661970099958, -1.22408179743946, -0.359813827057364, -0.400771450594052, -0.11068271594512, 0.555841134754075, -1.78691313680308, -0.497850478229239, 1.96661715662964, -0.701355901563686, 0.472791407727934, 1.06782370598685, 0.217974914658295, 1.02600444830724, 0.72889122929114, 0.625039267849257, 1.68669331074241, -0.837787044494525, -0.153373117836515, 1.13813693701195, -1.25381492106993, -0.426464221476814, 0.295071482992271, -0.895125661045022, -0.878133487533042, -0.821581081637487, -0.688640254100091, -0.553917653537589, 0.0619117105767217, 0.305962663739917, 0.380471001012383, 0.694706978920513, 0.207917278019599, 1.26539635156826, -2.16895596533851, -1.20796199830499, 1.12310858320335, 0.402884835299076, 0.466655353623219, -0.779965118336318, 0.0833690664718293, -0.253318513994755, 0.028546755348703, 0.0428704572913161, -1.36860228401446, 0.225770985659268, -1.51647060442954, 1.54875280423022, -0.584613749636069, -0.123854243844614, -0.215941568743973, -0.379639482759882, 0.502323453109302, 0.33320738366942, 1.01857538310709, 1.07179122647558, -0.303528641404258, -0.448209778629426, -0.0530042267305041, -0.922267467879738, -2.05008468562714, 0.491031166056535, 2.30916887564081, -1.00573852446226, 0.709200762582393, 0.688008616467358, -1.0255713696967, 0.284773007051009, 1.22071771225454, -0.18130347974915, 0.138891362439045, -0.00576418589988693, -0.38528040112633, 0.370660031792409, -0.644376548518833, 0.220486561818751, -0.331781963915697, -1.09683901314935, -0.435181490833803, 0.325931585531227, -1.14880761845109, -0.993503855962119, -0.54839695950807, -0.238731735111441, 0.627906076039371, -1.36065244853001, 0.600259587147127, -2.18733299301658, -1.53261062618519, 0.235700359100477));tanpi(argv[[1]]); [1] -5.19995629 0.88261007 5.36026862 -0.22520404 -0.43008453 [6] 1.24768192 -8.10332377 1.09941046 -1.50321269 5.80094429 [11] -0.84910412 -2.12188593 -3.10325442 -0.36244685 -5.64167908 [16] 0.79133028 -148.08179753 -0.10526150 1.36412435 11.67036710 [21] 0.21635869 0.81661190 0.08187762 -1.14227385 -2.41337143 [26] -1.50484770 0.55884290 -0.52294652 0.46343482 -1.02426179 [31] -4.25135777 1.33249807 0.34193553 0.40272690 0.62767356 [36] 1.48506184 5.84705944 0.19699178 1.43204268 2.53667164 [41] -1.42564396 0.76525240 1.10173848 -0.58697981 -0.76547519 [46] 0.40726902 3.17531826 9.51111273 0.82745654 0.26806951 [51] -1.02107128 0.08992349 0.13550180 -2.28330345 0.85827833 [56] 19.30868732 -6.47792416 3.67288925 -0.41000275 -0.80601923 [61] -2.51737783 -136.99619401 1.73046916 0.05842262 0.22944245 [66] -1.40896676 -6.09180820 -0.16807403 0.24917703 -0.15865717 [71] 35.48127295 1.46322247 -0.01803006 -1.29589795 -1.49144130 [76] -0.08050809 1.24638149 0.83107692 -0.64037853 0.46631712 [81] -0.01811070 -2.65349007 2.32407347 2.05141429 0.82984991 [86] -1.71271877 -0.31397572 -4.84272074 1.64262335 -0.50481592 [91] 0.02041107 6.52630426 -0.93159247 -2.35321481 -2.13646413 [96] -3.06916471 -0.66741999 9.72675161 0.91396005 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testtan4# #argv <- list(c(-1.88495559215388, 0.628318530717959, -2.51327412287183, 5.02654824574367, 0.942477796076938, -2.51327412287183, 1.5707963267949, 2.19911485751286, 1.88495559215388, -0.942477796076938, 4.71238898038469, 1.25663706143592, -1.88495559215388, -6.91150383789755, 3.45575191894877, 0, 0, 2.82743338823081, 2.51327412287183, 1.88495559215388, 2.82743338823081, 2.51327412287183, 0.314159265358979, -6.28318530717959, 1.88495559215388, -0.314159265358979, -0.628318530717959, -4.71238898038469, -1.5707963267949, 1.25663706143592));tanpi(argv[[1]]); [1] 0.3780280 -2.3447693 23.9658280 0.0835977 -0.1827045 23.9658280 [7] -4.4217522 0.7223025 -0.3780280 0.1827045 -1.2694043 1.0425962 [13] 0.3780280 0.2854106 7.1473594 0.0000000 0.0000000 -0.6023341 [19] -23.9658280 -0.3780280 -0.6023341 -23.9658280 1.5136271 -1.2337236 [25] -0.3780280 -1.5136271 2.3447693 1.2694043 4.4217522 1.0425962 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testtan5# #argv <- list(structure(c(-0.416146836547142, -0.989992496600445, -0.653643620863612, 0.283662185463226, 0.960170286650366, -0.416146836547142, 0.283662185463226, -0.839071529076452, -0.275163338051597, 0.64691932232864, 0.283662185463226, -0.759687912858821, 0.914742357804531, -0.918282786212119, 0.776685982021631), .Dim = c(5L, 3L)));tanpi(argv[[1]]); [,1] [,2] [,3] [1,] -3.70781931 -3.7078193 1.2375091 [2,] 0.03144986 1.2375091 0.9409093 [3,] 1.90829055 0.5535592 -0.2744392 [4,] 1.23750909 -1.1720669 0.2625148 [5,] -0.12578591 -2.0104785 -0.8449615 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testtan6# #argv <- list(c(-0.560475646552213-0.710406563699301i, -0.23017748948328+0.25688370915653i, 1.55870831414912-0.24669187846237i, 0.070508391424576-0.347542599397733i, 0.129287735160946-0.951618567265016i, 1.71506498688328-0.04502772480892i, 0.460916205989202-0.784904469457076i, -1.26506123460653-1.66794193658814i, -0.686852851893526-0.380226520287762i, -0.445661970099958+0.918996609060766i, 1.22408179743946-0.57534696260839i, 0.359813827057364+0.607964322225033i, 0.40077145059405-1.61788270828916i, 0.11068271594512-0.055561965524539i, -0.555841134754075+0.519407203943462i, 1.78691313680308+0.30115336216671i, 0.497850478229239+0.105676194148943i, -1.96661715662964-0.64070600830538i, 0.701355901563686-0.849704346033582i, -0.47279140772793-1.02412879060491i, -1.06782370598685+0.11764659710013i, -0.217974914658295-0.947474614184802i, -1.02600444830724-0.49055744370067i, -0.72889122929114-0.256092192198247i, -0.62503926784926+1.84386200523221i, -1.68669331074241-0.65194990169546i, 0.837787044494525+0.235386572284857i, 0.153373117836515+0.077960849563711i, -1.13813693701195-0.96185663413013i, 1.25381492106993-0.0713080861236i, 0.42646422147681+1.44455085842335i, -0.295071482992271+0.451504053079215i, 0.895125661045022+0.04123292199294i, 0.878133487533042-0.422496832339625i, 0.82158108163749-2.05324722154052i, 0.68864025410009+1.13133721341418i, 0.55391765353759-1.46064007092482i, -0.061911710576722+0.739947510877334i, -0.30596266373992+1.90910356921748i, -0.38047100101238-1.4438931609718i, -0.694706978920513+0.701784335374711i, -0.207917278019599-0.262197489402468i, -1.26539635156826-1.57214415914549i, 2.16895596533851-1.51466765378175i, 1.20796199830499-1.60153617357459i, -1.12310858320335-0.5309065221703i, -0.40288483529908-1.4617555849959i, -0.466655353623219+0.687916772975828i, 0.77996511833632+2.10010894052567i, -0.08336906647183-1.28703047603518i, 0.253318513994755+0.787738847475178i, -0.028546755348703+0.76904224100091i, -0.042870457291316+0.332202578950118i, 1.36860228401446-1.00837660827701i, -0.225770985659268-0.119452606630659i, 1.51647060442954-0.28039533517025i, -1.54875280423022+0.56298953322048i, 0.584613749636069-0.372438756103829i, 0.123854243844614+0.976973386685621i, 0.215941568743973-0.374580857767014i, 0.37963948275988+1.05271146557933i, -0.5023234531093-1.04917700666607i, -0.33320738366942-1.26015524475811i, -1.01857538310709+3.2410399349424i, -1.07179122647558-0.41685758816043i, 0.303528641404258+0.298227591540715i, 0.448209778629426+0.636569674033849i, 0.053004226730504-0.483780625708744i, 0.922267467879738+0.516862044313609i, 2.05008468562714+0.36896452738509i, -0.491031166056535-0.215380507641693i, -2.30916887564081+0.06529303352532i, 1.00573852446226-0.03406725373846i, -0.70920076258239+2.12845189901618i, -0.688008616467358-0.741336096272828i, 1.0255713696967-1.09599626707466i, -0.284773007051009+0.037788399171079i, -1.22071771225454+0.31048074944314i, 0.18130347974915+0.436523478910183i, -0.138891362439045-0.458365332711106i, 0.00576418589989-1.06332613397119i, 0.38528040112633+1.26318517608949i, -0.370660031792409-0.349650387953555i, 0.644376548518833-0.865512862653374i, -0.220486561818751-0.236279568941097i, 0.331781963915697-0.197175894348552i, 1.09683901314935+1.10992028971364i, 0.435181490833803+0.084737292197196i, -0.325931585531227+0.754053785184521i, 1.14880761845109-0.49929201717226i, 0.993503855962119+0.214445309581601i, 0.54839695950807-0.324685911490835i, 0.238731735111441+0.094583528173571i, -0.627906076039371-0.895363357977542i, 1.36065244853001-1.31080153332797i, -0.60025958714713+1.99721338474797i, 2.18733299301658+0.60070882367242i, 1.53261062618519-1.25127136162494i, -0.235700359100477-0.611165916680421i, -1.02642090030678-1.18548008459731i));tanpi(argv[[1]]); Error in tanpi(argv[[1]]) : unimplemented complex function ##com.oracle.truffle.r.test.builtins.TestBuiltin_tanpi.testtan7#Output.IgnoreWarningMessage# #argv <- list(Inf);tanpi(argv[[1]]); [1] NaN Warning message: In tanpi(argv[[1]]) : NaNs produced ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testSingleVector# #apply(array(NA, dim=c(2,1)), 2 ,tcrossprod) [,1] [1,] NA [2,] NA [3,] NA [4,] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testSingleVector# #tcrossprod(c(1,2)) [,1] [,2] [1,] 1 2 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testSingleVector# #tcrossprod(matrix(1:4, nrow=2)) [,1] [,2] [1,] 10 14 [2,] 14 20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testTCrossprodDimnames# #{ tcrossprod(structure(1:9, .Dim=c(3L,3L), .Dimnames=list(c('a', 'b', 'c'), c('A', 'B', 'C'))), structure(1:9, .Dim=c(3L,3L), .Dimnames=list(c('d', 'e', 'f'), c('D', 'E', 'F')))) } d e f a 66 78 90 b 78 93 108 c 90 108 126 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testtcrossprod1# #argv <- list(structure(c(5, 2, 0, 2, 5, 2, 0, 2, 5), .Dim = c(3L, 3L)), structure(c(0, 1, 0, 0, 2, 0, 0, 2, 0, 1, 2, 0, 1, 0, 0), .Dim = c(5L, 3L), .Dimnames = list(c('a', 'b', 'c', 'd', 'e'), NULL))); .Internal(tcrossprod(argv[[1]], argv[[2]])) a b c d e [1,] 0 5 4 0 12 [2,] 4 2 12 0 9 [3,] 10 0 9 0 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testtcrossprod2# #argv <- list(structure(c(5, 2, 0, 2, 5, 2, 0, 2, 5), .Dim = c(3L, 3L), .Dimnames = list(c('A', 'B', 'C'), c('A', 'B', 'C'))), structure(c(0, 1, 0, 0, 2, 0, 0, 2, 0, 1, 2, 0, 1, 0, 0), .Dim = c(5L, 3L), .Dimnames = list(NULL, c('A', 'B', 'C')))); .Internal(tcrossprod(argv[[1]], argv[[2]])) [,1] [,2] [,3] [,4] [,5] A 0 5 4 0 12 B 4 2 12 0 9 C 10 0 9 0 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testtcrossprod3# #argv <- list(structure(c(-1.67712982705863, -1.48498667828929, -1.66855080519244, -1.58355627712096, -1.82359988031979, -1.9949008033236, -0.0318360538544526, -0.560218641212122, 0.066207937805176, 0.499775901814107, -0.00128363357081381, -0.00713986667014182, 0.296776079992064, -0.138150806520963, 0.253601178172029, -0.170225064799926, -0.240191246767341, -0.00408674943172847, -0.242382276284081, 0.0729153527553058, 0.269807081327349, 0.0299339639014576, -0.077267349576335, -0.0293027062153706, -0.0099926992270607, 0.0334924583850379, -0.0453336990810482, 0.0438958486872448, -0.112099180250145, 0.089015596249019), .Dim = c(6L, 5L)), structure(c(-0.399602067979347, -0.353820997034499, -0.397557983601584, -0.377306725388702, -0.434500818950138, -0.47531590790431, -0.0422023061126668, -0.742633452454394, 0.087766143100416, 0.662509734796894, -0.00170160212505116, -0.00946470439441127, 0.584095849615428, -0.271899651454647, 0.499121747385523, -0.335026171424641, -0.472729171281292, -0.00804328091925277, -0.637436340955898, 0.191758639997983, 0.70956029179181, 0.0787227379500612, -0.2032038701195, -0.0770626058818733, -0.062340518587102, 0.208946269374942, -0.282819110829524, 0.273848927982668, -0.699342677207614, 0.555333279468297), .Dim = c(6L, 5L))); .Internal(tcrossprod(argv[[1]], argv[[2]])) [,1] [,2] [,3] [,4] [,5] [,6] [1,] 1.0000000 0.4877861 0.6429309 0.4904554 0.6447151 0.8082101 [2,] 0.4877861 1.0000000 0.5145115 0.2503413 0.6732497 0.7252317 [3,] 0.6429309 0.5145115 1.0000000 0.5972812 0.5818673 0.7444550 [4,] 0.4904554 0.2503413 0.5972812 1.0000000 0.7308955 0.7713985 [5,] 0.6447151 0.6732497 0.5818673 0.7308955 1.0000000 0.8124321 [6,] 0.8082101 0.7252317 0.7444550 0.7713985 0.8124321 1.0000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testtcrossprod4# #argv <- list(c(2, 3), structure(c(0, 0, 1, 0), .Dim = c(2L, 2L), .Dimnames = list(NULL, NULL))); .Internal(tcrossprod(argv[[1]], argv[[2]])) [,1] [,2] [1,] 3 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testtcrossprod5# #argv <- list(structure(c(-0.106539372596213, -2.87400113021639, 0.341152775291742, 1.88577541025803, 0.842201032082677, -1.43117364207636, -0.69348461621825, -2.41970841038843, -3.02719090531729, -0.226641199170227, -0.332680183991575, -1.62371869115524, -1.66979618600051, -1.10431770731054, 1.88731633228519, 2.05877121721062, -0.223853590000374, 2.00359231906507, 2.73128102907396, 0.539089155601206, -0.199828039026098, -1.05787977326062, 0.306997029957149, 1.45711168105796, 1.49857746263809, -0.757919845814536, 0.268252398125501, -0.535834002202256, -0.271560453176356, -2.05847896960824, 0.980553291004929, 0.685818887220841, -0.522933983909647, -0.337189871316714, 0.191459457586776, 1.89272736696455, -0.453746315234956, 0.612338437255857, 1.37687299952389, -1.15071450872488, -0.20817483353688, -0.081142998844394, -0.253631714967276, -0.410462721238244, -0.68459626706876, -0.624834027577721, 0.00753430632431097, -0.0556623066116985, -0.563702942039652, 0.0408500401240061, -0.420302429975138, 0.033747665813787, 0.339840694442255, -0.250248532584852, -0.31434827109732, 0.378366203759376, -0.193977362697154, -0.518701418701189, 1.24086430187875, 0.0626244079886504, -0.168813902431602, -0.233723461170579, -0.0800002226605061, -0.0555238917407563, -0.947495254278566, -0.0485572234634504, -0.0296030565974314, -0.095544458696536, 0.0295824037592777, 0.194854132525369, 0.267233992325682, -0.087254491408015, 0.126110082843019, 0.159157280802928, -0.155595903815538, 0.170585777111235, -0.160659663851048, -0.059679874503493, 0.0114766797349517, -0.288711739670586, 0.192267902822735, -0.558695699349865, -0.0862396209998433, 0.00725278175306798, -0.128294571915242, -0.130284537275488, -0.0857140300930927, -0.0514859262258765, -0.0490801347386973, 0.0204665694600954, -0.14875269796722, 0.196176132315475, -0.0529883263026191, -0.132778199491125, -0.228017010951841, 0.0529472898389869), .Dim = c(12L, 8L)), structure(c(-0.0185462290552347, -0.500302207222603, 0.059387411050087, 0.328273218183171, 0.146609210012521, -0.249136760776327, -0.120720858638907, -0.421219548532773, -0.526969274886959, -0.0394533916498165, -0.057912513881884, -0.282654740999492, -0.321354169237256, -0.212527194864884, 0.363216168017541, 0.396212855019715, -0.0430808772043306, 0.385593613508892, 0.525638130815129, 0.103748319223306, -0.0384571326787796, -0.203590161804909, 0.0590819264933657, 0.28042279511599, 0.416779971858557, -0.210790446196582, 0.0746055707690415, -0.149024582263218, -0.0755255973444945, -0.572498138010465, 0.272708607475933, 0.190737938906932, -0.145436866983219, -0.0937782587701373, 0.0532481432121619, 0.52639978807016, -0.204031585044791, 0.275344124552216, 0.61912476435818, -0.517430328944052, -0.0936079034183924, -0.0364867638890611, -0.114048046419078, -0.184568682552654, -0.307835583002935, -0.280962892162748, 0.0033878764630103, -0.0250291148686315, -0.338839482109357, 0.0245547883601272, -0.252642033739931, 0.0202855808510911, 0.204276820851501, -0.150423346865756, -0.188953431740463, 0.227434343460447, -0.116598981866977, -0.311789254542753, 0.745878344887204, 0.0376432698639114, -0.159472254176866, -0.220789915226282, -0.0755732534972413, -0.0524513683353668, -0.895063746796005, -0.0458702143055051, -0.0279649134231136, -0.0902573187573718, 0.0279454034502495, 0.184071497085901, 0.252446075441722, -0.0824260930614398, 0.167922807083695, 0.211927046257706, -0.207184868571959, 0.227144744458931, -0.21392755544038, -0.0794671752416819, 0.0152818571968794, -0.384436237535829, 0.256015738204522, -0.743935362069355, -0.114833000769291, 0.00965749481472171, -0.300640883681616, -0.30530409690622, -0.200859174058623, -0.120650267011609, -0.115012621802916, 0.0479606224687302, -0.348581720171566, 0.459712089888966, -0.124170937293853, -0.311147655218321, -0.534326859224339, 0.124074773921503), .Dim = c(12L, 8L))); .Internal(tcrossprod(argv[[1]], argv[[2]])) [,1] [,2] [,3] [,4] [,5] [1,] 1.533400821 0.05668259 -0.62713351 -0.6435680166 0.009334747 [2,] 0.056682585 2.12704569 -0.24868002 -1.5199378761 -0.175379077 [3,] -0.627133509 -0.24868002 1.73991878 0.0780269322 -0.151545520 [4,] -0.643568017 -1.51993788 0.07802693 2.1585845582 0.361983350 [5,] 0.009334747 -0.17537908 -0.15154552 0.3619833504 1.130619405 [6,] -1.382334030 0.68744677 0.51407858 0.6542280620 -0.130321180 [7,] -0.246540357 -0.46338255 0.97614157 0.8553563286 -0.292716337 [8,] 0.020792285 0.74773854 -0.21881372 -0.5471106671 -0.189339807 [9,] 0.151315639 1.52433886 -0.69764271 -0.5961801299 -0.432767069 [10,] 0.421892805 0.10362591 -0.55096210 -0.2516157370 -0.049271401 [11,] -0.423226170 0.08571672 -0.15932548 -0.0009281681 -0.018202819 [12,] 0.340067508 0.09455373 0.51819910 -0.2078522040 -0.355314827 [,6] [,7] [,8] [,9] [,10] [1,] -1.38233403 -0.24654036 0.02079228 0.151315639 0.42189280 [2,] 0.68744677 -0.46338255 0.74773854 1.524338865 0.10362591 [3,] 0.51407858 0.97614157 -0.21881372 -0.697642708 -0.55096210 [4,] 0.65422806 0.85535633 -0.54711067 -0.596180130 -0.25161574 [5,] -0.13032118 -0.29271634 -0.18933981 -0.432767069 -0.04927140 [6,] 2.35616112 0.71442323 0.41287344 1.011490988 -0.02849164 [7,] 0.71442323 1.92796793 0.66769911 0.253110508 -0.41908763 [8,] 0.41287344 0.66769911 1.57758117 1.135930578 0.05490795 [9,] 1.01149099 0.25311051 1.13593058 1.968965855 0.34087959 [10,] -0.02849164 -0.41908763 0.05490795 0.340879593 1.08603167 [11,] -0.11162179 0.08911007 0.39353660 0.002360252 -0.27204214 [12,] -0.11862575 1.45670274 1.25007395 0.527018032 -0.45190674 [,11] [,12] [1,] -0.4232261699 0.34006751 [2,] 0.0857167245 0.09455373 [3,] -0.1593254823 0.51819910 [4,] -0.0009281681 -0.20785220 [5,] -0.0182028190 -0.35531483 [6,] -0.1116217884 -0.11862575 [7,] 0.0891100683 1.45670274 [8,] 0.3935366011 1.25007395 [9,] 0.0023602518 0.52701803 [10,] -0.2720421411 -0.45190674 [11,] 1.1723594597 0.27627736 [12,] 0.2762773554 1.88147248 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testtcrossprod6# #argv <- list(structure(c(-1.22589324018138, -0.740548974281808, -0.54768368397833, -0.441021701509591, -0.370068251595057, -0.319690799411412, -0.282987166340516, -0.254112864677485, -0.230083320312515, 0.203647970189376, -0.0305516337408725, -0.0825170335109532, -0.0984577177107505, -0.100129992839015, -0.0988979642888749, -0.0945771185256416, -0.0902309571831907, -0.0871241228998968, -0.00955870050771132, 0.0197754782700907, 0.0125304440435148, 0.00419858922572787, -0.00191073996840182, -0.0061756059258365, -0.00956682744689523, -0.0127366531032827, -0.0131079781713544, 0.000214464770644159, -0.000956552371122151, 5.72249143534175e-05, 0.00029865136977495, 0.00077852017665313, 0.00142425180877207, 0.000491677810053133, -0.000120006753650731, -0.00247588122373662, 4.2574997724815e-05, -0.000297064220851874, 0.000399761711902461, 5.67830351414009e-05, -0.00026523273781528, 0.000320119491527155, -0.00026454073650643, -0.000195756422133707, 0.000192249930248858, -4.94461924222768e-07, 2.80125995838013e-05, -0.000119138513940463, 0.000151917649712048, -7.31975645151543e-05, 4.92140187851149e-05, -1.13604576670922e-05, -3.74519303853871e-05, 9.55915555684852e-06), .Dim = c(9L, 6L)), structure(c(-0.709851441473678, -0.428813651666777, -0.317135326144804, -0.255372882626744, -0.214287405483635, -0.185116425598763, -0.163863247924954, -0.147143631578904, -0.133229363887123, 0.633337192677659, -0.0950143815681878, -0.256624734846691, -0.306199636924392, -0.311400346924765, -0.307568786499592, -0.294131125799441, -0.280614734641737, -0.270952601985731, -0.28505721606605, 0.58973945020027, 0.373679821042009, 0.125209295460755, -0.0569816174886273, -0.184167401344961, -0.285299575647986, -0.379829336915808, -0.390902901787376, 0.0675695685124445, -0.301372718615498, 0.0180293609967187, 0.0940935153626058, 0.245281648154537, 0.448726753036158, 0.154908693733931, -0.0378094944843564, -0.780054577138554, 0.056333641054865, -0.393064241503382, 0.528949712019966, 0.0751331835725979, -0.350946016360591, 0.423570111428232, -0.350030386168567, -0.259017559788085, 0.254377901167792, -0.00226968135332679, 0.128583560874789, -0.546870143699694, 0.697333080468545, -0.335991790571385, 0.225902410856869, -0.0521468239901137, -0.171912019667483, 0.0438784789244046), .Dim = c(9L, 6L))); .Internal(tcrossprod(argv[[1]], argv[[2]])) [,1] [,2] [,3] [,4] [,5] [,6] [1,] 1.0019216 0.50061170 0.33296771 0.24952915 0.19985993 0.16617177 [2,] 0.5006117 0.33253138 0.24989455 0.20085431 0.16693749 0.14229378 [3,] 0.3329677 0.24989455 0.19982577 0.16665152 0.14225731 0.12462530 [4,] 0.2495292 0.20085431 0.16665152 0.14343671 0.12492820 0.11134202 [5,] 0.1998599 0.16693749 0.14225731 0.12492820 0.11089899 0.09987493 [6,] 0.1661718 0.14229378 0.12462530 0.11134202 0.09987493 0.09152110 [7,] 0.1437251 0.12464735 0.11031627 0.10004734 0.09085432 0.08334245 [8,] 0.1268474 0.11013729 0.09889900 0.09087536 0.08332874 0.07699314 [9,] 0.1117261 0.09988245 0.09047939 0.08358132 0.07650338 0.07077552 [,7] [,8] [,9] [1,] 0.14372508 0.12684739 0.11172607 [2,] 0.12464735 0.11013729 0.09988245 [3,] 0.11031627 0.09889900 0.09047939 [4,] 0.10004734 0.09087536 0.08358132 [5,] 0.09085432 0.08332874 0.07650338 [6,] 0.08334245 0.07699314 0.07077552 [7,] 0.07708804 0.07186514 0.06661649 [8,] 0.07186514 0.06761066 0.06332457 [9,] 0.06661649 0.06332457 0.06136495 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testtcrossprod7# #argv <- list(0, 0); .Internal(tcrossprod(argv[[1]], argv[[2]])) [,1] [1,] 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tcrossprod.testtcrossprod8# #argv <- list(structure(c(1.1173625565162, 1.46907016195074, 1.1173625565162, -0.59596185089264, -1.32605913508878e-308, 0.595961850892641), .Dim = c(3L, 2L)), structure(c(0.517876924314756, 0.680886908762812, 0.517876924314755, -0.707106781186547, -1.57336481399136e-308, 0.707106781186548), .Dim = c(3L, 2L))); .Internal(tcrossprod(argv[[1]], argv[[2]])) [,1] [,2] [,3] [1,] 1.0000650 0.7607975 0.1572476 [2,] 0.7607975 1.0002706 0.7607975 [3,] 0.1572476 0.7607975 1.0000650 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault1# #argv <- list(structure(c('D:', 'E:', 'F:', 'G:'), .Dim = c(4L, 1L))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [,4] [1,] "D:" "E:" "F:" "G:" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault10# #argv <- list(structure(c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 74, 68, 56, 57, 60, 74, 53, 61, 57, 57, 67, 70, 63, 57, 67, 50, 58, 72, 60, 70, 53, 74, 73, 48, 61, 65, 74, 70, 68, 74, 63, 74, 63, 68, 58, 59, 62, 57, 48, 73, 69, 68, 68, 67, 63, 74, 40, 81, 73, 59, 55, 42, 44, 71, 61, 72, 63, 70, 66, 72, 69, 71, 64, 56, 63, 59, 66, 67, 55, 69, 44, 80, 76, 49, 68, 66, 80, 75, 72, 70, 66, 50, 64, 53, 47, 67, 56, 54, 56, 74, 76, 57, 71, 54, 82, 70, 60, 55, 69, 62, 63, 69, 63, 64, 46, 61, 65, 61, 56, 53, 56, 60, 39, 58, 64, 53, 72, 52, 50, 64, 71, 70, 64, 60, 73, 62, 69, 67, 69, 65, 65, 76, 67, 76, 77, 39, 66, 1, 0, 0, 1, 0, 1, 1, 2, 1, 1, 1, 1, 2, 1, 1, 1, 0, 0, 0, 3, 1, 2, 2, 2, 2, 2, 2, 1, 1, 0, 1, 0, 0, 0, 0, 1, 0, 2, 1, 1, 1, 2, 0, 1, 0, 2, 1, 0, 0, 0, 1, 1, 1, 1, 0, 2, 0, 1, 1, 2, 1, 1, 1, 1, 1, 2, 1, 1, 1, 0, 1, 1, 2, 2, 2, 2, 1, 0, 2, 0, 1, 1, 1, 1, 0, 0, 2, 1, 0, 1, 2, 1, 0, 1, 0, 1, 0, 2, 2, 2, 1, 2, 1, 1, 0, 1, 0, 1, 1, 1, 2, 0, 0, 0, 1, 0, 1, 2, 1, 1, 1, 0, 1, 1, 1, 2, 1, 1, 1, 1, 1, 2, 1, 1, 1, 0, 1), .Dim = c(137L, 3L), .Dimnames = list(c('1', '2', '3', '4', '5', '6', '9', '10', '11', '15', '16', '17', '18', '20', '21', '23', '24', '25', '27', '28', '29', '30', '32', '33', '35', '37', '39', '41', '45', '47', '48', '49', '52', '53', '54', '55', '56', '58', '62', '63', '65', '66', '69', '70', '71', '73', '74', '79', '80', '81', '82', '83', '85', '86', '88', '90', '91', '92', '93', '96', '97', '98', '99', '103', '104', '105', '106', '108', '109', '111', '112', '113', '116', '117', '118', '119', '120', '121', '124', '125', '126', '127', '128', '132', '133', '135', '138', '139', '140', '142', '143', '145', '147', '148', '149', '151', '152', '155', '156', '158', '159', '163', '164', '165', '168', '169', '170', '171', '173', '175', '177', '181', '182', '188', '189', '190', '191', '192', '193', '194', '195', '196', '198', '200', '202', '206', '209', '212', '213', '215', '216', '218', '221', '223', '224', '225', '227'), c('(Intercept)', 'age', 'ph.ecog')), assign = 0:2)); .Internal(t.default(argv[[1]])) 1 2 3 4 5 6 9 10 11 15 16 17 18 20 21 23 24 25 27 28 29 30 (Intercept) 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 age 74 68 56 57 60 74 53 61 57 57 67 70 63 57 67 50 58 72 60 70 53 74 ph.ecog 1 0 0 1 0 1 1 2 1 1 1 1 2 1 1 1 0 0 0 3 1 2 32 33 35 37 39 41 45 47 48 49 52 53 54 55 56 58 62 63 65 66 69 70 (Intercept) 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 age 73 48 61 65 74 70 68 74 63 74 63 68 58 59 62 57 48 73 69 68 68 67 ph.ecog 2 2 2 2 2 1 1 0 1 0 0 0 0 1 0 2 1 1 1 2 0 1 71 73 74 79 80 81 82 83 85 86 88 90 91 92 93 96 97 98 99 103 104 (Intercept) 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 age 63 74 40 81 73 59 55 42 44 71 61 72 63 70 66 72 69 71 64 56 63 ph.ecog 0 2 1 0 0 0 1 1 1 1 0 2 0 1 1 2 1 1 1 1 1 105 106 108 109 111 112 113 116 117 118 119 120 121 124 125 126 127 (Intercept) 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 age 59 66 67 55 69 44 80 76 49 68 66 80 75 72 70 66 50 ph.ecog 2 1 1 1 0 1 1 2 2 2 2 1 0 2 0 1 1 128 132 133 135 138 139 140 142 143 145 147 148 149 151 152 155 156 (Intercept) 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 age 64 53 47 67 56 54 56 74 76 57 71 54 82 70 60 55 69 ph.ecog 1 1 0 0 2 1 0 1 2 1 0 1 0 1 0 2 2 158 159 163 164 165 168 169 170 171 173 175 177 181 182 188 189 190 (Intercept) 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 age 62 63 69 63 64 46 61 65 61 56 53 56 60 39 58 64 53 ph.ecog 2 1 2 1 1 0 1 0 1 1 1 2 0 0 0 1 0 191 192 193 194 195 196 198 200 202 206 209 212 213 215 216 218 221 (Intercept) 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 age 72 52 50 64 71 70 64 60 73 62 69 67 69 65 65 76 67 ph.ecog 1 2 1 1 1 0 1 1 1 2 1 1 1 1 1 2 1 223 224 225 227 (Intercept) 1 1 1 1 age 76 77 39 66 ph.ecog 1 1 0 1 attr(,"assign") [1] 0 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault11# #argv <- list(structure(c(NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_, NA_real_), .Dim = c(20L, 20L), .Dimnames = list(c(NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_), c(NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_, NA_character_)))); .Internal(t.default(argv[[1]])) NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault12# #argv <- list(structure('foo', .Dim = c(1L, 1L), .Dimnames = list(structure('object', simpleOnly = TRUE), NULL))); .Internal(t.default(argv[[1]])) object [1,] "foo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault13# #argv <- list(structure(c(0, 0, 0, 0, 0, 0, 3.95252516672997e-323, 0, 0, 0, 0, 0), .Dim = c(12L, 1L))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [1,] 0 0 0 0 0 0 3.952525e-323 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault14# #argv <- list(structure(c(794, 86, 150, 570), .Dim = c(2L, 2L), .Dimnames = structure(list(`1st Survey` = c('Approve', 'Disapprove'), `2nd Survey` = c('Approve', 'Disapprove')), .Names = c('1st Survey', '2nd Survey')))); .Internal(t.default(argv[[1]])) 1st Survey 2nd Survey Approve Disapprove Approve 794 86 Disapprove 150 570 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault15# #argv <- list(structure(list(3, 3, 3, 3, 3, 'fred'), .Dim = 2:3)); .Internal(t.default(argv[[1]])) [,1] [,2] [1,] 3 3 [2,] 3 3 [3,] 3 "fred" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault16# #argv <- list(1.28578345790245); .Internal(t.default(argv[[1]])) [,1] [1,] 1.285783 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault17# #argv <- list(structure(c(-0.560475646552213+0i, 0.7424437487+0.205661411508856i, 1.39139505579429-0.26763356813179i, 0.928710764113827-0.221714979045717i, -0.46926798541295+1.18846175213664i, 0.7424437487-0.205661411508856i, 0.460916205989202+0i, -0.452623703774585+0.170604003753717i, -0.094501186832143+0.54302538277632i, -0.331818442379127+0.612232958468282i, 1.39139505579429+0.26763356813179i, -0.452623703774585-0.170604003753717i, 0.400771450594052+0i, -0.927967220342259+0.479716843914174i, -0.790922791530657+0.043092176305418i, 0.928710764113827+0.221714979045717i, -0.094501186832143-0.54302538277632i, -0.927967220342259-0.479716843914174i, 0.701355901563686+0i, -0.600841318509537+0.213998439984336i, -0.46926798541295-1.18846175213664i, -0.331818442379127-0.612232958468282i, -0.790922791530657-0.043092176305418i, -0.600841318509537-0.213998439984336i, -0.625039267849257+0i), .Dim = c(5L, 5L))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [1,] -0.5604756+0.0000000i 0.7424437+0.2056614i 1.3913951-0.2676336i [2,] 0.7424437-0.2056614i 0.4609162+0.0000000i -0.4526237+0.1706040i [3,] 1.3913951+0.2676336i -0.4526237-0.1706040i 0.4007715+0.0000000i [4,] 0.9287108+0.2217150i -0.0945012-0.5430254i -0.9279672-0.4797168i [5,] -0.4692680-1.1884618i -0.3318184-0.6122330i -0.7909228-0.0430922i [,4] [,5] [1,] 0.9287108-0.2217150i -0.4692680+1.1884618i [2,] -0.0945012+0.5430254i -0.3318184+0.6122330i [3,] -0.9279672+0.4797168i -0.7909228+0.0430922i [4,] 0.7013559+0.0000000i -0.6008413+0.2139984i [5,] -0.6008413-0.2139984i -0.6250393+0.0000000i ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault18# #argv <- list(structure(c(0, 1954.88214285714, 557.144827586207, 0, 0, 1392.34285714286, 0, 0, 0), .Dim = c(3L, 3L))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [1,] 0 1954.882 557.1448 [2,] 0 0.000 1392.3429 [3,] 0 0.000 0.0000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault19# #argv <- list(c(3, 4)); .Internal(t.default(argv[[1]])) [,1] [,2] [1,] 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault2# #argv <- list(structure(c(0.63, -0.37, 0.4, -0.6, 0.85, -0.05, 1.02, -1.76, -1.62, -0.46, -0.57, 1.41, 0, -0.65, 0.57, -0.29, 1.22, 0.8, -0.5, 0.44, 1.63, -0.13, 0.17, 1.02, 0.11), .Dim = c(5L, 5L))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [,4] [,5] [1,] 0.63 -0.37 0.40 -0.60 0.85 [2,] -0.05 1.02 -1.76 -1.62 -0.46 [3,] -0.57 1.41 0.00 -0.65 0.57 [4,] -0.29 1.22 0.80 -0.50 0.44 [5,] 1.63 -0.13 0.17 1.02 0.11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault20# #argv <- list(structure(c(0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 0L, 0L, 1L, 0L, 0L, 1L, 1L), .Dim = c(4L, 4L), .Dimnames = list(c('Y', 'B', 'V', 'N'), c('B', 'V', 'N', 'V:N')))); .Internal(t.default(argv[[1]])) Y B V N B 0 1 0 0 V 0 0 1 0 N 0 0 0 1 V:N 0 0 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault21# #argv <- list(-3:5); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [1,] -3 -2 -1 0 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault22# #argv <- list(structure(c(8.3, 8.6, 8.8, 10.5, 10.7, 10.8, 11, 11, 11.1, 11.2, 11.3, 11.4, 11.4, 11.7, 12, 12.9, 12.9, 13.3, 13.7, 13.8, 14, 14.2, 14.5, 16, 16.3, 17.3, 17.5, 17.9, 18, 18, 20.6, 70, 65, 63, 72, 81, 83, 66, 75, 80, 75, 79, 76, 76, 69, 75, 74, 85, 86, 71, 64, 78, 80, 74, 72, 77, 81, 82, 80, 80, 80, 87, 10.3, 10.3, 10.2, 16.4, 18.8, 19.7, 15.6, 18.2, 22.6, 19.9, 24.2, 21, 21.4, 21.3, 19.1, 22.2, 33.8, 27.4, 25.7, 24.9, 34.5, 31.7, 36.3, 38.3, 42.6, 55.4, 55.7, 58.3, 51.5, 51, 77), .Dim = c(31L, 3L), .Dimnames = list(NULL, c('Girth', 'Height', 'Volume')))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12] [,13] Girth 8.3 8.6 8.8 10.5 10.7 10.8 11.0 11.0 11.1 11.2 11.3 11.4 11.4 Height 70.0 65.0 63.0 72.0 81.0 83.0 66.0 75.0 80.0 75.0 79.0 76.0 76.0 Volume 10.3 10.3 10.2 16.4 18.8 19.7 15.6 18.2 22.6 19.9 24.2 21.0 21.4 [,14] [,15] [,16] [,17] [,18] [,19] [,20] [,21] [,22] [,23] [,24] [,25] Girth 11.7 12.0 12.9 12.9 13.3 13.7 13.8 14.0 14.2 14.5 16.0 16.3 Height 69.0 75.0 74.0 85.0 86.0 71.0 64.0 78.0 80.0 74.0 72.0 77.0 Volume 21.3 19.1 22.2 33.8 27.4 25.7 24.9 34.5 31.7 36.3 38.3 42.6 [,26] [,27] [,28] [,29] [,30] [,31] Girth 17.3 17.5 17.9 18.0 18 20.6 Height 81.0 82.0 80.0 80.0 80 87.0 Volume 55.4 55.7 58.3 51.5 51 77.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault23# #argv <- list(structure(list(), .Dim = 0L)); .Internal(t.default(argv[[1]])) [1,] ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault24# #argv <- list(structure('Seed', .Dim = c(1L, 1L))); .Internal(t.default(argv[[1]])) [,1] [1,] "Seed" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault3# #argv <- list(structure(NA, .Dim = c(1L, 1L))); .Internal(t.default(argv[[1]])) [,1] [1,] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault4# #argv <- list(structure(c(0, 0, -0.51, 0, 0, 0, 0.18, -0.15, 0, 2.62, -2.77555756156289e-16, 0, 8.26162055433954e-17, 0.560000000000001, 0, 0, 0, 0, 0, 0, 1.79, 0, 0.05, 0, 0, 0, 0, 0, 0, -0.18, -1.47, 0, -5.55111512312578e-17, 0, 0, 0.23, 0, 2.206351421008e-17, -2.12, 0), .Dim = c(5L, 8L))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [,4] [,5] [1,] 0.000000e+00 0.00 -5.100000e-01 0.00 0.00 [2,] 0.000000e+00 0.18 -1.500000e-01 0.00 2.62 [3,] -2.775558e-16 0.00 8.261621e-17 0.56 0.00 [4,] 0.000000e+00 0.00 0.000000e+00 0.00 0.00 [5,] 1.790000e+00 0.00 5.000000e-02 0.00 0.00 [6,] 0.000000e+00 0.00 0.000000e+00 0.00 -0.18 [7,] -1.470000e+00 0.00 -5.551115e-17 0.00 0.00 [8,] 2.300000e-01 0.00 2.206351e-17 -2.12 0.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault5# #argv <- list(structure(c(NA, 0, NA, 0, NA, 0, NA, 0, NA, 0, NA, 0, NA, 0, NA, 0), .Dim = c(4L, 4L))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [,4] [1,] NA 0 NA 0 [2,] NA 0 NA 0 [3,] NA 0 NA 0 [4,] NA 0 NA 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault6# #argv <- list(structure(c(0, 10975969, 8779369, 10080625, 11148921, 7628644, 10732176, 6812100, 20115225, 8862529, 9180900, 20539024, 7579009, 15594601, 8208225, 5207524, 4748041, 9e+06, 667489, 15421329, 3964081, 0, 0, 1737124, 1758276, 1674436, 2244004, 4919524, 644809, 1373584, 4072324, 2220100, 1703025, 416025, 404496, 271441, 1028196, 1863225, 1067089, 2131600, 8225424, 3247204, 0, 0, 0, 41616, 339889, 42436, 933156, 458329, 5089536, 356409, 29584, 4343056, 476100, 2427364, 1022121, 855625, 558009, 81225, 2283121, 2611456, 1380625, 0, 0, 0, 0, 211600, 167281, 1290496, 558009, 4946176, 509796, 108900, 4210704, 546121, 2402500, 1121481, 1159929, 954529, 78400, 2762244, 3189796, 1907161, 0, 0, 0, 0, 0, 616225, 2387025, 727609, 4190209, 1243225, 534361, 3337929, 622521, 1814409, 1212201, 1461681, 1345600, 115600, 3218436, 4822416, 2521744, 0, 0, 0, 0, 0, 0, 577600, 2762244, 5934096, 211600, 72361, 5244100, 509796, 3111696, 1071225, 829921, 339889, 216225, 2241009, 1968409, 877969, 0, 0, 0, 0, 0, 0, 0, 2010724, 10214416, 211600, 72361, 8826841, 2125764, 6240004, 3161284, 2362369, 1218816, 1382976, 4202500, 422500, 2117025, 0, 0, 0, 0, 0, 0, 0, 0, 3900625, 1249924, 801025, 3748096, 24964, 2070721, 180625, 107584, 349281, 263169, 990025, 4276624, 1038361, 0, 0, 0, 0, 0, 0, 0, 0, 0, 8392609, 5895184, 456976, 3301489, 487204, 2866249, 4774225, 6579225, 3884841, 6922161, 15100996, 8844676, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 302500, 7134241, 1343281, 4831204, 2187441, 1532644, 648025, 769129, 3066001, 900601, 1334025, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 5198400, 744769, 2992900, 1399489, 1205604, 724201, 208849, 2832489, 2250000, 1452025, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1387684, 446224, 3104644, 5062500, 6285049, 3236401, 7290000, 10439361, 8625969, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1640961, 102400, 107584, 524176, 221841, 1098304, 4443664, 1338649, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1338649, 2972176, 4040100, 1620529, 4397409, 10163344, 5803281, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 381924, 1229881, 627264, 1022121, 5895184, 1857769, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 109561, 732736, 343396, 4782969, 806404, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 674041, 894916, 3076516, 183184, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2178576, 3337929, 1560001, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 7327849, 1461681, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 4431025, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), .Dim = c(21L, 21L))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [1,] 0 10975969 8779369 10080625 11148921 7628644 10732176 6812100 20115225 [2,] 0 0 1737124 1758276 1674436 2244004 4919524 644809 1373584 [3,] 0 0 0 41616 339889 42436 933156 458329 5089536 [4,] 0 0 0 0 211600 167281 1290496 558009 4946176 [5,] 0 0 0 0 0 616225 2387025 727609 4190209 [6,] 0 0 0 0 0 0 577600 2762244 5934096 [7,] 0 0 0 0 0 0 0 2010724 10214416 [8,] 0 0 0 0 0 0 0 0 3900625 [9,] 0 0 0 0 0 0 0 0 0 [10,] 0 0 0 0 0 0 0 0 0 [11,] 0 0 0 0 0 0 0 0 0 [12,] 0 0 0 0 0 0 0 0 0 [13,] 0 0 0 0 0 0 0 0 0 [14,] 0 0 0 0 0 0 0 0 0 [15,] 0 0 0 0 0 0 0 0 0 [16,] 0 0 0 0 0 0 0 0 0 [17,] 0 0 0 0 0 0 0 0 0 [18,] 0 0 0 0 0 0 0 0 0 [19,] 0 0 0 0 0 0 0 0 0 [20,] 0 0 0 0 0 0 0 0 0 [21,] 0 0 0 0 0 0 0 0 0 [,10] [,11] [,12] [,13] [,14] [,15] [,16] [,17] [,18] [1,] 8862529 9180900 20539024 7579009 15594601 8208225 5207524 4748041 9000000 [2,] 4072324 2220100 1703025 416025 404496 271441 1028196 1863225 1067089 [3,] 356409 29584 4343056 476100 2427364 1022121 855625 558009 81225 [4,] 509796 108900 4210704 546121 2402500 1121481 1159929 954529 78400 [5,] 1243225 534361 3337929 622521 1814409 1212201 1461681 1345600 115600 [6,] 211600 72361 5244100 509796 3111696 1071225 829921 339889 216225 [7,] 211600 72361 8826841 2125764 6240004 3161284 2362369 1218816 1382976 [8,] 1249924 801025 3748096 24964 2070721 180625 107584 349281 263169 [9,] 8392609 5895184 456976 3301489 487204 2866249 4774225 6579225 3884841 [10,] 0 302500 7134241 1343281 4831204 2187441 1532644 648025 769129 [11,] 0 0 5198400 744769 2992900 1399489 1205604 724201 208849 [12,] 0 0 0 1387684 446224 3104644 5062500 6285049 3236401 [13,] 0 0 0 0 1640961 102400 107584 524176 221841 [14,] 0 0 0 0 0 1338649 2972176 4040100 1620529 [15,] 0 0 0 0 0 0 381924 1229881 627264 [16,] 0 0 0 0 0 0 0 109561 732736 [17,] 0 0 0 0 0 0 0 0 674041 [18,] 0 0 0 0 0 0 0 0 0 [19,] 0 0 0 0 0 0 0 0 0 [20,] 0 0 0 0 0 0 0 0 0 [21,] 0 0 0 0 0 0 0 0 0 [,19] [,20] [,21] [1,] 667489 15421329 3964081 [2,] 2131600 8225424 3247204 [3,] 2283121 2611456 1380625 [4,] 2762244 3189796 1907161 [5,] 3218436 4822416 2521744 [6,] 2241009 1968409 877969 [7,] 4202500 422500 2117025 [8,] 990025 4276624 1038361 [9,] 6922161 15100996 8844676 [10,] 3066001 900601 1334025 [11,] 2832489 2250000 1452025 [12,] 7290000 10439361 8625969 [13,] 1098304 4443664 1338649 [14,] 4397409 10163344 5803281 [15,] 1022121 5895184 1857769 [16,] 343396 4782969 806404 [17,] 894916 3076516 183184 [18,] 2178576 3337929 1560001 [19,] 0 7327849 1461681 [20,] 0 0 4431025 [21,] 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault7# #argv <- list(structure(logical(0), .Dim = c(0L, 0L))); .Internal(t.default(argv[[1]])) <0 x 0 matrix> ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault8# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), .Dim = c(4L, 4L), .Dimnames = list(NULL, NULL))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [,4] [1,] TRUE TRUE TRUE TRUE [2,] TRUE TRUE TRUE TRUE [3,] TRUE TRUE TRUE TRUE [4,] TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_tdefault.testtdefault9# #argv <- list(structure(c(0.589872882227945+0i, 0.193623477236295+0i, 0.66266867945261+0i, 0.140441698505598+0i, -0.394596353845825+0i, 0.168331537203598+0i, 0.293129347035038+0i, -0.481237717889449+0i, 0.7985227152757+0i, -0.128496737541326+0i, -0.0231518691888815+0i, -0.892171028872675+0i, 0.158252886617681+0i, 0.418477841524233+0i, -0.0576815934568704+0i, 0.471807942431513+0i, -0.00978429568549377+0i, 0.0825499722933953+0i, 0.0943143868799564+0i, 0.872692289136496+0i, -0.632910525118973+0i, 0.283760916561723+0i, 0.545364104158516+0i, 0.398269626120626+0i, 0.25072556357658+0i), .Dim = c(5L, 5L))); .Internal(t.default(argv[[1]])) [,1] [,2] [,3] [,4] [,5] [1,] 0.58987288+0i 0.193623477+0i 0.66266868+0i 0.14044170+0i -0.39459635+0i [2,] 0.16833154+0i 0.293129347+0i -0.48123772+0i 0.79852272+0i -0.12849674+0i [3,] -0.02315187+0i -0.892171029+0i 0.15825289+0i 0.41847784+0i -0.05768159+0i [4,] 0.47180794+0i -0.009784296+0i 0.08254997+0i 0.09431439+0i 0.87269229+0i [5,] -0.63291053+0i 0.283760917+0i 0.54536410+0i 0.39826963+0i 0.25072556+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempdir.testTempdir# #{ d <- tempdir(); unlink(d); print(!identical(d, tempdir(TRUE))) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempdir.testTempdir# #{ d <- tempdir(); unlink(d); print(identical(d, tempdir())); unused<-tempdir(TRUE) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempfile.testTempfile# #{ tempfile("file", 42) } Error in tempfile("file", 42) : invalid 'tempdir' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempfile.testTempfile# #{ tempfile("file", character()) } Error in tempfile("file", character()) : no 'tempdir' ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempfile.testTempfile# #{ tempfile("file", integer()) } Error in tempfile("file", integer()) : invalid 'tempdir' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempfile.testTempfile# #{ tempfile("file", tempdir(), 42) } Error in tempfile("file", tempdir(), 42) : invalid file extension ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempfile.testTempfile# #{ tempfile("file", tempdir(), character()) } Error in tempfile("file", tempdir(), character()) : no 'fileext' ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempfile.testTempfile# #{ tempfile("file", tempdir(), integer()) } Error in tempfile("file", tempdir(), integer()) : invalid file extension ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempfile.testTempfile# #{ tempfile(42) } Error in tempfile(42) : invalid filename pattern ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempfile.testTempfile# #{ tempfile(character()) } Error in tempfile(character()) : no 'pattern' ##com.oracle.truffle.r.test.builtins.TestBuiltin_tempfile.testTempfile# #{ tempfile(integer()) } Error in tempfile(integer()) : invalid filename pattern ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeAttributes# #{ lan <- quote(a~b); attr(lan, '.Environment') <- 'fakeenv'; attributes(eval(lan)) } $.Environment $class [1] "formula" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeAttributes# #{ lan <- quote(a~b); attributes(eval(lan)) } $class [1] "formula" $.Environment ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeAttributes# #{ lan <- quote(a~b); class(lan) <- 'hoo'; attr(lan, '.Environment') <- 'fakeenv'; attributes(eval(lan)) } $class [1] "hoo" $.Environment [1] "fakeenv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeAttributes# #{ lan <- quote(a~b); class(lan) <- 'hoo'; attributes(eval(lan)) } $class [1] "hoo" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #... ~ 0 + x ... ~ 0 + x ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #x * ~y Error: object 'x' not found ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #x ~ y + z x ~ y + z ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #y <- x ~ q; str(y); list(y[[1]], y[[2]], y[[3]]) Class 'formula' language x ~ q ..- attr(*, ".Environment")= [[1]] `~` [[2]] x [[3]] q ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #y <- x ~~ q; str(y); list(y[[1]], y[[2]], y[[3]], y[[3]][[1]], y[[3]][[2]]) Class 'formula' language x ~ ~q ..- attr(*, ".Environment")= [[1]] `~` [[2]] x [[3]] ~q [[4]] `~` [[5]] q ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #y <- x ~~~ q; str(y); list(y[[1]], y[[2]], y[[3]], y[[3]][[1]], y[[3]][[2]], y[[3]][[2]][[1]], y[[3]][[2]][[2]]) Class 'formula' language x ~ ~~q ..- attr(*, ".Environment")= [[1]] `~` [[2]] x [[3]] ~~q [[4]] `~` [[5]] ~q [[6]] `~` [[7]] q ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #y <- x ~~~~ q; str(y); list(y[[1]], y[[2]], y[[3]], y[[3]][[1]], y[[3]][[2]], y[[3]][[2]][[1]], y[[3]][[2]][[2]], y[[3]][[2]][[2]][[1]], y[[3]][[2]][[2]][[2]]) Class 'formula' language x ~ ~~~q ..- attr(*, ".Environment")= [[1]] `~` [[2]] x [[3]] ~~~q [[4]] `~` [[5]] ~~q [[6]] `~` [[7]] ~q [[8]] `~` [[9]] q ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #y ~ ... y ~ ... ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #y ~ ... + 2 y ~ ... + 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #y ~ 0 + x y ~ 0 + x ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeDirect# #~ x + y ~x + y ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeIndirect# #do.call('~', list(quote(x + y))) ~x + y ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeIndirect# #do.call('~', list(quote(x), quote(y + z))) x ~ y + z ##com.oracle.truffle.r.test.builtins.TestBuiltin_tilde.testTildeIndirect# #do.call('~', list(quote(y), quote(0 + x))) y ~ 0 + x ##com.oracle.truffle.r.test.builtins.TestBuiltin_times_difftime.testtimes_difftime1# #argv <- structure(list(e1 = 2, e2 = structure(c(3.33333333333333, 683.25), units = 'mins', class = 'difftime')), .Names = c('e1', 'e2'));do.call('*.difftime', argv) Time differences in mins [1] 6.666667 1366.500000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testCharUtils# #a <- structure(c('X', 'Y'), names=c('a1','a2')); b<-toupper(a); names(b)[1]<-'bb'; a; a1 a2 "X" "Y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testCharUtils# #tolower(NA_integer_) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testCharUtils# #tolower(NA_real_) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testCharUtils# #tolower(c('NA', 'na')) [1] "na" "na" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testCharUtils# #{ tolower(1E100) } [1] "1e+100" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testCharUtils# #{ tolower(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testCharUtils# #{ tolower(c("Hello","ByE")) } [1] "hello" "bye" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testCharUtils# #{ tolower(c()) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testCharUtils# #{ tolower(c(a="HI", "HELlo")) } a "hi" "hello" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testtolower1# #argv <- list('show'); .Internal(tolower(argv[[1]])) [1] "show" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testtolower2# #argv <- list('TRUE'); .Internal(tolower(argv[[1]])) [1] "true" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testtolower3# #argv <- list(c('title', 'author', 'year', 'note')); .Internal(tolower(argv[[1]])) [1] "title" "author" "year" "note" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testtolower4# #argv <- list(c('ChangeLog', 'DESCRIPTION', 'INDEX', 'MD5', 'NAMESPACE', 'PORTING', '0aaa.R', 'agnes.q', 'clara.q', 'clusGap.R', 'coef.R', 'daisy.q', 'diana.q', 'ellipsoidhull.R', 'fanny.q', 'internal.R', 'mona.q', 'pam.q', 'plothier.q', 'plotpart.q', 'silhouette.R', 'zzz.R', 'README', 'agriculture.tab', 'animals.tab', 'chorSub.rda', 'flower.R', 'plantTraits.rda', 'pluton.tab', 'ruspini.tab', 'votes.repub.tab', 'xclara.rda', 'CITATION', 'R-cluster.mo', 'R-cluster.mo', 'R-cluster.mo', 'agnes.Rd', 'agnes.object.Rd', 'agriculture.Rd', 'animals.Rd', 'bannerplot.Rd', 'chorSub.Rd', 'clara.Rd', 'clara.object.Rd', 'clusGap.Rd', 'clusplot.default.Rd', 'clusplot.partition.Rd', 'cluster-internal.Rd', 'coef.hclust.Rd', 'daisy.Rd', 'diana.Rd', 'dissimilarity.object.Rd', 'ellipsoidhull.Rd', 'fanny.Rd', 'fanny.object.Rd', 'flower.Rd', 'lower.to.upper.tri.inds.Rd', 'mona.Rd', 'mona.object.Rd', 'pam.Rd', 'pam.object.Rd', 'partition.object.Rd', 'plantTraits.Rd', 'plot.agnes.Rd', 'plot.diana.Rd', 'plot.mona.Rd', 'plot.partition.Rd', 'pltree.Rd', 'pltree.twins.Rd', 'pluton.Rd', 'predict.ellipsoid.Rd', 'print.agnes.Rd', 'print.clara.Rd', 'print.diana.Rd', 'print.dissimilarity.Rd', 'print.fanny.Rd', 'print.mona.Rd', 'print.pam.Rd', 'ruspini.Rd', 'silhouette.Rd', 'sizeDiss.Rd', 'summary.agnes.Rd', 'summary.clara.Rd', 'summary.diana.Rd', 'summary.mona.Rd', 'summary.pam.Rd', 'twins.object.Rd', 'volume.ellipsoid.Rd', 'votes.repub.Rd', 'xclara.Rd', 'R-cluster.pot', 'R-de.po', 'R-en@quot.po', 'R-pl.po', 'update-me.sh', 'clara.c', 'cluster.h', 'daisy.f', 'dysta.f', 'fanny.c', 'ind_2.h', 'init.c', 'mona.f', 'pam.c', 'sildist.c', 'spannel.c', 'twins.c', 'agnes-ex.R', 'agnes-ex.Rout.save', 'clara-NAs.R', 'clara-NAs.Rout.save', 'clara-ex.R', 'clara.R', 'clara.Rout.save', 'clusplot-out.R', 'clusplot-out.Rout.save', 'daisy-ex.R', 'daisy-ex.Rout.save', 'diana-boots.R', 'diana-ex.R', 'diana-ex.Rout.save', 'ellipsoid-ex.R', 'ellipsoid-ex.Rout.save', 'fanny-ex.R', 'mona.R', 'mona.Rout.save', 'pam.R', 'pam.Rout.save', 'silhouette-default.R', 'silhouette-default.Rout.save', 'sweep-ex.R', '.', 'R', 'data', 'inst', 'LC_MESSAGES', 'LC_MESSAGES', 'LC_MESSAGES', 'man', 'po', 'src', 'tests')); .Internal(tolower(argv[[1]])) [1] "changelog" "description" [3] "index" "md5" [5] "namespace" "porting" [7] "0aaa.r" "agnes.q" [9] "clara.q" "clusgap.r" [11] "coef.r" "daisy.q" [13] "diana.q" "ellipsoidhull.r" [15] "fanny.q" "internal.r" [17] "mona.q" "pam.q" [19] "plothier.q" "plotpart.q" [21] "silhouette.r" "zzz.r" [23] "readme" "agriculture.tab" [25] "animals.tab" "chorsub.rda" [27] "flower.r" "planttraits.rda" [29] "pluton.tab" "ruspini.tab" [31] "votes.repub.tab" "xclara.rda" [33] "citation" "r-cluster.mo" [35] "r-cluster.mo" "r-cluster.mo" [37] "agnes.rd" "agnes.object.rd" [39] "agriculture.rd" "animals.rd" [41] "bannerplot.rd" "chorsub.rd" [43] "clara.rd" "clara.object.rd" [45] "clusgap.rd" "clusplot.default.rd" [47] "clusplot.partition.rd" "cluster-internal.rd" [49] "coef.hclust.rd" "daisy.rd" [51] "diana.rd" "dissimilarity.object.rd" [53] "ellipsoidhull.rd" "fanny.rd" [55] "fanny.object.rd" "flower.rd" [57] "lower.to.upper.tri.inds.rd" "mona.rd" [59] "mona.object.rd" "pam.rd" [61] "pam.object.rd" "partition.object.rd" [63] "planttraits.rd" "plot.agnes.rd" [65] "plot.diana.rd" "plot.mona.rd" [67] "plot.partition.rd" "pltree.rd" [69] "pltree.twins.rd" "pluton.rd" [71] "predict.ellipsoid.rd" "print.agnes.rd" [73] "print.clara.rd" "print.diana.rd" [75] "print.dissimilarity.rd" "print.fanny.rd" [77] "print.mona.rd" "print.pam.rd" [79] "ruspini.rd" "silhouette.rd" [81] "sizediss.rd" "summary.agnes.rd" [83] "summary.clara.rd" "summary.diana.rd" [85] "summary.mona.rd" "summary.pam.rd" [87] "twins.object.rd" "volume.ellipsoid.rd" [89] "votes.repub.rd" "xclara.rd" [91] "r-cluster.pot" "r-de.po" [93] "r-en@quot.po" "r-pl.po" [95] "update-me.sh" "clara.c" [97] "cluster.h" "daisy.f" [99] "dysta.f" "fanny.c" [101] "ind_2.h" "init.c" [103] "mona.f" "pam.c" [105] "sildist.c" "spannel.c" [107] "twins.c" "agnes-ex.r" [109] "agnes-ex.rout.save" "clara-nas.r" [111] "clara-nas.rout.save" "clara-ex.r" [113] "clara.r" "clara.rout.save" [115] "clusplot-out.r" "clusplot-out.rout.save" [117] "daisy-ex.r" "daisy-ex.rout.save" [119] "diana-boots.r" "diana-ex.r" [121] "diana-ex.rout.save" "ellipsoid-ex.r" [123] "ellipsoid-ex.rout.save" "fanny-ex.r" [125] "mona.r" "mona.rout.save" [127] "pam.r" "pam.rout.save" [129] "silhouette-default.r" "silhouette-default.rout.save" [131] "sweep-ex.r" "." [133] "r" "data" [135] "inst" "lc_messages" [137] "lc_messages" "lc_messages" [139] "man" "po" [141] "src" "tests" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testtolower5# #argv <- list(structure('base', .Names = 'Priority')); .Internal(tolower(argv[[1]])) Priority "base" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testtolower6# #argv <- list(character(0)); .Internal(tolower(argv[[1]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_tolower.testtolower8# #argv <- structure(list(x = c('NA', NA, 'BANANA')), .Names = 'x');do.call('tolower', argv) [1] "na" NA "banana" ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testCharUtils# #a <- structure(c('x', 'y'), names=c('a1','a2')); b<-toupper(a); names(b)[1]<-'bb'; a; a1 a2 "x" "y" ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testCharUtils# #{ m <- matrix("hi") ; toupper(m) } [,1] [1,] "HI" ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testCharUtils# #{ toupper(1E100) } [1] "1E+100" ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testCharUtils# #{ toupper(NA) } [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testCharUtils# #{ toupper(c("hello","bye")) } [1] "HELLO" "BYE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testCharUtils# #{ toupper(c()) } character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testCharUtils# #{ toupper(c(a="hi", "hello")) } a "HI" "HELLO" ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testtoupper1# #argv <- list('UTF-8'); .Internal(toupper(argv[[1]])) [1] "UTF-8" ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testtoupper2# #argv <- list(c('', '', 'remission', '', '', '', '', '', '')); .Internal(toupper(argv[[1]])) [1] "" "" "REMISSION" "" "" "" [7] "" "" "" ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testtoupper3# #argv <- list(character(0)); .Internal(toupper(argv[[1]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testtoupper4# #argv <- list(structure(c('BasicClasses', 'Classes', 'Documentation', 'environment-class', 'GenericFunctions', 'language-class', 'LinearMethodsList-class', 'MethodDefinition-class', 'MethodWithNext-class', 'Methods', 'MethodsList-class', 'callNextMethod', 'ObjectsWithPackage-class', 'S3Part', 'S4groupGeneric', 'SClassExtension-class', 'StructureClasses', 'TraceClasses', 'as', 'callGeneric', 'canCoerce', 'cbind2', 'className', 'classRepresentation-class', 'classesToAM', 'dotsMethods', 'evalSource', 'findClass', 'findMethods', 'fixPre1.8', 'genericFunction-class', 'getClass', 'getMethod', 'getPackageName', 'hasArg', 'implicitGeneric', 'inheritedSlotNames', 'initialize-methods', 'is', 'isSealedMethod', 'LocalReferenceClasses', 'method.skeleton', 'new', 'nonStructure-class', 'promptClass', 'promptMethods', 'ReferenceClasses', 'representation', 'selectSuperClasses', 'setClass', 'setClassUnion', 'setGeneric', 'setLoadActions', 'setMethod', 'setOldClass', 'makeClassRepresentation', 'show', 'showMethods', 'signature-class', 'slot', 'envRefClass-class', 'testInheritedMethods', 'validObject', '.BasicFunsList'), .Names = c('/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/BasicClasses.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/Classes.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/Documentation.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/EnvironmentClass.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/GenericFunctions.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/LanguageClasses.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/LinearMethodsList-class.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/MethodDefinition-class.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/MethodWithNext-class.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/Methods.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/MethodsList-class.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/NextMethod.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/ObjectsWithPackage-class.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/S3Part.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/S4groupGeneric.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/SClassExtension-class.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/StructureClasses.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/TraceClasses.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/as.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/callGeneric.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/canCoerce.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/cbind2.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/className.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/classRepresentation-class.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/classesToAM.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/dotsMethods.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/evalSource.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/findClass.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/findMethods.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/fixPrevious.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/genericFunction-class.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/getClass.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/getMethod.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/getPackageName.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/hasArg.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/implicitGeneric.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/inheritedSlotNames.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/initialize-methods.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/is.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/isSealedMethod.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/localRefClass.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/method.skeleton.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/new.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/nonStructure-class.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/promptClass.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/promptMethods.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/refClass.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/representation.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/selectSuperClasses.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setClass.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setClassUnion.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setGeneric.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setLoadActions.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setMethod.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setOldClass.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setSClass.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/show.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/showMethods.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/signature-class.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/slot.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/stdRefClass.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/testInheritedMethods.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/validObject.tex', '/home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/zBasicFunsList.tex'))); .Internal(toupper(argv[[1]])) /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/BasicClasses.tex "BASICCLASSES" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/Classes.tex "CLASSES" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/Documentation.tex "DOCUMENTATION" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/EnvironmentClass.tex "ENVIRONMENT-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/GenericFunctions.tex "GENERICFUNCTIONS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/LanguageClasses.tex "LANGUAGE-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/LinearMethodsList-class.tex "LINEARMETHODSLIST-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/MethodDefinition-class.tex "METHODDEFINITION-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/MethodWithNext-class.tex "METHODWITHNEXT-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/Methods.tex "METHODS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/MethodsList-class.tex "METHODSLIST-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/NextMethod.tex "CALLNEXTMETHOD" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/ObjectsWithPackage-class.tex "OBJECTSWITHPACKAGE-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/S3Part.tex "S3PART" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/S4groupGeneric.tex "S4GROUPGENERIC" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/SClassExtension-class.tex "SCLASSEXTENSION-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/StructureClasses.tex "STRUCTURECLASSES" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/TraceClasses.tex "TRACECLASSES" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/as.tex "AS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/callGeneric.tex "CALLGENERIC" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/canCoerce.tex "CANCOERCE" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/cbind2.tex "CBIND2" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/className.tex "CLASSNAME" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/classRepresentation-class.tex "CLASSREPRESENTATION-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/classesToAM.tex "CLASSESTOAM" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/dotsMethods.tex "DOTSMETHODS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/evalSource.tex "EVALSOURCE" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/findClass.tex "FINDCLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/findMethods.tex "FINDMETHODS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/fixPrevious.tex "FIXPRE1.8" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/genericFunction-class.tex "GENERICFUNCTION-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/getClass.tex "GETCLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/getMethod.tex "GETMETHOD" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/getPackageName.tex "GETPACKAGENAME" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/hasArg.tex "HASARG" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/implicitGeneric.tex "IMPLICITGENERIC" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/inheritedSlotNames.tex "INHERITEDSLOTNAMES" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/initialize-methods.tex "INITIALIZE-METHODS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/is.tex "IS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/isSealedMethod.tex "ISSEALEDMETHOD" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/localRefClass.tex "LOCALREFERENCECLASSES" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/method.skeleton.tex "METHOD.SKELETON" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/new.tex "NEW" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/nonStructure-class.tex "NONSTRUCTURE-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/promptClass.tex "PROMPTCLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/promptMethods.tex "PROMPTMETHODS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/refClass.tex "REFERENCECLASSES" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/representation.tex "REPRESENTATION" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/selectSuperClasses.tex "SELECTSUPERCLASSES" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setClass.tex "SETCLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setClassUnion.tex "SETCLASSUNION" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setGeneric.tex "SETGENERIC" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setLoadActions.tex "SETLOADACTIONS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setMethod.tex "SETMETHOD" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setOldClass.tex "SETOLDCLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/setSClass.tex "MAKECLASSREPRESENTATION" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/show.tex "SHOW" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/showMethods.tex "SHOWMETHODS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/signature-class.tex "SIGNATURE-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/slot.tex "SLOT" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/stdRefClass.tex "ENVREFCLASS-CLASS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/testInheritedMethods.tex "TESTINHERITEDMETHODS" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/validObject.tex "VALIDOBJECT" /home/lzhao/tmp/RtmpZy1R7l/ltx5573594f0cc9/zBasicFunsList.tex ".BASICFUNSLIST" ##com.oracle.truffle.r.test.builtins.TestBuiltin_toupper.testtoupper6# #argv <- structure(list(x = c('na', NA, 'banana')), .Names = 'x');do.call('toupper', argv) [1] "NA" NA "BANANA" ##com.oracle.truffle.r.test.builtins.TestBuiltin_tracemem.argumentErrors# #retracemem(NULL) ##com.oracle.truffle.r.test.builtins.TestBuiltin_tracemem.argumentErrors# #retracemem(c(1,10,100), 1:10) Error in retracemem(c(1, 10, 100), 1:10) : invalid 'previous' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_tracemem.argumentErrors# #tracemem(NULL) Error in tracemem(NULL) : cannot trace NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_tracemem.list#Output.ContainsReferences# #v <- list(1,10,100); tracemem(v); x <- v; x[[1]]<-42; [1] "<0x564ac325dad8>" tracemem[0x564ac325dad8 -> 0x564ac338bd38]: ##com.oracle.truffle.r.test.builtins.TestBuiltin_tracemem.retracemem#Output.ContainsReferences# #v <- c(1,10,100); tracemem(v); x <- v[-1]; retracemem(x, retracemem(v)); u <- x; u[[1]] <- 42; [1] "<0x556dd7dbdad8>" tracemem[<0x556dd7dbdad8> -> 0x556dd690e1f8]: tracemem[0x556dd690e1f8 -> 0x556dd690e278]: ##com.oracle.truffle.r.test.builtins.TestBuiltin_tracemem.retracemem#Output.ContainsReferences# #x<-1:10; retracemem(x, c("first", "second")) Error in retracemem(x, c("first", "second")) : invalid 'previous' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_tracemem.vectors#Output.ContainsReferences# #v <- c(1,10,100); tracemem(v); x <- v; y <- v; x[[1]]<-42; untracemem(v); y[[2]] <- 84 [1] "<0x55afeb4cfad8>" tracemem[0x55afeb4cfad8 -> 0x55afeb5fdce8]: ##com.oracle.truffle.r.test.builtins.TestBuiltin_tracemem.vectors#Output.ContainsReferences# #v <- c(1,10,100); tracemem(v); x <- v; y <- v; x[[1]]<-42; y[[2]] <- 84 [1] "<0x55dd95c94ad8>" tracemem[0x55dd95c94ad8 -> 0x55dd95dc2ce8]: tracemem[0x55dd95c94ad8 -> 0x55dd95dc2c48]: ##com.oracle.truffle.r.test.builtins.TestBuiltin_trigamma.testtrigamma1# #argv <- list(structure(c(9.16602362697115, 1.16602362697115, 3.16602362697115, 6.16602362697115, 6.16602362697115, 2.16602362697115, 8.16602362697115, 1.16602362697115, 7.16602362697115, 19.1660236269712, 2.16602362697115), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11')));trigamma(argv[[1]]); 1 2 3 4 5 6 7 0.11526572 1.31953765 0.37088896 0.17603737 0.17603737 0.58403321 0.13026184 8 9 10 11 1.31953765 0.14973532 0.05356047 0.58403321 ##com.oracle.truffle.r.test.builtins.TestBuiltin_trigamma.testtrigamma2# #argv <- list(structure(c(3.23454845691922, 12.2345484569192, 15.2345484569192, 6.23454845691922, 6.23454845691922, 14.2345484569192, 21.2345484569192, 23.2345484569192, 7.23454845691922, 7.23454845691922, 16.2345484569192, 8.23454845691922, 15.2345484569192, 7.23454845691922, 33.2345484569192, 54.2345484569192, 58.2345484569192, 15.2345484569192, 17.2345484569192, 17.2345484569192, 18.2345484569192, 41.2345484569192, 44.2345484569192, 47.2345484569192, 9.23454845691922, 24.2345484569192, 24.2345484569192, 29.2345484569192, 35.2345484569192, 37.2345484569192, 39.2345484569192, 4.23454845691922, 6.23454845691922, 12.2345484569192, 25.2345484569192, 46.2345484569192, 6.23454845691922, 7.23454845691922, 7.23454845691922, 10.2345484569192, 14.2345484569192, 24.2345484569192, 26.2345484569192, 33.2345484569192, 54.2345484569192, 55.2345484569192, 6.23454845691922, 6.23454845691922, 12.2345484569192, 18.2345484569192, 20.2345484569192, 9.23454845691922, 14.2345484569192, 15.2345484569192, 21.2345484569192, 48.2345484569192, 49.2345484569192, 61.2345484569192, 82.2345484569192, 3.23454845691922, 1.23454845691922, 3.23454845691922, 4.23454845691922, 6.23454845691922, 11.2345484569192, 15.2345484569192, 22.2345484569192, 37.2345484569192, 41.2345484569192, 7.23454845691922, 18.2345484569192, 68.2345484569192, 1.23454845691922, 1.23454845691922, 3.23454845691922, 8.23454845691922, 12.2345484569192, 13.2345484569192, 1.23454845691922, 1.23454845691922, 6.23454845691922, 6.23454845691922, 6.23454845691922, 12.2345484569192, 18.2345484569192, 4.23454845691922, 5.23454845691922, 23.2345484569192, 31.2345484569192, 37.2345484569192, 9.23454845691922, 1.23454845691922, 2.23454845691922, 6.23454845691922, 8.23454845691922, 17.2345484569192, 28.2345484569192, 1.23454845691922, 31.2345484569192, 11.2345484569192, 15.2345484569192, 28.2345484569192, 42.2345484569192, 70.2345484569192, 26.2345484569192, 11.2345484569192, 12.2345484569192, 21.2345484569192, 34.2345484569192, 6.23454845691922, 8.23454845691922, 1.23454845691922, 2.23454845691922, 6.23454845691922, 6.23454845691922, 6.23454845691922, 6.23454845691922, 8.23454845691922, 12.2345484569192, 16.2345484569192, 6.23454845691922, 15.2345484569192, 7.23454845691922, 7.23454845691922, 8.23454845691922, 29.2345484569192, 1.23454845691922, 6.23454845691922, 15.2345484569192, 3.23454845691922, 3.23454845691922, 4.23454845691922, 9.23454845691922, 11.2345484569192, 13.2345484569192, 2.23454845691922, 2.23454845691922, 10.2345484569192, 23.2345484569192, 4.23454845691922, 4.23454845691922, 6.23454845691922, 16.2345484569192, 19.2345484569192, 23.2345484569192, 38.2345484569192), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93', '94', '95', '96', '97', '98', '99', '100', '101', '102', '103', '104', '105', '106', '107', '108', '109', '110', '111', '112', '113', '114', '115', '116', '117', '118', '119', '120', '121', '122', '123', '124', '125', '126', '127', '128', '129', '130', '131', '132', '133', '134', '135', '136', '137', '138', '139', '140', '141', '142', '143', '144', '145', '146')));trigamma(argv[[1]]); 1 2 3 4 5 6 7 0.36178937 0.08516701 0.06784170 0.17394434 0.17394434 0.07277699 0.04821934 8 9 10 11 12 13 14 0.04397883 0.14821729 0.14821729 0.06353305 0.12911097 0.06784170 0.14821729 15 16 17 18 19 20 21 0.03054639 0.01860946 0.01732022 0.06784170 0.05973886 0.05973886 0.05637219 22 23 24 25 26 27 28 0.02454795 0.02286422 0.02139663 0.11436340 0.04212645 0.04212645 0.03479780 29 30 31 32 33 34 35 0.02878779 0.02722065 0.02581531 0.26620812 0.17394434 0.08516701 0.04042378 36 37 38 39 40 41 42 0.02186444 0.17394434 0.14821729 0.14821729 0.10263689 0.07277699 0.04212645 43 44 45 46 47 48 49 0.03885338 0.03054639 0.01860946 0.01826949 0.17394434 0.17394434 0.08516701 50 51 52 53 54 55 56 0.05637219 0.05066172 0.11436340 0.07277699 0.06784170 0.04821934 0.02094842 57 58 59 60 61 62 63 0.02051860 0.01646472 0.01223458 0.36178937 1.21818213 0.36178937 0.26620812 64 65 66 67 68 69 70 0.17394434 0.09308999 0.06784170 0.04600159 0.02722065 0.02454795 0.14821729 71 72 73 74 75 76 77 0.05637219 0.01476325 1.21818213 1.21818213 0.36178937 0.12911097 0.08516701 78 79 80 81 82 83 84 0.07848627 1.21818213 1.21818213 0.17394434 0.17394434 0.17394434 0.08516701 85 86 87 88 89 90 91 0.05637219 0.26620812 0.21044003 0.04397883 0.03253381 0.02722065 0.11436340 92 93 94 95 96 97 98 1.21818213 0.56206146 0.17394434 0.12911097 0.05973886 0.03605221 1.21818213 99 100 101 102 103 104 105 0.03253381 0.09308999 0.06784170 0.03605221 0.02395982 0.01433985 0.03885338 106 107 108 109 110 111 112 0.09308999 0.08516701 0.04821934 0.02964103 0.17394434 0.12911097 1.21818213 113 114 115 116 117 118 119 0.56206146 0.17394434 0.17394434 0.17394434 0.17394434 0.12911097 0.08516701 120 121 122 123 124 125 126 0.06353305 0.17394434 0.06784170 0.14821729 0.14821729 0.12911097 0.03479780 127 128 129 130 131 132 133 1.21818213 0.17394434 0.06784170 0.36178937 0.36178937 0.26620812 0.11436340 134 135 136 137 138 139 140 0.09308999 0.07848627 0.56206146 0.56206146 0.10263689 0.04397883 0.26620812 141 142 143 144 145 146 0.26620812 0.17394434 0.06353305 0.05336466 0.04397883 0.02649936 ##com.oracle.truffle.r.test.builtins.TestBuiltin_trigamma.testtrigamma3# #argv <- list(c(1e+30, 1e+60, 1e+90, 1e+120, 1e+150, 1e+180, 1e+210, 1e+240, 1e+270, 1e+300));trigamma(argv[[1]]); [1] 1e-30 1e-60 1e-90 1e-120 1e-150 1e-180 1e-210 1e-240 1e-270 1e-300 ##com.oracle.truffle.r.test.builtins.TestBuiltin_trigamma.testtrigamma4# #argv <- list(c(-100, -3, -2, -1, 0, 1, 2, -99.9, -7.7, -3, -2.9, -2.8, -2.7, -2.6, -2.5, -2.4, -2.3, -2.2, -2.1, -2, -1.9, -1.8, -1.7, -1.6, -1.5, -1.4, -1.3, -1.2, -1.1, -1, -0.9, -0.8, -0.7, -0.6, -0.5, -0.4, -0.3, -0.2, -0.0999999999999996, 0, 0.1, 0.2, 0.3, 0.4, 0.5, 0.6, 0.7, 0.8, 0.9, 1, 1.1, 1.2, 1.3, 1.4, 1.5, 1.6, 1.7, 1.8, 1.9, 2, 2.1, 2.2, 2.3, 2.4, 2.5, 2.6, 2.7, 2.8, 2.9, 3, 5.1, 77));trigamma(argv[[1]]); [1] Inf Inf Inf Inf Inf [6] 1.64493407 0.64493407 103.34587903 14.95761284 Inf [11] 103.06378143 28.26607020 14.76937585 10.59168836 9.53924664 [16] 10.57002486 14.72591216 28.20053015 102.97574361 Inf [21] 102.94487536 28.13851918 14.63220163 10.44375937 9.37924664 [26] 10.39641375 14.53687624 27.99391858 102.74898624 Inf [31] 102.66786705 27.82987721 14.28618087 10.05313437 8.93480220 [36] 9.88620967 13.94516027 27.29947414 101.92253996 Inf [41] 101.43329915 26.26737721 12.24536455 7.27535659 4.93480220 [46] 3.63620967 2.83404916 2.29947414 1.92253996 1.64493407 [51] 1.43329915 1.26737721 1.13425343 1.02535659 0.93480220 [56] 0.85843189 0.79323283 0.73697414 0.68797206 0.64493407 [61] 0.60685287 0.57293276 0.54253746 0.51515251 0.49035776 [66] 0.46780689 0.44721207 0.42833216 0.41096375 0.39493407 [71] 0.21654883 0.01307171 ##com.oracle.truffle.r.test.builtins.TestBuiltin_trigamma.testtrigammaNaN# #trigamma(NA) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_trigamma.testtrigammaNaN# #trigamma(NaN) [1] NaN ##com.oracle.truffle.r.test.builtins.TestBuiltin_trunc.testTrunc# #if (!any(R.version$engine == "FastR")) { 1+1i } else { { trunc(1.1+1.9i); } } [1] 1+1i ##com.oracle.truffle.r.test.builtins.TestBuiltin_trunc.testTrunc# #{ trunc("aaa"); } Error in trunc("aaa") : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.builtins.TestBuiltin_trunc.testTrunc# #{ typeof(trunc(42L)); } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_trunc.testTrunc# #{ typeof(trunc(TRUE)); } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_trunc.testtrunc1# #argv <- list(8.5);trunc(argv[[1]]); [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_trunc.testtrunc2# #argv <- list(2819.50000004);trunc(argv[[1]]); [1] 2819 ##com.oracle.truffle.r.test.builtins.TestBuiltin_trunc.testtrunc3# #argv <- list(c(4.71622523386031, 1.10082330182195, 1.6348679328803, 1.0848926147446, 1.90544273355044, 0.359849020605907, 3.11383110354654, 0.867268502479419, 0.162947811186314, 0.450064289616421, 4.9159701296594, 4.6105394908227, 3.44404035480693, 1.26481729443185, 1.04007117450237, 2.98928162781522, 0.598357603885233, 3.89095719670877, 2.72964489413425, 2.9838975192979, 0.972001742338762, 3.45619874307886, 3.40639955131337, 1.64102643262595, 2.35728174913675, 0.473953454056755, 4.98228391283192, 4.91887083626352, 0.210240299347788, 2.26199432276189, 3.70630375458859, 3.81391524686478, 0.606464599259198, 4.40811770269647, 4.44661358138546, 2.80862170271575, 3.86814354802482, 3.88661664212123, 2.99017415847629, 2.74575827643275, 0.309161052573472, 3.80168808856979, 0.44893383863382, 4.61025935830548, 0.267928446410224, 2.24770340253599, 2.89542144862935, 0.558472302509472, 1.01390165626071, 4.68876871396787, 3.99585635983385, 0.118613908998668, 0.0555002887267619, 3.01412270753644, 1.23142387834378, 1.36282247491181, 4.64942723163404, 0.578164426842704, 2.22724793478847, 1.08748292084783, 1.14620470674708, 4.12017436814494, 0.320054858457297, 2.23438119865023, 4.76558442227542, 3.10512124677189, 1.74187473836355, 0.650008224183694, 3.97324822610244, 1.69624235597439, 4.7321886930149, 2.33042042935267, 0.96714960061945, 0.195004806155339, 0.781808936735615, 0.248751927865669, 1.19189711171202, 1.64329304476269, 4.17560710804537, 3.12169580138288, 4.66810682089999, 1.36349227512255, 0.602594048250467, 2.95277393539436, 3.86122465948574, 2.54265206633136, 4.36057312530465, 0.599795600865036, 0.397377072367817, 3.41722437064163, 0.29663014691323, 2.19461180153303, 4.06796077964827, 0.185917691560462, 2.69324880791828, 1.27729995292611, 2.07541133742779, 2.81013442203403, 0.629334823461249, 2.81195943942294));trunc(argv[[1]]); [1] 4 1 1 1 1 0 3 0 0 0 4 4 3 1 1 2 0 3 2 2 0 3 3 1 2 0 4 4 0 2 3 3 0 4 4 2 3 [38] 3 2 2 0 3 0 4 0 2 2 0 1 4 3 0 0 3 1 1 4 0 2 1 1 4 0 2 4 3 1 0 3 1 4 2 0 0 [75] 0 0 1 1 4 3 4 1 0 2 3 2 4 0 0 3 0 2 4 0 2 1 2 2 0 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_trunc.testtrunc4# #argv <- list(c(-2, -1.5, -1, -0.5, 0, 0.5, 1, 1.5, 2, 2.5, 3, 3.5, 4));trunc(argv[[1]]); [1] -2 -1 -1 0 0 0 1 1 2 2 3 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_truncDate.testtruncDate1# #argv <- structure(list(x = structure(-3620.8, class = 'Date')), .Names = 'x');do.call('trunc.Date', argv) [1] "1960-02-02" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(seq(1,2)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ f <- function(...) typeof(...); f()} Error in typeof(...) : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ f <- function(...) typeof(...); f(1)} [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ f <- function(...) typeof(...); f(1, 2)} Error in typeof(...) : unused argument (2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ f <- function(...) typeof(...); f(1, 2, 3)} Error in typeof(...) : unused arguments (2, 3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ f <- function(...) typeof(...); f(1, 2, 3, 4)} Error in typeof(...) : unused arguments (2, 3, 4) ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ length(typeof(NULL)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof("hi") } [1] "character" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof("test") } [1] "character" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(1) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(1:3) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(1L) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(NULL) } [1] "NULL" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(TRUE) } [1] "logical" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(c(1, 2, 3)) } [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(c(1L, 2L, 3L)) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(c(TRUE, TRUE, FALSE)) } [1] "logical" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(function(){}) } [1] "closure" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(length(typeof(NULL))) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(sum) } [1] "builtin" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ typeof(typeof(NULL)) } [1] "character" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ x<-data.frame(c("a", "b", "a")); typeof(x) } [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testTypeOf# #{ x<-factor(c("a", "b", "a")); typeof(x) } [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof1# #argv <- list(structure(c(1.23315637025077, 1.2394120713065, 1.46775472234056, 1.3131362441571, 0.834956748134462, 1.32096970624938, 1.38337762052736, 1.70911044284799, 1.23539395906175, 0.858346823253787, 1.52283660048288, 1.31313061976496, 1.12786658428867, 1.44366133143941, 1.27218165569433, 1.26731245914676, 1.42168796660342, 1.48945666726, 2.09136324227313, 1.36556393622446, 1.19497185571598, 1.3558872236906, 1.28486176009175, 0.896505382640118, 1.2920383545426, 1.43713738151143, 1.28325876023887, 1.8647069237969, 1.28069027865337, 1.3282363039678, 1.4132805261745, 0.646368078716031, 1.17057458108707, 1.35016461104197, 1.35509309393051, 0.62815321214884, 0.933778507736315, 1.38267166577057, 1.7643327299387, 0.662074713268515, 1.31638314484599, 0.127879987991043, 1.19108675802219, 1.27268759462974, 0.4383313914982, 1.4144264042562, 0.693758539302211, 1.47501143044129, 1.18104902231565, 1.31313716894023, 1.16251137109995, 1.33271580458282, 1.2645836556729, 1.27403739912758, 0.707073961081345, 1.02664693047896, NaN, 0.753985804351041, 1.38430649521587, 1.07546693634877, 1.19187230661588, 1.28069027865337, 1.31026717493666, 1.21822955912256, 1.13243112343561, 1.63256872758035, 1.02552404019857, 1.20828070506052, 1.33930727426782, 1.26731245914676, 1.38337762052736, 1.52793749920214, 1.07081398391753, 1.24912672913647, 1.44366133143941, 1.2823536700583, 1.38311795520175, 0.534347523417853, 1.25766711144813, 1.92388210662423, 1.52790220067279, 1.10639731743869, 1.88278431408355, 1.17178985993101, 1.13471940645093, 1.33429991787085, 1.59592895672966, 0.952232923176189, 2.67777307729144, 0.98546699757923, 0.534607888905458, 1.18840135978238, 2.67777307729144), .Names = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48', '49', '50', '51', '52', '53', '54', '55', '56', '57', '58', '59', '60', '61', '62', '63', '64', '65', '66', '67', '68', '69', '70', '71', '72', '73', '74', '75', '76', '77', '78', '79', '80', '81', '82', '83', '84', '85', '86', '87', '88', '89', '90', '91', '92', '93'))); .Internal(typeof(argv[[1]])) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof10# #argv <- list(c(NA, '1', NA, '2', '1', NA, NA, '1', '4', '1', NA, '4', '1', '3', NA, '4', '2', '2', NA, '4', '4', '2', '4', '4', '2', '1', '4', '4', '3', '1', '1', '4', '1', '4', NA, '1', '4', '4', '2', '2', '4', '4', '3', '4', '2', '2', '3', '3', '4', '1', '1', '1', '4', '1', '4', '4', '4', '4', NA, '4', '4', '4', NA, '1', '2', '3', '4', '3', '4', '2', '4', '4', '1', '4', '1', '4', NA, '4', '2', '1', '4', '1', '1', '1', '4', '4', '2', '4', '1', '1', '1', '4', '1', '1', '1', '4', '3', '1', '4', '3', '2', '4', '3', '1', '4', '2', '4', NA, '4', '4', '4', '2', '1', '4', '4', NA, '2', '4', '4', '1', '1', '1', '1', '4', '1', '2', '3', '2', '1', '4', '4', '4', '1', NA, '4', '2', '2', '2', '4', '4', '3', '3', '4', '2', '4', '3', '1', '1', '4', '2', '4', '3', '1', '4', '3', '4', '4', '1', '1', '4', '4', '3', '1', '1', '2', '1', '3', '4', '2', '2', '2', '4', '4', '3', '2', '1', '1', '4', '1', '1', '2', NA, '2', '3', '3', '2', '1', '1', '1', '1', '4', '4', '4', '4', '4', '4', '2', '2', '1', '4', '1', '4', '3', '4', '2', '3', '1', '3', '1', '4', '1', '4', '1', '4', '3', '3', '4', '4', '1', NA, '3', '4', '4', '4', '4', '4', '4', '3', '4', '3', '4', '2', '4', '4', '1', '2', NA, '4', '4', '4', '4', '1', '2', '1', '1', '2', '1', '4', '2', '3', '1', '4', '4', '4', '1', '2', '1', '4', '2', '1', '3', '1', '2', '2', '1', '2', '1', NA, '3', '2', '2', '4', '1', '4', '4', '2', '4', '4', '4', '2', '1', '4', '2', '4', '4', '4', '4', '4', '1', '3', '4', '3', '4', '1', NA, '4', NA, '1', '1', '1', '4', '4', '4', '4', '2', '4', '3', '2', NA, '1', '4', '4', '3', '4', '4', '4', '2', '4', '2', '1', '4', '4', NA, '4', '4', '3', '3', '4', '2', '2', '4', '1', '4', '4', '4', '3', '4', '4', '4', '3', '2', '1', '3', '1', '4', '1', '4', '2', NA, '1', '4', '4', '3', '1', '4', '1', '4', '1', '4', '4', '1', '2', '2', '1', '4', '1', '1', '4', NA, '4', NA, '4', '4', '4', '1', '4', '2', '1', '2', '2', '2', '2', '1', '1', '2', '1', '4', '2', '3', '3', '1', '3', '1', '4', '1', '3', '2', '2', '4', '1', NA, '3', '4', '2', '4', '4', '4', '4', '4', '4', '3', '4', '4', '3', '2', '1', '4', '4', '2', '4', '2', '1', '2', '1', '1', '1', '1', '4', '4', '1', '1', '4', '1', '4', '4', '4', '1', '1', NA, '3', '2', '4', '4', '4', '4', '2', '3', '3', '2', NA, '4', '2', '4', '4', '1', '1', '4', '4', '1', '1', '4', '1', '2', '2', '2', '2', '1', '4', '4', '1', '2', '2', '2', '3', '4', '4', '3', '4', '1', '1', '4', '4', NA, '4', '1', '4', '4', '4', '1', '4', '4', '1', '2', '4', '4', '4', '4', '1', '2', '4', '4', '2', '1', '4', '2', '4', '2', '2', '4', '1', '3', '3', '2', '4', '1', '4', '4', '4', '1', NA, '4', '4', '2', '4', '4', '4', '4', '4', '2', NA, '4', '2', '4', '3', '1', '4', '4', '3', '4', '2', '4', '4', '1', '2', '1', '4', '1', '3', '3', '1', '4', '4', '2', '4', '4', '4', '4', '3', '2', '3', '3', '2', NA, '3', '4', '4', '3', '3', '4', '4', '4', '1', '4', '4', '4', '4', '4', '4', '4', '2', '4', '2', '3', '4', '1', '3', '1', NA, '4', '1', '2', '2', '1', '4', '3', '3', '4', '1', '1', '3')); .Internal(typeof(argv[[1]])) [1] "character" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof11# #argv <- list(structure(list(base = c(11L, 11L, 6L, 8L, 66L, 27L, 12L, 52L, 23L, 10L, 52L, 33L, 18L, 42L, 87L, 50L, 18L, 111L, 18L, 20L, 12L, 9L, 17L, 28L, 55L, 9L, 10L, 47L, 76L, 38L, 19L, 10L, 19L, 24L, 31L, 14L, 11L, 67L, 41L, 7L, 22L, 13L, 46L, 36L, 38L, 7L, 36L, 11L, 151L, 22L, 41L, 32L, 56L, 24L, 16L, 22L, 25L, 13L, 12L)), .Names = 'base', row.names = c(1L, 5L, 9L, 13L, 17L, 21L, 25L, 29L, 33L, 37L, 41L, 45L, 49L, 53L, 57L, 61L, 65L, 69L, 73L, 77L, 81L, 85L, 89L, 93L, 97L, 101L, 105L, 109L, 113L, 117L, 121L, 125L, 129L, 133L, 137L, 141L, 145L, 149L, 153L, 157L, 161L, 165L, 169L, 173L, 177L, 181L, 185L, 189L, 193L, 197L, 201L, 205L, 209L, 213L, 217L, 221L, 225L, 229L, 233L))); .Internal(typeof(argv[[1]])) [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof12# #argv <- list(structure(c('Min. : 1.000 ', '1st Qu.: 9.000 ', 'Median :18.000 ', 'Mean :14.742 ', '3rd Qu.:20.000 ', 'Max. :23.000 ', NA, 'Min. :5.0000 ', '1st Qu.:5.3000 ', 'Median :6.1000 ', 'Mean :6.0841 ', '3rd Qu.:6.6000 ', 'Max. :7.7000 ', NA, 'Min. : 1.000 ', '1st Qu.: 24.250 ', 'Median : 56.500 ', 'Mean : 56.928 ', '3rd Qu.: 86.750 ', 'Max. :117.000 ', 'NAs :16 ', 'Min. : 0.500 ', '1st Qu.: 11.325 ', 'Median : 23.400 ', 'Mean : 45.603 ', '3rd Qu.: 47.550 ', 'Max. :370.000 ', NA, 'Min. :0.00300 ', '1st Qu.:0.04425 ', 'Median :0.11300 ', 'Mean :0.15422 ', '3rd Qu.:0.21925 ', 'Max. :0.81000 ', NA), .Dim = c(7L, 5L), .Dimnames = list(c('', '', '', '', '', '', ''), c(' event', ' mag', ' station', ' dist', ' accel')))); .Internal(typeof(argv[[1]])) [1] "character" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof13# #argv <- list(c(2L, 1L, NA)); .Internal(typeof(argv[[1]])) [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof14# #argv <- list(raw(0)); .Internal(typeof(argv[[1]])) [1] "raw" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof15# #argv <- list(c(1.1+0i, NA, 3+0i)); .Internal(typeof(argv[[1]])) [1] "complex" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof16# #argv <- list(1e+05); .Internal(typeof(argv[[1]])) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof17# #argv <- list(structure(c(' ', '***'), legend = '0 ‘***’ 0.001 ‘**’ 0.01 ‘*’ 0.05 ‘.’ 0.1 ‘ ’ 1', class = 'noquote')); .Internal(typeof(argv[[1]])) [1] "character" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof18# #argv <- list(structure(c(1+1i, 2+1.4142135623731i, 3+1.73205080756888i, 4+2i, 5+2.23606797749979i, 6+2.44948974278318i, 7+2.64575131106459i, 8+2.82842712474619i, 9+3i, 10+3.1622776601684i), id = character(0), class = structure('withId', package = '.GlobalEnv'))); .Internal(typeof(argv[[1]])) [1] "complex" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof19# #argv <- list(structure(list(x = structure(1L, .Label = '1.3', class = 'factor')), .Names = 'x', row.names = c(NA, -1L), class = 'data.frame')); .Internal(typeof(argv[[1]])) [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof2# #argv <- list(structure(c(1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1960, 1961, 1961, 1961, 1961, 1961, 1961, 1961, 1961, 1961), .Tsp = c(1960.08333333333, 1961.66666666667, 12), class = 'ts')); .Internal(typeof(argv[[1]])) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof20# #argv <- list(structure(list(a = 1), .Dim = 1L, .Dimnames = list('a'))); .Internal(typeof(argv[[1]])) [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof21# #argv <- list(structure(list(a = 1), .Names = 'a', .Tsp = c(1, 1, 1), class = 'ts')); .Internal(typeof(argv[[1]])) [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof22# #argv <- list(c(0, 0, 0, 0, 0, 1.75368801162502e-134, 0, 0, 0, 2.60477585273833e-251, 1.16485035372295e-260, 0, 1.53160350210786e-322, 0.333331382328728, 0, 0, 0, 0, 0, 0, 0, 0, 0, 3.44161262707711e-123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1.968811545398e-173, 0, 8.2359965384697e-150, 0, 0, 0, 0, 6.51733217171341e-10, 0, 2.36840184577368e-67, 0, 9.4348408357524e-307, 0, 1.59959906013771e-89, 0, 8.73836857865034e-286, 7.09716190970992e-54, 0, 0, 0, 1.530425353017e-274, 8.57590058044551e-14, 0.333333106397154, 0, 0, 1.36895217898448e-199, 2.0226102635783e-177, 5.50445388209462e-42, 0, 0, 0, 0, 1.07846402051283e-44, 1.88605464411243e-186, 1.09156111051203e-26, 0, 3.0702877273237e-124, 0.333333209689785, 0, 0, 0, 0, 0, 0, 3.09816093866831e-94, 0, 0, 4.7522727332095e-272, 0, 0, 2.30093251441394e-06, 0, 0, 1.27082826644707e-274, 0, 0, 0, 0, 0, 0, 0, 4.5662025456054e-65, 0, 2.77995853978268e-149, 0, 0, 0)); .Internal(typeof(argv[[1]])) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof23# #argv <- list(2.22044604925031e-16); .Internal(typeof(argv[[1]])) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof24# #argv <- list(structure(list(c0 = logical(0)), .Names = 'c0', row.names = integer(0))); .Internal(typeof(argv[[1]])) [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof25# #argv <- list(structure(3.14159265358979, comment = 'Start with pi', class = structure('num1', package = '.GlobalEnv'))); .Internal(typeof(argv[[1]])) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof26# #argv <- list(structure(c(NA, 0.1945), .Names = c('1', '2'))); .Internal(typeof(argv[[1]])) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof27# #argv <- list(structure(c(1L, 1L), .Label = 'Ctl', class = 'factor')); .Internal(typeof(argv[[1]])) [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof28# #argv <- list(c(1L, NA, 1L)); .Internal(typeof(argv[[1]])) [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof29# #argv <- list(c(NA, NA, NA)); .Internal(typeof(argv[[1]])) [1] "logical" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof3# #argv <- list(structure(c(NA, 9, 3, 3), .Names = c('', 'Hair:Eye', 'Hair:Sex', 'Eye:Sex'))); .Internal(typeof(argv[[1]])) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof31# #argv <- list(structure(list(Y = c(130L, 157L, 174L, 117L, 114L, 161L, 141L, 105L, 140L, 118L, 156L, 61L, 91L, 97L, 100L, 70L, 108L, 126L, 149L, 96L, 124L, 121L, 144L, 68L, 64L, 112L, 86L, 60L, 102L, 89L, 96L, 89L, 129L, 132L, 124L, 74L, 89L, 81L, 122L, 64L, 103L, 132L, 133L, 70L, 89L, 104L, 117L, 62L, 90L, 100L, 116L, 80L, 82L, 94L, 126L, 63L, 70L, 109L, 99L, 53L, 74L, 118L, 113L, 89L, 82L, 86L, 104L, 97L, 99L, 119L, 121L), B = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 5L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L, 6L), .Label = c('I', 'II', 'III', 'IV', 'V', 'VI'), class = 'factor'), V = structure(c(3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L), .Label = c('Golden.rain', 'Marvellous', 'Victory'), class = 'factor'), N = structure(c(2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L, 1L, 2L, 3L, 4L), .Label = c('0.0cwt', '0.2cwt', '0.4cwt', '0.6cwt'), class = 'factor')), .Names = c('Y', 'B', 'V', 'N'), terms = quote(Y ~ B + V + N + V:N), row.names = 2:72)); .Internal(typeof(argv[[1]])) [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof32# #argv <- list(structure(c(-3.001e+155, -1.067e+107, -1.976e+62, -9.961e+152, -2.059e+23, 1), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.'))); .Internal(typeof(argv[[1]])) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof33# #argv <- structure(list(x = c(1.1 + (0+0i), NA, 3 + (0+0i))), .Names = 'x');do.call('typeof', argv) [1] "complex" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof34# #argv <- structure(list(x = c(NA_integer_, NA_integer_, NA_integer_)), .Names = 'x');do.call('typeof', argv) [1] "integer" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof35# #argv <- structure(list(x = function(file = ifelse(onefile, 'Rplots.pdf', 'Rplot%03d.pdf'), width, height, onefile, family, title, fonts, version, paper, encoding, bg, fg, pointsize, pagecentre, colormodel, useDingbats, useKerning, fillOddEven, compress) { invisible() }), .Names = 'x'); do.call('typeof', argv) [1] "closure" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof4# #argv <- list(structure(function (x, y = NULL) standardGeneric('tcrossprod'), target = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), defined = structure('ANY', class = structure('signature', package = 'methods'), .Names = 'x', package = 'methods'), generic = character(0), class = structure('MethodDefinition', package = 'methods'))); .Internal(typeof(argv[[1]])) [1] "closure" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof5# #argv <- list(structure(c('Min. : 0.060 ', '1st Qu.: 0.320 ', 'Median : 0.630 ', 'Mean : 909.592 ', '3rd Qu.: 0.905 ', 'Max. :10000.000 '), .Dim = c(6L, 1L), .Dimnames = list(c('', '', '', '', '', ''), ' x'))); .Internal(typeof(argv[[1]])) [1] "character" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof6# #argv <- list(structure(c(-0.0529307911108286, -0.200175675120066), .Names = c('(Intercept)', 'xTRUE'))); .Internal(typeof(argv[[1]])) [1] "double" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof7# #argv <- list(complex(0)); .Internal(typeof(argv[[1]])) [1] "complex" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof8# #argv <- list(structure(list(is.array = FALSE, is.atomic = FALSE, is.call = FALSE, is.character = FALSE, is.complex = FALSE, is.data.frame = FALSE, is.double = FALSE, is.environment = FALSE, is.expression = FALSE, is.factor = FALSE, is.finite = NA, is.function = FALSE, is.infinite = NA, is.integer = FALSE, is.language = FALSE, is.list = TRUE, is.logical = FALSE, is.matrix = FALSE, is.na = structure(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE), .Names = c('coefficients', 'residuals', 'effects', 'rank', 'fitted.values', 'assign', 'qr', 'df.residual', 'xlevels', 'call', 'terms', 'model')), is.name = FALSE, is.nan = NA, is.null = FALSE, is.numeric = FALSE, is.numeric_version = FALSE, is.object = TRUE, is.ordered = FALSE, is.package_version = FALSE, is.pairlist = FALSE, is.primitive = FALSE, is.qr = FALSE, is.raw = FALSE, is.recursive = TRUE, is.symbol = FALSE, is.table = FALSE, is.vector = FALSE), .Names = c('is.array', 'is.atomic', 'is.call', 'is.character', 'is.complex', 'is.data.frame', 'is.double', 'is.environment', 'is.expression', 'is.factor', 'is.finite', 'is.function', 'is.infinite', 'is.integer', 'is.language', 'is.list', 'is.logical', 'is.matrix', 'is.na', 'is.name', 'is.nan', 'is.null', 'is.numeric', 'is.numeric_version', 'is.object', 'is.ordered', 'is.package_version', 'is.pairlist', 'is.primitive', 'is.qr', 'is.raw', 'is.recursive', 'is.symbol', 'is.table', 'is.vector'), class = 'isList')); .Internal(typeof(argv[[1]])) [1] "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_typeof.testtypeof9# #argv <- list(c(-21.222245139688+176.377752294836i, -21.222245139688-176.377752294836i, 61.0965873274467+76.779430575699i, 61.0965873274467-76.779430575699i, -11.7486843755171+0i)); .Internal(typeof(argv[[1]])) [1] "complex" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testOther# #{ setClass("foo", representation(j="numeric")); setClass("foo", representation(d="numeric")); x<-new("foo", d=42); unclass(x) } attr(,"d") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testOther# #{ setClass("foo", representation(j="numeric")); x<-new("foo", j=42); unclass(x) } attr(,"j") [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass1# #argv <- list(c(-1, -1));unclass(argv[[1]]); [1] -1 -1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass10# #argv <- list(structure(list(GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962), .Names = c('GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year'), row.names = 1947:1962));unclass(argv[[1]]); $GNP.deflator [1] 83.0 88.5 88.2 89.5 96.2 98.1 99.0 100.0 101.2 104.6 108.4 110.8 [13] 112.6 114.2 115.7 116.9 $GNP [1] 234.289 259.426 258.054 284.599 328.975 346.999 365.385 363.112 397.469 [10] 419.180 442.769 444.546 482.704 502.601 518.173 554.894 $Unemployed [1] 235.6 232.5 368.2 335.1 209.9 193.2 187.0 357.8 290.4 282.2 293.6 468.1 [13] 381.3 393.1 480.6 400.7 $Armed.Forces [1] 159.0 145.6 161.6 165.0 309.9 359.4 354.7 335.0 304.8 285.7 279.8 263.7 [13] 255.2 251.4 257.2 282.7 $Population [1] 107.608 108.632 109.773 110.929 112.075 113.270 115.094 116.219 117.388 [10] 118.734 120.445 121.950 123.366 125.368 127.852 130.081 $Year [1] 1947 1948 1949 1950 1951 1952 1953 1954 1955 1956 1957 1958 1959 1960 1961 [16] 1962 attr(,"row.names") [1] 1947 1948 1949 1950 1951 1952 1953 1954 1955 1956 1957 1958 1959 1960 1961 [16] 1962 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass11#Output.IgnoreWhitespace# #argv <- list(structure(list(y = c(0.219628047744843, 0.360454661130887, -1.14267533343616, 0.772374419482067, 0.681741904304867, 0.171869265068012, 2.08409180391906, 0.367547276775469), x1 = c(1L, 2L, 5L, 6L, 7L, 8L, 9L, 10L), x2 = c(1L, 2L, 5L, 6L, 7L, 8L, 9L, 10L), `(weights)` = c(0, 1, 1, 1, 1, 1, 1, 1)), .Names = c('y', 'x1', 'x2', '(weights)'), terms = quote(y ~ x1 + x2), row.names = c('a', 'b', 'e', 'f', 'g', 'h', 'i', 'j'), na.action = structure(3:4, .Names = c('c', 'd'), class = 'omit')));unclass(argv[[1]]); $y [1] 0.2196280 0.3604547 -1.1426753 0.7723744 0.6817419 0.1718693 2.0840918 [8] 0.3675473 $x1 [1] 1 2 5 6 7 8 9 10 $x2 [1] 1 2 5 6 7 8 9 10 $`(weights)` [1] 0 1 1 1 1 1 1 1 attr(,"terms") y ~ x1 + x2 attr(,"row.names") [1] "a" "b" "e" "f" "g" "h" "i" "j" attr(,"na.action") c d 3 4 attr(,"class") [1] "omit" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass12#Ignored.ReferenceError# #argv <- list(structure(list(`log(x)` = c(0, 0.693147180559945, 1.09861228866811, 1.38629436111989, 1.6094379124341, 1.79175946922805, 1.94591014905531, 2.07944154167984, 2.19722457733622, 2.30258509299405, 2.39789527279837, 2.484906649788, 2.56494935746154, 2.63905732961526, 2.70805020110221, 2.77258872223978, 2.83321334405622, 2.89037175789616, 2.94443897916644, 2.99573227355399, 3.04452243772342, 3.09104245335832, 3.13549421592915, 3.17805383034795, 3.2188758248682, 3.25809653802148, 3.29583686600433, 3.3322045101752, 3.36729582998647, 3.40119738166216, 3.43398720448515, 3.46573590279973, 3.49650756146648, 3.52636052461616, 3.55534806148941, 3.58351893845611, 3.61091791264422, 3.63758615972639, 3.66356164612965, 3.68887945411394, 3.71357206670431, 3.73766961828337, 3.76120011569356, 3.78418963391826, 3.80666248977032, 3.8286413964891, 3.85014760171006, 3.87120101090789, 3.89182029811063, 3.91202300542815, 3.93182563272433, 3.95124371858143, 3.97029191355212, 3.98898404656427, 4.00733318523247, 4.02535169073515, 4.04305126783455, 4.06044301054642, 4.07753744390572, 4.0943445622221, 4.11087386417331, 4.12713438504509, 4.14313472639153, 4.15888308335967, 4.17438726989564, 4.18965474202643, 4.20469261939097, 4.21950770517611, 4.23410650459726, 4.24849524204936, 4.26267987704132, 4.27666611901606, 4.29045944114839, 4.30406509320417, 4.31748811353631, 4.33073334028633, 4.34380542185368, 4.35670882668959, 4.36944785246702, 4.38202663467388, 4.39444915467244, 4.40671924726425, 4.4188406077966, 4.43081679884331, 4.44265125649032, 4.45434729625351, 4.46590811865458, 4.47733681447821, 4.48863636973214, 4.49980967033027, 4.51085950651685, 4.52178857704904, 4.53259949315326, 4.54329478227, 4.55387689160054, 4.56434819146784, 4.57471097850338, 4.58496747867057, 4.59511985013459, 4.60517018598809), `log(z)` = c(2.39789527279837, 2.484906649788, 2.56494935746154, 2.63905732961526, 2.70805020110221, 2.77258872223978, 2.83321334405622, 2.89037175789616, 2.94443897916644, 2.99573227355399, 3.04452243772342, 3.09104245335832, 3.13549421592915, 3.17805383034795, 3.2188758248682, 3.25809653802148, 3.29583686600433, 3.3322045101752, 3.36729582998647, 3.40119738166216, 3.43398720448515, 3.46573590279973, 3.49650756146648, 3.52636052461616, 3.55534806148941, 3.58351893845611, 3.61091791264422, 3.63758615972639, 3.66356164612965, 3.68887945411394, 3.71357206670431, 3.73766961828337, 3.76120011569356, 3.78418963391826, 3.80666248977032, 3.8286413964891, 3.85014760171006, 3.87120101090789, 3.89182029811063, 3.91202300542815, 3.93182563272433, 3.95124371858143, 3.97029191355212, 3.98898404656427, 4.00733318523247, 4.02535169073515, 4.04305126783455, 4.06044301054642, 4.07753744390572, 4.0943445622221, 4.11087386417331, 4.12713438504509, 4.14313472639153, 4.15888308335967, 4.17438726989564, 4.18965474202643, 4.20469261939097, 4.21950770517611, 4.23410650459726, 4.24849524204936, 4.26267987704132, 4.27666611901606, 4.29045944114839, 4.30406509320417, 4.31748811353631, 4.33073334028633, 4.34380542185368, 4.35670882668959, 4.36944785246702, 4.38202663467388, 4.39444915467244, 4.40671924726425, 4.4188406077966, 4.43081679884331, 4.44265125649032, 4.45434729625351, 4.46590811865458, 4.47733681447821, 4.48863636973214, 4.49980967033027, 4.51085950651685, 4.52178857704904, 4.53259949315326, 4.54329478227, 4.55387689160054, 4.56434819146784, 4.57471097850338, 4.58496747867057, 4.59511985013459, 4.60517018598809, 4.61512051684126, 4.62497281328427, 4.63472898822964, 4.64439089914137, 4.65396035015752, 4.66343909411207, 4.67282883446191, 4.68213122712422, 4.69134788222914, 4.70048036579242)), .Names = c('log(x)', 'log(z)'), row.names = c(NA, 100L), terms = quote(~log(x) + log(z))));unclass(argv[[1]]); $`log(x)` [1] 0.0000000 0.6931472 1.0986123 1.3862944 1.6094379 1.7917595 1.9459101 [8] 2.0794415 2.1972246 2.3025851 2.3978953 2.4849066 2.5649494 2.6390573 [15] 2.7080502 2.7725887 2.8332133 2.8903718 2.9444390 2.9957323 3.0445224 [22] 3.0910425 3.1354942 3.1780538 3.2188758 3.2580965 3.2958369 3.3322045 [29] 3.3672958 3.4011974 3.4339872 3.4657359 3.4965076 3.5263605 3.5553481 [36] 3.5835189 3.6109179 3.6375862 3.6635616 3.6888795 3.7135721 3.7376696 [43] 3.7612001 3.7841896 3.8066625 3.8286414 3.8501476 3.8712010 3.8918203 [50] 3.9120230 3.9318256 3.9512437 3.9702919 3.9889840 4.0073332 4.0253517 [57] 4.0430513 4.0604430 4.0775374 4.0943446 4.1108739 4.1271344 4.1431347 [64] 4.1588831 4.1743873 4.1896547 4.2046926 4.2195077 4.2341065 4.2484952 [71] 4.2626799 4.2766661 4.2904594 4.3040651 4.3174881 4.3307333 4.3438054 [78] 4.3567088 4.3694479 4.3820266 4.3944492 4.4067192 4.4188406 4.4308168 [85] 4.4426513 4.4543473 4.4659081 4.4773368 4.4886364 4.4998097 4.5108595 [92] 4.5217886 4.5325995 4.5432948 4.5538769 4.5643482 4.5747110 4.5849675 [99] 4.5951199 4.6051702 $`log(z)` [1] 2.397895 2.484907 2.564949 2.639057 2.708050 2.772589 2.833213 2.890372 [9] 2.944439 2.995732 3.044522 3.091042 3.135494 3.178054 3.218876 3.258097 [17] 3.295837 3.332205 3.367296 3.401197 3.433987 3.465736 3.496508 3.526361 [25] 3.555348 3.583519 3.610918 3.637586 3.663562 3.688879 3.713572 3.737670 [33] 3.761200 3.784190 3.806662 3.828641 3.850148 3.871201 3.891820 3.912023 [41] 3.931826 3.951244 3.970292 3.988984 4.007333 4.025352 4.043051 4.060443 [49] 4.077537 4.094345 4.110874 4.127134 4.143135 4.158883 4.174387 4.189655 [57] 4.204693 4.219508 4.234107 4.248495 4.262680 4.276666 4.290459 4.304065 [65] 4.317488 4.330733 4.343805 4.356709 4.369448 4.382027 4.394449 4.406719 [73] 4.418841 4.430817 4.442651 4.454347 4.465908 4.477337 4.488636 4.499810 [81] 4.510860 4.521789 4.532599 4.543295 4.553877 4.564348 4.574711 4.584967 [89] 4.595120 4.605170 4.615121 4.624973 4.634729 4.644391 4.653960 4.663439 [97] 4.672829 4.682131 4.691348 4.700480 attr(,"row.names") [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 [19] 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 [37] 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 [55] 55 56 57 58 59 60 61 62 63 64 65 66 67 68 69 70 71 72 [73] 73 74 75 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 [91] 91 92 93 94 95 96 97 98 99 100 attr(,"terms") ~log(x) + log(z) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass13# #argv <- list(structure(list(Df = c(NA, 0L), Deviance = c(NA, 0), `Resid. Df` = c(10L, 10L), `Resid. Dev` = c(2.74035772634541, 2.74035772634541)), .Names = c('Df', 'Deviance', 'Resid. Df', 'Resid. Dev'), row.names = c('NULL', 'x'), heading = 'Analysis of Deviance Table\n\nModel: gaussian, link: identity\n\nResponse: y\n\nTerms added sequentially (first to last)\n\n'));unclass(argv[[1]]); $Df [1] NA 0 $Deviance [1] NA 0 $`Resid. Df` [1] 10 10 $`Resid. Dev` [1] 2.740358 2.740358 attr(,"row.names") [1] "NULL" "x" attr(,"heading") [1] "Analysis of Deviance Table\n\nModel: gaussian, link: identity\n\nResponse: y\n\nTerms added sequentially (first to last)\n\n" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass14# #argv <- list(list(structure(list(title = 'foreign: Read Data Stored by Minitab, S, SAS, SPSS, Stata, Systat, dBase,\n...', author = structure(list(structure(list(given = 'R Core Team', family = NULL, role = c('aut', 'cph', 'cre'), email = 'R-core@R-project.org', comment = NULL), .Names = c('given', 'family', 'role', 'email', 'comment'))), class = 'person'), year = '2013', note = 'R package version 0.8-53', url = 'http://CRAN.R-project.org/package=foreign'), .Names = c('title', 'author', 'year', 'note', 'url'), bibtype = 'Manual', textVersion = 'R Core Team (2013). foreign: Read Data Stored by Minitab, S, SAS, SPSS, Stata, Systat, dBase,\n.... R package version 0.8-53. http://CRAN.R-project.org/package=foreign', header = 'To cite package ‘foreign’ in publications use:')));unclass(argv[[1]]); [[1]] [[1]]$title [1] "foreign: Read Data Stored by Minitab, S, SAS, SPSS, Stata, Systat, dBase,\n..." [[1]]$author [1] "R Core Team [aut, cph, cre]" [[1]]$year [1] "2013" [[1]]$note [1] "R package version 0.8-53" [[1]]$url [1] "http://CRAN.R-project.org/package=foreign" attr(,"bibtype") [1] "Manual" attr(,"textVersion") [1] "R Core Team (2013). foreign: Read Data Stored by Minitab, S, SAS, SPSS, Stata, Systat, dBase,\n.... R package version 0.8-53. http://CRAN.R-project.org/package=foreign" attr(,"header") [1] "To cite package ‘foreign’ in publications use:" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass15# #argv <- list(structure(c(8.79236, 8.79137, 8.81486, 8.81301, 8.90751, 8.93673, 8.96161, 8.96044, 9.00868, 9.03049, 9.06906, 9.05871, 9.10698, 9.12685, 9.17096, 9.18665, 9.23823, 9.26487, 9.28436, 9.31378, 9.35025, 9.35835, 9.39767, 9.4215, 9.44223, 9.48721, 9.52374, 9.5398, 9.58123, 9.60048, 9.64496, 9.6439, 9.69405, 9.69958, 9.68683, 9.71774, 9.74924, 9.77536, 9.79424), .Tsp = c(1962.25, 1971.75, 4)));unclass(argv[[1]]); [1] 8.79236 8.79137 8.81486 8.81301 8.90751 8.93673 8.96161 8.96044 9.00868 [10] 9.03049 9.06906 9.05871 9.10698 9.12685 9.17096 9.18665 9.23823 9.26487 [19] 9.28436 9.31378 9.35025 9.35835 9.39767 9.42150 9.44223 9.48721 9.52374 [28] 9.53980 9.58123 9.60048 9.64496 9.64390 9.69405 9.69958 9.68683 9.71774 [37] 9.74924 9.77536 9.79424 attr(,"tsp") [1] 1962.25 1971.75 4.00 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass16# #argv <- list(structure(list(structure(9L, members = 1L, height = 0, label = 9L, leaf = TRUE, value = 2L), structure(list(structure(10L, label = 10L, members = 1L, height = 0, leaf = TRUE, value = 1L), structure(1L, label = 1L, members = 1L, height = 0, leaf = TRUE, value = 10L)), members = 2L, midpoint = 0.5, height = 0.114813676452255, value = 5.5)), members = 3L, midpoint = 0.75, height = 0.241190881793568, value = 3.75));unclass(argv[[1]]); [[1]] [1] 9 attr(,"members") [1] 1 attr(,"height") [1] 0 attr(,"label") [1] 9 attr(,"leaf") [1] TRUE attr(,"value") [1] 2 [[2]] [[2]][[1]] [1] 10 attr(,"label") [1] 10 attr(,"members") [1] 1 attr(,"height") [1] 0 attr(,"leaf") [1] TRUE attr(,"value") [1] 1 [[2]][[2]] [1] 1 attr(,"label") [1] 1 attr(,"members") [1] 1 attr(,"height") [1] 0 attr(,"leaf") [1] TRUE attr(,"value") [1] 10 attr(,"members") [1] 2 attr(,"midpoint") [1] 0.5 attr(,"height") [1] 0.1148137 attr(,"value") [1] 5.5 attr(,"members") [1] 3 attr(,"midpoint") [1] 0.75 attr(,"height") [1] 0.2411909 attr(,"value") [1] 3.75 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass17# #argv <- list(c(-1.6, -0.9));unclass(argv[[1]]); [1] -1.6 -0.9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass18# #argv <- list(structure(list(srcfile = c('/home/lzhao/hg/r-instrumented/library/base/R/base', '/home/lzhao/hg/r-instrumented/library/base/R/base'), frow = 5852:5853, lrow = c(5852L, 5854L)), .Names = c('srcfile', 'frow', 'lrow'), row.names = 1:2));unclass(argv[[1]]); $srcfile [1] "/home/lzhao/hg/r-instrumented/library/base/R/base" [2] "/home/lzhao/hg/r-instrumented/library/base/R/base" $frow [1] 5852 5853 $lrow [1] 5852 5854 attr(,"row.names") [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass19# #argv <- list(structure(list(b = structure(c(3L, 1L, 2L), .Label = c('A', 'B', 'C'), class = 'factor'), a = structure(c(1386423981.90268, 1386403981.90268, 1386413981.90268), class = c('POSIXct', 'POSIXt'))), .Names = c('b', 'a'), row.names = c(3L, 1L, 2L)));unclass(argv[[1]]); $b [1] C A B Levels: A B C $a [1] "2013-12-07 13:46:21 GMT" "2013-12-07 08:13:01 GMT" [3] "2013-12-07 10:59:41 GMT" attr(,"row.names") [1] 3 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass2#Output.IgnoreWhitespace# #argv <- list(structure(list(Employed = c(60.323, 61.122, 60.171, 61.187, 63.221, 63.639, 64.989, 63.761, 66.019, 67.857, 68.169, 66.513, 68.655, 69.564, 69.331, 70.551), GNP.deflator = c(83, 88.5, 88.2, 89.5, 96.2, 98.1, 99, 100, 101.2, 104.6, 108.4, 110.8, 112.6, 114.2, 115.7, 116.9), GNP = c(234.289, 259.426, 258.054, 284.599, 328.975, 346.999, 365.385, 363.112, 397.469, 419.18, 442.769, 444.546, 482.704, 502.601, 518.173, 554.894), Unemployed = c(235.6, 232.5, 368.2, 335.1, 209.9, 193.2, 187, 357.8, 290.4, 282.2, 293.6, 468.1, 381.3, 393.1, 480.6, 400.7), Armed.Forces = c(159, 145.6, 161.6, 165, 309.9, 359.4, 354.7, 335, 304.8, 285.7, 279.8, 263.7, 255.2, 251.4, 257.2, 282.7), Population = c(107.608, 108.632, 109.773, 110.929, 112.075, 113.27, 115.094, 116.219, 117.388, 118.734, 120.445, 121.95, 123.366, 125.368, 127.852, 130.081), Year = 1947:1962), .Names = c('Employed', 'GNP.deflator', 'GNP', 'Unemployed', 'Armed.Forces', 'Population', 'Year'), terms = quote(Employed ~ GNP.deflator + GNP + Unemployed + Armed.Forces + Population + Year), row.names = 1947:1962));unclass(argv[[1]]); $Employed [1] 60.323 61.122 60.171 61.187 63.221 63.639 64.989 63.761 66.019 67.857 [11] 68.169 66.513 68.655 69.564 69.331 70.551 $GNP.deflator [1] 83.0 88.5 88.2 89.5 96.2 98.1 99.0 100.0 101.2 104.6 108.4 110.8 [13] 112.6 114.2 115.7 116.9 $GNP [1] 234.289 259.426 258.054 284.599 328.975 346.999 365.385 363.112 397.469 [10] 419.180 442.769 444.546 482.704 502.601 518.173 554.894 $Unemployed [1] 235.6 232.5 368.2 335.1 209.9 193.2 187.0 357.8 290.4 282.2 293.6 468.1 [13] 381.3 393.1 480.6 400.7 $Armed.Forces [1] 159.0 145.6 161.6 165.0 309.9 359.4 354.7 335.0 304.8 285.7 279.8 263.7 [13] 255.2 251.4 257.2 282.7 $Population [1] 107.608 108.632 109.773 110.929 112.075 113.270 115.094 116.219 117.388 [10] 118.734 120.445 121.950 123.366 125.368 127.852 130.081 $Year [1] 1947 1948 1949 1950 1951 1952 1953 1954 1955 1956 1957 1958 1959 1960 1961 [16] 1962 attr(,"terms") Employed ~ GNP.deflator + GNP + Unemployed + Armed.Forces + Population + Year attr(,"row.names") [1] 1947 1948 1949 1950 1951 1952 1953 1954 1955 1956 1957 1958 1959 1960 1961 [16] 1962 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass20# #argv <- list(c(-2.20207097779183e-13, -2.19098062290287e-13, -2.17989026801391e-13, -2.16879991312495e-13, -2.15770955823599e-13, -2.14661920334703e-13, -2.13552884845807e-13, -2.12443849356911e-13, -2.11334813868015e-13, -2.10225778379119e-13, -2.09116742890223e-13, -2.08007707401327e-13, -2.06898671912432e-13, -2.05789636423536e-13, -2.0468060093464e-13, -2.03571565445744e-13, -2.02462529956848e-13, -2.01353494467952e-13, -2.00244458979056e-13, -1.9913542349016e-13, -1.98026388001264e-13, -1.96917352512368e-13, -1.95808317023472e-13, -1.94699281534576e-13, -1.93590246045681e-13, -1.92481210556785e-13, -1.91372175067889e-13, -1.90263139578993e-13, -1.89154104090097e-13, -1.88045068601201e-13, -1.86936033112305e-13, -1.85826997623409e-13, -1.84717962134513e-13, -1.83608926645617e-13, -1.82499891156721e-13, -1.81390855667826e-13, -1.8028182017893e-13, -1.79172784690034e-13, -1.78063749201138e-13, -1.76954713712242e-13, -1.75845678223346e-13, -1.7473664273445e-13, -1.73627607245554e-13, -1.72518571756658e-13, -1.71409536267762e-13, -1.70300500778866e-13, -1.6919146528997e-13, -1.68082429801075e-13, -1.66973394312179e-13, -1.65864358823283e-13, -1.64755323334387e-13, -1.63646287845491e-13, -1.62537252356595e-13, -1.61428216867699e-13, -1.60319181378803e-13, -1.59210145889907e-13, -1.58101110401011e-13, -1.56992074912115e-13, -1.5588303942322e-13, -1.54774003934324e-13, -1.53664968445428e-13, -1.52555932956532e-13, -1.51446897467636e-13, -1.5033786197874e-13, -1.49228826489844e-13, -1.48119791000948e-13, -1.47010755512052e-13, -1.45901720023156e-13, -1.4479268453426e-13, -1.43683649045365e-13, -1.42574613556469e-13, -1.41465578067573e-13, -1.40356542578677e-13, -1.39247507089781e-13, -1.38138471600885e-13, -1.37029436111989e-13, -1.35920400623093e-13, -1.34811365134197e-13, -1.33702329645301e-13, -1.32593294156405e-13, -1.3148425866751e-13, -1.30375223178614e-13, -1.29266187689718e-13, -1.28157152200822e-13, -1.27048116711926e-13, -1.2593908122303e-13, -1.24830045734134e-13, -1.23721010245238e-13, -1.22611974756342e-13, -1.21502939267446e-13, -1.2039390377855e-13, -1.19284868289654e-13, -1.18175832800759e-13, -1.17066797311863e-13, -1.15957761822967e-13, -1.14848726334071e-13, -1.13739690845175e-13, -1.12630655356279e-13, -1.11521619867383e-13, -1.10412584378487e-13, -1.09303548889591e-13, -1.08194513400695e-13, -1.07085477911799e-13, -1.05976442422904e-13, -1.04867406934008e-13, -1.03758371445112e-13, -1.02649335956216e-13, -1.0154030046732e-13, -1.00431264978424e-13, -9.9322229489528e-14, -9.82131940006321e-14, -9.71041585117362e-14, -9.59951230228403e-14, -9.48860875339444e-14, -9.37770520450484e-14, -9.26680165561525e-14, -9.15589810672566e-14, -9.04499455783607e-14, -8.93409100894648e-14, -8.82318746005689e-14, -8.7122839111673e-14, -8.60138036227771e-14, -8.49047681338812e-14, -8.37957326449853e-14, -8.26866971560894e-14, -8.15776616671935e-14, -8.04686261782975e-14, -7.93595906894016e-14, -7.82505552005057e-14, -7.71415197116098e-14, -7.60324842227139e-14, -7.49234487338179e-14, -7.3814413244922e-14, -7.27053777560261e-14, -7.15963422671302e-14, -7.04873067782343e-14, -6.93782712893384e-14, -6.82692358004425e-14, -6.71602003115466e-14, -6.60511648226507e-14, -6.49421293337547e-14, -6.38330938448588e-14, -6.27240583559629e-14, -6.1615022867067e-14, -6.05059873781711e-14, -5.93969518892752e-14, -5.82879164003793e-14, -5.71788809114834e-14, -5.60698454225874e-14, -5.49608099336915e-14, -5.38517744447956e-14, -5.27427389558997e-14, -5.16337034670038e-14, -5.05246679781079e-14, -4.9415632489212e-14, -4.83065970003161e-14, -4.71975615114202e-14, -4.60885260225244e-14, -4.49794905336287e-14, -4.38704550447331e-14, -4.27614195558379e-14, -4.16523840669435e-14, -4.05433485780505e-14, -3.94343130891604e-14, -3.83252776002761e-14, -3.72162421114035e-14, -3.61072066225542e-14, -3.49981711337514e-14, -3.38891356450417e-14, -3.27801001565183e-14, -3.16710646683675e-14, -3.05620291809617e-14, -2.9452993695046e-14, -2.83439582121106e-14, -2.72349227351356e-14, -2.61258872700815e-14, -2.50168518288693e-14, -2.39078164353409e-14, -2.27987811371798e-14, -2.16897460297536e-14, -2.05807113037972e-14, -1.94716773407802e-14, -1.83626449036421e-14, -1.72536155182618e-14, -1.61445922363971e-14, -1.50355811615637e-14, -1.39265945007928e-14, -1.28176566681469e-14, -1.1708816491751e-14, -1.0600171627855e-14, -9.49191738895913e-15));unclass(argv[[1]]); [1] -2.202071e-13 -2.190981e-13 -2.179890e-13 -2.168800e-13 -2.157710e-13 [6] -2.146619e-13 -2.135529e-13 -2.124438e-13 -2.113348e-13 -2.102258e-13 [11] -2.091167e-13 -2.080077e-13 -2.068987e-13 -2.057896e-13 -2.046806e-13 [16] -2.035716e-13 -2.024625e-13 -2.013535e-13 -2.002445e-13 -1.991354e-13 [21] -1.980264e-13 -1.969174e-13 -1.958083e-13 -1.946993e-13 -1.935902e-13 [26] -1.924812e-13 -1.913722e-13 -1.902631e-13 -1.891541e-13 -1.880451e-13 [31] -1.869360e-13 -1.858270e-13 -1.847180e-13 -1.836089e-13 -1.824999e-13 [36] -1.813909e-13 -1.802818e-13 -1.791728e-13 -1.780637e-13 -1.769547e-13 [41] -1.758457e-13 -1.747366e-13 -1.736276e-13 -1.725186e-13 -1.714095e-13 [46] -1.703005e-13 -1.691915e-13 -1.680824e-13 -1.669734e-13 -1.658644e-13 [51] -1.647553e-13 -1.636463e-13 -1.625373e-13 -1.614282e-13 -1.603192e-13 [56] -1.592101e-13 -1.581011e-13 -1.569921e-13 -1.558830e-13 -1.547740e-13 [61] -1.536650e-13 -1.525559e-13 -1.514469e-13 -1.503379e-13 -1.492288e-13 [66] -1.481198e-13 -1.470108e-13 -1.459017e-13 -1.447927e-13 -1.436836e-13 [71] -1.425746e-13 -1.414656e-13 -1.403565e-13 -1.392475e-13 -1.381385e-13 [76] -1.370294e-13 -1.359204e-13 -1.348114e-13 -1.337023e-13 -1.325933e-13 [81] -1.314843e-13 -1.303752e-13 -1.292662e-13 -1.281572e-13 -1.270481e-13 [86] -1.259391e-13 -1.248300e-13 -1.237210e-13 -1.226120e-13 -1.215029e-13 [91] -1.203939e-13 -1.192849e-13 -1.181758e-13 -1.170668e-13 -1.159578e-13 [96] -1.148487e-13 -1.137397e-13 -1.126307e-13 -1.115216e-13 -1.104126e-13 [101] -1.093035e-13 -1.081945e-13 -1.070855e-13 -1.059764e-13 -1.048674e-13 [106] -1.037584e-13 -1.026493e-13 -1.015403e-13 -1.004313e-13 -9.932223e-14 [111] -9.821319e-14 -9.710416e-14 -9.599512e-14 -9.488609e-14 -9.377705e-14 [116] -9.266802e-14 -9.155898e-14 -9.044995e-14 -8.934091e-14 -8.823187e-14 [121] -8.712284e-14 -8.601380e-14 -8.490477e-14 -8.379573e-14 -8.268670e-14 [126] -8.157766e-14 -8.046863e-14 -7.935959e-14 -7.825056e-14 -7.714152e-14 [131] -7.603248e-14 -7.492345e-14 -7.381441e-14 -7.270538e-14 -7.159634e-14 [136] -7.048731e-14 -6.937827e-14 -6.826924e-14 -6.716020e-14 -6.605116e-14 [141] -6.494213e-14 -6.383309e-14 -6.272406e-14 -6.161502e-14 -6.050599e-14 [146] -5.939695e-14 -5.828792e-14 -5.717888e-14 -5.606985e-14 -5.496081e-14 [151] -5.385177e-14 -5.274274e-14 -5.163370e-14 -5.052467e-14 -4.941563e-14 [156] -4.830660e-14 -4.719756e-14 -4.608853e-14 -4.497949e-14 -4.387046e-14 [161] -4.276142e-14 -4.165238e-14 -4.054335e-14 -3.943431e-14 -3.832528e-14 [166] -3.721624e-14 -3.610721e-14 -3.499817e-14 -3.388914e-14 -3.278010e-14 [171] -3.167106e-14 -3.056203e-14 -2.945299e-14 -2.834396e-14 -2.723492e-14 [176] -2.612589e-14 -2.501685e-14 -2.390782e-14 -2.279878e-14 -2.168975e-14 [181] -2.058071e-14 -1.947168e-14 -1.836264e-14 -1.725362e-14 -1.614459e-14 [186] -1.503558e-14 -1.392659e-14 -1.281766e-14 -1.170882e-14 -1.060017e-14 [191] -9.491917e-15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass21# #argv <- list(structure(c(325, 285, 706, 885), .Dim = c(1L, 4L), row.vars = structure(list(), .Names = character(0)), col.vars = structure(list(Class = c('1st', '2nd', '3rd', 'Crew')), .Names = 'Class')));unclass(argv[[1]]); [,1] [,2] [,3] [,4] [1,] 325 285 706 885 attr(,"row.vars") named list() attr(,"col.vars") attr(,"col.vars")$Class [1] "1st" "2nd" "3rd" "Crew" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass22# #argv <- list(c(10000, 20000, 30000, 40000, 50000, 60000, 70000, 80000, 90000, 1e+05, 110000, 120000, 130000, 140000, 150000, 160000, 170000, 180000, 190000, 2e+05, 210000, 220000, 230000, 240000, 250000, 260000, 270000, 280000, 290000, 3e+05, 310000, 320000, 330000, 340000, 350000, 360000, 370000, 380000, 390000, 4e+05, 410000, 420000, 430000, 440000, 450000, 460000, 470000, 480000, 490000, 5e+05, 510000, 520000, 530000, 540000, 550000, 560000, 570000, 580000, 590000, 6e+05, 610000, 620000, 630000, 640000, 650000, 660000, 670000, 680000, 690000, 7e+05, 710000, 720000, 730000, 740000, 750000, 760000, 770000, 780000, 790000, 8e+05, 810000, 820000, 830000, 840000, 850000, 860000, 870000, 880000, 890000, 9e+05, 910000, 920000, 930000, 940000, 950000, 960000, 970000, 980000, 990000, 1e+06));unclass(argv[[1]]); [1] 10000 20000 30000 40000 50000 60000 70000 80000 90000 [10] 100000 110000 120000 130000 140000 150000 160000 170000 180000 [19] 190000 200000 210000 220000 230000 240000 250000 260000 270000 [28] 280000 290000 300000 310000 320000 330000 340000 350000 360000 [37] 370000 380000 390000 400000 410000 420000 430000 440000 450000 [46] 460000 470000 480000 490000 500000 510000 520000 530000 540000 [55] 550000 560000 570000 580000 590000 600000 610000 620000 630000 [64] 640000 650000 660000 670000 680000 690000 700000 710000 720000 [73] 730000 740000 750000 760000 770000 780000 790000 800000 810000 [82] 820000 830000 840000 850000 860000 870000 880000 890000 900000 [91] 910000 920000 930000 940000 950000 960000 970000 980000 990000 [100] 1000000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass23# #argv <- list(quote(y ~ a + b:c + d + e + e:d));unclass(argv[[1]]); y ~ a + b:c + d + e + e:d ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass24# #argv <- list(structure(c('Min. :14.00 ', '1st Qu.:26.00 ', 'Median :29.50 ', 'Mean :36.39 ', '3rd Qu.:49.25 ', 'Max. :70.00 ', 'A:9 ', 'B:9 ', NA, NA, NA, NA), .Dim = c(6L, 2L), .Dimnames = list(c('', '', '', '', '', ''), c(' breaks', 'wool'))));unclass(argv[[1]]); breaks wool "Min. :14.00 " "A:9 " "1st Qu.:26.00 " "B:9 " "Median :29.50 " NA "Mean :36.39 " NA "3rd Qu.:49.25 " NA "Max. :70.00 " NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass25#Ignored.ReferenceError# #argv <- list(structure(list(srcfile = '/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/negbin.R', frow = 135L, lrow = 137L), .Names = c('srcfile', 'frow', 'lrow'), row.names = c(NA, -1L)));unclass(argv[[1]]); $srcfile [1] "/home/lzhao/tmp/RtmpYl9n1I/R.INSTALL2aa24b6697e5/MASS/R/negbin.R" $frow [1] 135 $lrow [1] 137 attr(,"row.names") [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass26# #argv <- list(structure(list(a = 1), .Dim = 1L, .Dimnames = list('a')));unclass(argv[[1]]); $a [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass27# #argv <- list(list(structure(list(label = 'FALSE', x = structure(0, unit = 'npc', valid.unit = 0L, class = 'r_unit'), y = structure(0.5, unit = 'npc', valid.unit = 0L, class = 'r_unit'), just = c('left', 'centre'), hjust = NULL, vjust = NULL, rot = 0, check.overlap = FALSE, name = 'GRID.text.106', gp = structure(list(), class = 'r_gpar'), vp = NULL), .Names = c('label', 'x', 'y', 'just', 'hjust', 'vjust', 'rot', 'check.overlap', 'name', 'gp', 'vp'), class = c('r_text', 'r_grob', 'r_gDesc'))));unclass(argv[[1]]); [[1]] $label [1] "FALSE" $x [1] 0 attr(,"unit") [1] "npc" attr(,"valid.unit") [1] 0 attr(,"class") [1] "r_unit" $y [1] 0.5 attr(,"unit") [1] "npc" attr(,"valid.unit") [1] 0 attr(,"class") [1] "r_unit" $just [1] "left" "centre" $hjust NULL $vjust NULL $rot [1] 0 $check.overlap [1] FALSE $name [1] "GRID.text.106" $gp list() attr(,"class") [1] "r_gpar" $vp NULL attr(,"class") [1] "r_text" "r_grob" "r_gDesc" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass28# #argv <- list(structure(c('0', 'list', 'list'), .Names = c('Length', 'Class', 'Mode')));unclass(argv[[1]]); Length Class Mode "0" "list" "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass29# #argv <- list(structure(list(surname = structure('R Core', class = 'AsIs'), nationality = structure(NA_integer_, .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(NA_integer_, .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = 7L));unclass(argv[[1]]); $surname [1] "R Core" $nationality [1] Levels: Australia UK US $deceased [1] Levels: no yes attr(,"row.names") [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass3#Ignored.ReferenceError# #argv <- list(structure(list(x = c(TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE)), .Names = 'x', row.names = c(NA, 10L)));unclass(argv[[1]]); $x [1] TRUE FALSE TRUE FALSE TRUE FALSE TRUE FALSE TRUE FALSE attr(,"row.names") [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass31#Ignored.ReferenceError# #argv <- list(structure(list(), .Names = character(0), row.names = c(NA, -10L), terms = quote(~0)));unclass(argv[[1]]); named list() attr(,"row.names") [1] 1 2 3 4 5 6 7 8 9 10 attr(,"terms") ~0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass32# #argv <- list(quote(breaks ~ (wool + tension)^2));unclass(argv[[1]]); breaks ~ (wool + tension)^2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass33# #argv <- list(structure(c(1L, 2L, 1L), .Dim = 3L, .Dimnames = structure(list(c('1', '2', NA)), .Names = '')));unclass(argv[[1]]); 1 2 1 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass34#Ignored.ReferenceError# #argv <- list(structure(list(`cbind(A, B, C, D)` = structure(c(0.696706709347165, 0.362357754476673, -0.0291995223012888, 0.696706709347165, 0.696706709347165, -0.0291995223012888, 0.696706709347165, -0.0291995223012888, 0.362357754476673, 0.696706709347165, -0.0291995223012888, 0.362357754476673, -0.416146836547142, 0.362357754476673, 0.696706709347165, 0.696706709347165, 0.362357754476673, -0.416146836547142, -0.0291995223012888, -0.416146836547142, 0.696706709347165, -0.416146836547142, 0.362357754476673, -0.0291995223012888, 0.717356090899523, 0.932039085967226, 0.999573603041505, 0.717356090899523, 0.717356090899523, 0.999573603041505, 0.717356090899523, 0.999573603041505, 0.932039085967226, 0.717356090899523, 0.999573603041505, 0.932039085967226, 0.909297426825682, 0.932039085967226, 0.717356090899523, 0.717356090899523, 0.932039085967226, 0.909297426825682, 0.999573603041505, 0.909297426825682, 0.717356090899523, 0.909297426825682, 0.932039085967226, 0.999573603041505, -0.0291995223012888, -0.737393715541246, -0.998294775794753, -0.0291995223012888, -0.0291995223012888, -0.998294775794753, -0.0291995223012888, -0.998294775794753, -0.737393715541246, -0.0291995223012888, -0.998294775794753, -0.737393715541246, -0.653643620863612, -0.737393715541246, -0.0291995223012888, -0.0291995223012888, -0.737393715541246, -0.653643620863612, -0.998294775794753, -0.653643620863612, -0.0291995223012888, -0.653643620863612, -0.737393715541246, -0.998294775794753, 0.999573603041505, 0.67546318055115, -0.0583741434275801, 0.999573603041505, 0.999573603041505, -0.0583741434275801, 0.999573603041505, -0.0583741434275801, 0.67546318055115, 0.999573603041505, -0.0583741434275801, 0.67546318055115, -0.756802495307928, 0.67546318055115, 0.999573603041505, 0.999573603041505, 0.67546318055115, -0.756802495307928, -0.0583741434275801, -0.756802495307928, 0.999573603041505, -0.756802495307928, 0.67546318055115, -0.0583741434275801), .Dim = c(24L, 4L), .Dimnames = list(NULL, c('A', 'B', 'C', 'D'))), groups = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c('1', '2', '3'), class = 'factor')), .Names = c('cbind(A, B, C, D)', 'groups'), terms = quote(cbind(A, B, C, D) ~ groups), row.names = c(NA, 24L)));unclass(argv[[1]]); $`cbind(A, B, C, D)` A B C D [1,] 0.69670671 0.7173561 -0.02919952 0.99957360 [2,] 0.36235775 0.9320391 -0.73739372 0.67546318 [3,] -0.02919952 0.9995736 -0.99829478 -0.05837414 [4,] 0.69670671 0.7173561 -0.02919952 0.99957360 [5,] 0.69670671 0.7173561 -0.02919952 0.99957360 [6,] -0.02919952 0.9995736 -0.99829478 -0.05837414 [7,] 0.69670671 0.7173561 -0.02919952 0.99957360 [8,] -0.02919952 0.9995736 -0.99829478 -0.05837414 [9,] 0.36235775 0.9320391 -0.73739372 0.67546318 [10,] 0.69670671 0.7173561 -0.02919952 0.99957360 [11,] -0.02919952 0.9995736 -0.99829478 -0.05837414 [12,] 0.36235775 0.9320391 -0.73739372 0.67546318 [13,] -0.41614684 0.9092974 -0.65364362 -0.75680250 [14,] 0.36235775 0.9320391 -0.73739372 0.67546318 [15,] 0.69670671 0.7173561 -0.02919952 0.99957360 [16,] 0.69670671 0.7173561 -0.02919952 0.99957360 [17,] 0.36235775 0.9320391 -0.73739372 0.67546318 [18,] -0.41614684 0.9092974 -0.65364362 -0.75680250 [19,] -0.02919952 0.9995736 -0.99829478 -0.05837414 [20,] -0.41614684 0.9092974 -0.65364362 -0.75680250 [21,] 0.69670671 0.7173561 -0.02919952 0.99957360 [22,] -0.41614684 0.9092974 -0.65364362 -0.75680250 [23,] 0.36235775 0.9320391 -0.73739372 0.67546318 [24,] -0.02919952 0.9995736 -0.99829478 -0.05837414 $groups [1] 1 1 1 1 1 1 1 1 2 2 2 2 2 2 2 2 3 3 3 3 3 3 3 3 Levels: 1 2 3 attr(,"terms") cbind(A, B, C, D) ~ groups attr(,"row.names") [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass35# #argv <- list(structure(list(group = structure(c(1L, 1L), .Label = c('Ctl', 'Trt'), class = 'factor')), .Names = 'group', row.names = 1:2, terms = quote(~group)));unclass(argv[[1]]); $group [1] Ctl Ctl Levels: Ctl Trt attr(,"row.names") [1] 1 2 attr(,"terms") ~group ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass36# #argv <- list(structure(c(2671, 6.026e+77, 3.161e+152, 3.501e+299, 2.409e+227, 1.529e+302), .Names = c('Min.', '1st Qu.', 'Median', 'Mean', '3rd Qu.', 'Max.')));unclass(argv[[1]]); Min. 1st Qu. Median Mean 3rd Qu. Max. 2.671e+03 6.026e+77 3.161e+152 3.501e+299 2.409e+227 1.529e+302 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass4#Ignored.ReferenceError# #argv <- list(structure(list(X1.10 = 1:10, z = structure(list(x = 1:10, yyy = 11:20), .Names = c('x', 'yyy'), row.names = c(NA, -10L), class = 'data.frame')), .Names = c('X1.10', 'z'), row.names = c(NA, -10L)));unclass(argv[[1]]); $X1.10 [1] 1 2 3 4 5 6 7 8 9 10 $z x yyy 1 1 11 2 2 12 3 3 13 4 4 14 5 5 15 6 6 16 7 7 17 8 8 18 9 9 19 10 10 20 attr(,"row.names") [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass5# #argv <- list(structure(list(Df = c(1, 1, 1, NA, 1), `Sum of Sq` = c(0.109090049888117, 0.246974722154086, 2.97247824113524, NA, 25.9509113775335), RSS = c(47.9727294003871, 48.1106140726531, 50.8361175916342, 47.863639350499, 73.8145507280325), AIC = c(24.9738836085411, 25.0111950072736, 25.7275503692601, 26.9442879283302, 30.5758847476115)), .Names = c('Df', 'Sum of Sq', 'RSS', 'AIC'), row.names = c('- x3', '- x4', '- x2', '', '- x1')));unclass(argv[[1]]); $Df [1] 1 1 1 NA 1 $`Sum of Sq` [1] 0.1090900 0.2469747 2.9724782 NA 25.9509114 $RSS [1] 47.97273 48.11061 50.83612 47.86364 73.81455 $AIC [1] 24.97388 25.01120 25.72755 26.94429 30.57588 attr(,"row.names") [1] "- x3" "- x4" "- x2" "" "- x1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass6# #argv <- list(structure(list(surname = structure(2L, .Label = c('McNeil', 'R Core', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'), nationality = structure(NA_integer_, .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(NA_integer_, .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = 7L));unclass(argv[[1]]); $surname [1] R Core Levels: McNeil R Core Ripley Tierney Tukey Venables $nationality [1] Levels: Australia UK US $deceased [1] Levels: no yes attr(,"row.names") [1] 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass7# #argv <- list(structure(list(A = c(1L, NA, 1L), B = c(1.1, NA, 2), C = c(1.1+0i, NA, 3+0i), D = c(NA, NA, NA), E = c(FALSE, NA, TRUE), F = structure(c(1L, NA, 2L), .Label = c('abc', 'def'), class = 'factor')), .Names = c('A', 'B', 'C', 'D', 'E', 'F'), row.names = c('1', '2', '3')));unclass(argv[[1]]); $A [1] 1 NA 1 $B [1] 1.1 NA 2.0 $C [1] 1.1+0i NA 3.0+0i $D [1] NA NA NA $E [1] FALSE NA TRUE $F [1] abc def Levels: abc def attr(,"row.names") [1] "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass8#Ignored.ReferenceError# #argv <- list(structure(list(`cbind(w = weight, w2 = weight^2)` = structure(c(4.17, 5.58, 5.18, 6.11, 4.5, 4.61, 5.17, 4.53, 5.33, 5.14, 4.81, 4.17, 4.41, 3.59, 5.87, 3.83, 6.03, 4.89, 4.32, 4.69, 17.3889, 31.1364, 26.8324, 37.3321, 20.25, 21.2521, 26.7289, 20.5209, 28.4089, 26.4196, 23.1361, 17.3889, 19.4481, 12.8881, 34.4569, 14.6689, 36.3609, 23.9121, 18.6624, 21.9961), .Dim = c(20L, 2L), .Dimnames = list(NULL, c('w', 'w2'))), group = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L), .Label = c('Ctl', 'Trt'), class = 'factor')), .Names = c('cbind(w = weight, w2 = weight^2)', 'group'), terms = quote(cbind(w = weight, w2 = weight^2) ~ group), row.names = c(NA, 20L)));unclass(argv[[1]]); $`cbind(w = weight, w2 = weight^2)` w w2 [1,] 4.17 17.3889 [2,] 5.58 31.1364 [3,] 5.18 26.8324 [4,] 6.11 37.3321 [5,] 4.50 20.2500 [6,] 4.61 21.2521 [7,] 5.17 26.7289 [8,] 4.53 20.5209 [9,] 5.33 28.4089 [10,] 5.14 26.4196 [11,] 4.81 23.1361 [12,] 4.17 17.3889 [13,] 4.41 19.4481 [14,] 3.59 12.8881 [15,] 5.87 34.4569 [16,] 3.83 14.6689 [17,] 6.03 36.3609 [18,] 4.89 23.9121 [19,] 4.32 18.6624 [20,] 4.69 21.9961 $group [1] Ctl Ctl Ctl Ctl Ctl Ctl Ctl Ctl Ctl Ctl Trt Trt Trt Trt Trt Trt Trt Trt Trt [20] Trt Levels: Ctl Trt attr(,"terms") cbind(w = weight, w2 = weight^2) ~ group attr(,"row.names") [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unclass.testunclass9# #argv <- list(structure(c('Min. : 1.00 ', '1st Qu.: 3.25 ', 'Median : 5.50 ', 'Mean : 5.50 ', '3rd Qu.: 7.75 ', 'Max. :10.00 ', 'Min. : 1.00 Min. :11.00 ', '1st Qu.: 3.25 1st Qu.:13.25 ', 'Median : 5.50 Median :15.50 ', 'Mean : 5.50 Mean :15.50 ', '3rd Qu.: 7.75 3rd Qu.:17.75 ', 'Max. :10.00 Max. :20.00 '), .Dim = c(6L, 2L), .Dimnames = list(c('', '', '', '', '', ''), c(' X1.10', ' z.x z.yyy '))));unclass(argv[[1]]); X1.10 z.x z.yyy "Min. : 1.00 " "Min. : 1.00 Min. :11.00 " "1st Qu.: 3.25 " "1st Qu.: 3.25 1st Qu.:13.25 " "Median : 5.50 " "Median : 5.50 Median :15.50 " "Mean : 5.50 " "Mean : 5.50 Mean :15.50 " "3rd Qu.: 7.75 " "3rd Qu.: 7.75 3rd Qu.:17.75 " "Max. :10.00 " "Max. :10.00 Max. :20.00 " ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testUnique# #unique(c(1+1i, NA, NA)) [1] 1+1i NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testUnique# #unique(c(1, NA, NA)) [1] 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testUnique# #unique(list(list(1), 1, 1L)) [[1]] [[1]][[1]] [1] 1 [[2]] [1] 1 [[3]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testUnique# #{ unique(c(-0.0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1)) } [1] 0 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testUnique#Ignored.ReferenceError# #{ unique(c(1,2,1), incomparables=function() 42) } Error in unique.default(c(1, 2, 1), incomparables = function() 42) : cannot coerce type 'closure' to vector of type 'double' ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testUnique# #{ x<-function() 42; unique(x) } Error in unique.default(x) : unique() applies only to vectors ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testUnique# #{ x<-quote(f(7, 42)); unique(x) } Error in unique.default(x) : unique() applies only to vectors ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testUnique# #{x<-factor(c("a", "b", "a")); unique(x) } [1] a b Levels: a b ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique1# #argv <- list(character(0), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) character(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique10# #argv <- list(c(1L, 2L, 2L, 2L, 1L, 1L, 2L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 1L, 1L, 2L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 1L, 2L, 1L, 2L, 2L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 1L, 2L, 1L, 1L, 1L, 1L, 2L, 1L, 2L, 2L, 1L, 1L, 2L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 1L, 2L, 2L, 2L, 1L, 1L, 2L, 1L, 1L, 2L), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique11#Ignored.ImplementationError# #argv <- list(structure(c(20.65, NA, NA, 40.25, 61.9, 55.27, 58.13, 54.04, 21.15, 18.32, NA, 65.84, 58.77, 53.99, 63.37, 64.81, 47.11, 9.65, 67.1, 48.83, 57.92, 69.5, 73.95, 5.46, 49.92, 54.21, 61.38, 56.66, 60.14, 56.68, NA, 53.13, 39.7, 74.83, 59.73, NA, 67.06, 67.99, 60.6, 4.63, 71.09, 43.4, 21.9, 61.45, 77.98, 36.67, 69.95, 55.26, 63.24, NA), .Names = c('Alabama', 'Alaska', 'Arizona', 'Arkansas', 'California', 'Colorado', 'Connecticut', 'Delaware', 'Florida', 'Georgia', 'Hawaii', 'Idaho', 'Illinois', 'Indiana', 'Iowa', 'Kansas', 'Kentucky', 'Louisiana', 'Maine', 'Maryland', 'Massachusetts', 'Michigan', 'Minnesota', 'Mississippi', 'Missouri', 'Montana', 'Nebraska', 'Nevada', 'New Hampshire', 'New Jersey', 'New Mexico', 'New York', 'North Carolina', 'North Dakota', 'Ohio', 'Oklahoma', 'Oregon', 'Pennsylvania', 'Rhode Island', 'South Carolina', 'South Dakota', 'Tennessee', 'Texas', 'Utah', 'Vermont', 'Virginia', 'Washington', 'West Virginia', 'Wisconsin', 'Wyoming')), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 20.65 NA 40.25 61.90 55.27 58.13 54.04 21.15 18.32 65.84 58.77 53.99 [13] 63.37 64.81 47.11 9.65 67.10 48.83 57.92 69.50 73.95 5.46 49.92 54.21 [25] 61.38 56.66 60.14 56.68 53.13 39.70 74.83 59.73 67.06 67.99 60.60 4.63 [37] 71.09 43.40 21.90 61.45 77.98 36.67 69.95 55.26 63.24 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique12# #argv <- list(c(1.5, 1.5, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1.5 3.0 4.0 5.0 6.0 7.0 8.0 9.0 10.0 11.0 12.0 13.0 14.0 15.0 16.0 [16] 17.0 18.0 19.0 20.0 21.0 22.0 23.0 24.0 25.0 26.0 27.0 28.0 29.0 30.0 31.0 [31] 32.0 33.0 34.0 35.0 36.0 37.0 38.0 39.0 40.0 41.0 42.0 43.0 44.0 45.0 46.0 [46] 47.0 48.0 49.0 50.0 51.0 52.0 53.0 54.0 55.0 56.0 57.0 58.0 59.0 60.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique13# #argv <- list(list(NULL, NULL, NULL, NULL, NULL), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [[1]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique14# #argv <- list(c(9.18429112061858e-05, 0.0238094009226188, 0.0498038685764186), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 9.184291e-05 2.380940e-02 4.980387e-02 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique15# #argv <- list(structure(c(1L, 1L, 1L, 1L, 3L, 3L, 3L, 3L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 3L, 3L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 3L, 3L, 3L, 3L, 3L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 3L, 3L, 2L, 2L, 2L, 2L, 1L, 1L, 1L, 2L, 2L, 2L, 1L, 1L, 1L, 1L, 1L, 3L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 1L, 3L, 3L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), contrasts = structure(c(-0.666666666666667, 0.333333333333333, 0.333333333333333, -0.333333333333333, -0.333333333333333, 0.666666666666667), .Dim = c(3L, 2L), .Dimnames = list(c('placebo', 'drug', 'drug+'), c('drug', 'encourage'))), .Label = c('placebo', 'drug', 'drug+'), class = 'factor'), FALSE, FALSE, 4L); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 3 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique16# #argv <- list(c(TRUE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, FALSE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, NA, TRUE, NA, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, NA, TRUE, NA, TRUE, TRUE, NA, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, NA, NA, TRUE, TRUE, TRUE, TRUE, TRUE, NA, TRUE, NA, TRUE, NA, TRUE, TRUE, TRUE, TRUE, NA, TRUE, TRUE, NA, TRUE, NA, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, NA, NA, FALSE, TRUE, TRUE, NA, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] TRUE FALSE NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique17# #argv <- list(c('2.21', '7.6', '18.19', '19.78', '20.23', '27.01', '28.06', '29.28', '32.79', '37.06', '39.72', '41.26', '41.76', '42.5', '42.82', '43.59', '45.29', '47.09', '47.12', '47.68', '48.52', '48.93', '49.26', '49.45', '49.58', '49.69', '51.01', '51.18', '52.24', '52.39', '55.06', '55.25', '55.76', '57.02', '57.21', '57.71', '58.33', '58.84', '59.63', '59.83', '61.54', '62.16', '62.26', '65.35', '72.03', '75.37', '78.22', NA), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] "2.21" "7.6" "18.19" "19.78" "20.23" "27.01" "28.06" "29.28" "32.79" [10] "37.06" "39.72" "41.26" "41.76" "42.5" "42.82" "43.59" "45.29" "47.09" [19] "47.12" "47.68" "48.52" "48.93" "49.26" "49.45" "49.58" "49.69" "51.01" [28] "51.18" "52.24" "52.39" "55.06" "55.25" "55.76" "57.02" "57.21" "57.71" [37] "58.33" "58.84" "59.63" "59.83" "61.54" "62.16" "62.26" "65.35" "72.03" [46] "75.37" "78.22" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique18#Ignored.ImplementationError# #argv <- list(c(3, 4, 5, 11, 10, 9, 8, 8, 9, 10, 11, 12, 13), FALSE, TRUE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 3 4 5 8 9 10 11 12 13 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique19# #argv <- list(structure(c(1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4, 1, 2, 3, 4), .Tsp = c(1945, 1974.75, 4), class = 'ts'), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique2#Ignored.ImplementationError# #argv <- list(c('a', 'b', 'c', 'c', 'b', 'a', 'NA', 'd', 'd', NA), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] "a" "b" "c" "NA" "d" NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique20# #argv <- list(c(4L, 6L, 9L, 15L, NA), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 4 6 9 15 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique21# #argv <- list(structure(list(A = c(3L, 5L), B = c(3L, 5L), C = c(3L, 5L), D = c(3L, 5L)), .Names = c('A', 'B', 'C', 'D')), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [[1]] [1] 3 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique22# #argv <- list(c(25, 50, 100, 250, 500, 1e+05), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 25 50 100 250 500 100000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique23# #argv <- list(c(1, 2, NA, 2), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 2 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique24# #argv <- list(list('numeric_version', 'numeric_version'), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [[1]] [1] "numeric_version" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique25# #argv <- list(structure(list(c0 = structure(integer(0), .Label = character(0), class = 'factor')), .Names = 'c0', row.names = character(0), class = structure('integer(0)', .Names = 'c0')), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [[1]] factor(0) Levels: ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique26# #argv <- list(list('Math2', 'round', 'signif'), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [[1]] [1] "Math2" [[2]] [1] "round" [[3]] [1] "signif" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique27# #argv <- list(list(structure('Math2', package = 'methods'), 'round', 'signif'), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [[1]] [1] "Math2" attr(,"package") [1] "methods" [[2]] [1] "round" [[3]] [1] "signif" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique28# #argv <- list(structure(c(1L, 1L, 1L, 1L), .Names = c('vector', 'data.frameRowLabels', 'SuperClassMethod', 'atomicVector')), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique29# #argv <- list(NULL, FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique3# #argv <- list(c(1, 2, 4, 6, 8, 9, 11, 13, 14, 16, 3, 5, 7, 9, 10, 12, 14, 15, 17, 17), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 2 4 6 8 9 11 13 14 16 3 5 7 10 12 15 17 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique30# #argv <- list(c(TRUE, FALSE, TRUE, TRUE), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique31# #argv <- list(c(2L, 1L, NA), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 2 1 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique33# #argv <- structure(list(x = structure(c(15, 37, 30, 18, 8, 20, 42.7, 29.3), .Dim = c(4L, 2L), .Dimnames = structure(list(Evaluation = c('very good', 'good', 'bad', 'very bad'), Location = c('city centre', 'suburbs')), .Names = c('Evaluation', 'Location')))), .Names = 'x');do.call('unique', argv) Location Evaluation city centre suburbs very good 15 8.0 good 37 20.0 bad 30 42.7 very bad 18 29.3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique4# #argv <- list(list(c(9L, 9L), c(9L, 9L), c(9L, 9L), c(9L, 9L), c(9L, 9L), c(9L, 9L)), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [[1]] [1] 9 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique5# #argv <- list(structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L), .Label = c('Brown', 'Blue', 'Hazel', 'Green'), class = 'factor'), FALSE, FALSE, 5L); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique6# #argv <- list(c('colors', 'colours'), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] "colors" "colours" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique7# #argv <- list(structure(list(a = 1), .Names = 'a'), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [[1]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique8# #argv <- list(c(1, 258, 516, 774, 1032, 1290, 1548, 1806, 2064, 2322, 2580, 2838, 3096, 3354, 3612, 3870, 4128, 4386, 4644, 4902, 5160, 1, 259, 517, 775, 1033, 1291, 1549, 1807, 2065, 2323, 2581, 2839, 3097, 3355, 3613, 3871, 4129, 4387, 4645, 4903, 5160), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [1] 1 258 516 774 1032 1290 1548 1806 2064 2322 2580 2838 3096 3354 3612 [16] 3870 4128 4386 4644 4902 5160 259 517 775 1033 1291 1549 1807 2065 2323 [31] 2581 2839 3097 3355 3613 3871 4129 4387 4645 4903 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unique.testunique9# #argv <- list(list(FALSE), FALSE, FALSE, NA); .Internal(unique(argv[[1]], argv[[2]], argv[[3]], argv[[4]])) [[1]] [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unitsassign_.testunitsassign_1# #argv <- structure(list(x = structure(500, units = 'secs', class = 'difftime', .Names = 'a'), value = 'mins'), .Names = c('x', 'value'));do.call('units<-', argv) Time difference of 8.333333 mins ##com.oracle.truffle.r.test.builtins.TestBuiltin_unitsassign_difftime.testunitsassign_difftime1# #argv <- structure(list(x = structure(500, units = 'secs', class = 'difftime', .Names = 'a'), value = 'mins'), .Names = c('x', 'value'));do.call('units<-.difftime', argv) Time difference of 8.333333 mins ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlink.testunlink# #{ td <- tempfile(pattern='r-test-unlink'); dir.exists(td); dir.create(td); dir.exists(td); unlink(td, recursive=F); dir.exists(td) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlink.testunlink# #{ td <- tempfile(pattern='r-test-unlink'); dir.exists(td); dir.create(td); dir.exists(td); unlink(td, recursive=T); dir.exists(td) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlink.testunlink# #{ td <- tempfile(pattern='r-test-unlink'); td <- paste0(td, '/dir1/dir2'); dir.exists(td); dir.create(td, recursive=T); dir.exists(td); unlink(td, recursive=F); dir.exists(td) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlink.testunlink# #{ td <- tempfile(pattern='r-test-unlink'); td <- paste0(td, '/dir1/dir2'); dir.exists(td); dir.create(td, recursive=T); dir.exists(td); unlink(td, recursive=T); dir.exists(td) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlink.testunlink# #{ unlink('abcnonexistentxyz*') } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlink.testunlink1#Ignored.SideEffects# #argv <- list('/tmp/RtmptPgrXI/Pkgs', TRUE, FALSE); .Internal(unlink(argv[[1]], argv[[2]], argv[[3]])) Error: 3 arguments passed to .Internal(unlink) which requires 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlink.testunlink2#Ignored.SideEffects# #argv <- list(character(0), FALSE, FALSE); .Internal(unlink(argv[[1]], argv[[2]], argv[[3]])) Error: 3 arguments passed to .Internal(unlink) which requires 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlink.testunlink3#Ignored.SideEffects# #argv <- list('/home/lzhao/tmp/Rtmphu0Cms/file74e1676db2e7', FALSE, FALSE); .Internal(unlink(argv[[1]], argv[[2]], argv[[3]])) Error: 3 arguments passed to .Internal(unlink) which requires 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlink.testunlink5#Ignored.SideEffects# #argv <- structure(list(x = '/tmp/RtmpHjOdmd/file7ac7792619bc'), .Names = 'x');do.call('unlink', argv) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testPairlists# #unlist(list(pairlist(1, list(pairlist(2), 3)))) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testPairlists# #unlist(pairlist(1,2,3)) [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testPairlists#Ignored.Unimplemented# #unlist(pairlist(1,pairlist(2,3)), recursive=FALSE) [[1]] NULL [[2]] NULL [[3]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testPairlists# #unlist(pairlist(1,pairlist(2,3), list(11,22,333))) [1] 1 2 3 11 22 333 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testPairlists# #unlist(pairlist(a=1,b=pairlist(c=2,d=3))) a b.c b.d 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ names(unlist(list(a=list(b=list("1"))))) } [1] "a.b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ names(unlist(list(a=list(b=list("1", "2"))))) } [1] "a.b1" "a.b2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ names(unlist(list(a=list(list("1"))))) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ names(unlist(list(a=list(list("1","2"))))) } [1] "a1" "a2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ names(unlist(list(a=list(list(c="1"))))) } [1] "a.c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ names(unlist(list(a=list(list(c="1", d="2"))))) } [1] "a.c" "a.d" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ names(unlist(list(list(b=list("1"))))) } [1] "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ names(unlist(list(list(list("1"))))) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ names(unlist(list(list(list(c="1"))))) } [1] "c" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list("hello", "hi")) } [1] "hello" "hi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list()) } NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(1+1i, c(7+7i,42+42i))) } [1] 1+ 1i 7+ 7i 42+42i ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(1+1i, c(7,42))) } [1] 1+1i 7+0i 42+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(1+1i, list(7+7i,42+42i)), recursive=FALSE) } [[1]] [1] 1+1i [[2]] [1] 7+7i [[3]] [1] 42+42i ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(1+1i, list(7,42)), recursive=FALSE) } [[1]] [1] 1+1i [[2]] [1] 7 [[3]] [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a="hello", b="hi")) } a b "hello" "hi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=1, c(2,3))) } a 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=1, c(2,3), 4)) } a 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=1, c(2,3), d=4)) } a d 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=1, c(b=2,c=3))) } a b c 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=1,b=2, c=list(d=3,e=list(f=7))), recursive=TRUE) } a b c.d c.e.f 1 2 3 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=1,b=2, c=list(d=3,list(f=7)))) } a b c.d c.f 1 2 3 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=list("-1", "0", b=list("1")))) } a1 a2 a.b "-1" "0" "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=list("0", b=list("1")))) } a a.b "0" "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=list("0", b=list("1"), "2"))) } a1 a.b a3 "0" "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=list("0", list("1")))) } a1 a2 "0" "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=list("0", list(b=list("1"))))) } a a.b "0" "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=list(b=list("1")))) } a.b "1" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=list(b=list("1"), "2"))) } a.b a "1" "2" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(a=list(b=list("1"), "2", "3"))) } a.b a2 a3 "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ unlist(list(quote(for(i in seq(1)) print(i))), recursive=F) } [[1]] for (i in seq(1)) print(i) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list("a", c("b", "c"), list("d", list("e"))) ; unlist(x) } [1] "a" "b" "c" "d" "e" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(1,list(2,3),4) ; z <- list(x,x) ; u <- list(z,z) ; u[[c(2,2,3)]] <- 6 ; unlist(u) } [1] 1 2 3 4 1 2 3 4 1 2 3 4 1 2 3 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(1,z=list(1,b=22,3)) ; unlist(x, recursive=FALSE) } [[1]] [1] 1 $z1 [1] 1 $z.b [1] 22 $z3 [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(1,z=list(1,b=22,3)) ; unlist(x, recursive=FALSE, use.names=FALSE) } [[1]] [1] 1 [[2]] [1] 1 [[3]] [1] 22 [[4]] [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(NULL, list("d", list(), character())) ; unlist(x) } [1] "d" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=1,b=2:3,list(x=FALSE)) ; unlist(x, recursive=FALSE) } $a [1] 1 $b1 [1] 2 $b2 [1] 3 $x [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=1,b=c(x=2, 3),list(x=FALSE)) ; unlist(x, recursive=FALSE) } $a [1] 1 $b.x [1] 2 $b2 [1] 3 $x [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=1,b=c(x=2, z=3),list(x=FALSE)) ; unlist(x, recursive=FALSE) } $a [1] 1 $b.x [1] 2 $b.z [1] 3 $x [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=list("1","2",b="3","4")) ; unlist(x) } a1 a2 a.b a4 "1" "2" "3" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=list("1","2",b=c("3", "4"),"5")) ; unlist(x) } a1 a2 a.b1 a.b2 a5 "1" "2" "3" "4" "5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=list("1","2",b=list("3"))) ; unlist(x) } a1 a2 a.b "1" "2" "3" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=list("1","2",b=list("3", "4"))) ; unlist(x) } a1 a2 a.b1 a.b2 "1" "2" "3" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=list("1","2",b=list("3", "4"),"5")) ; unlist(x) } a1 a2 a.b1 a.b2 a5 "1" "2" "3" "4" "5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=list("1","2",b=list("3", list("10"), "4"),"5")) ; unlist(x) } a1 a2 a.b1 a.b2 a.b3 a6 "1" "2" "3" "10" "4" "5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=list("1","2",b=list("3", list("10", "11"), "4"),"5")) ; unlist(x) } a1 a2 a.b1 a.b2 a.b3 a.b4 a7 "1" "2" "3" "10" "11" "4" "5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=list("1","2",list("3", "4"),"5")) ; unlist(x) } a1 a2 a3 a4 a5 "1" "2" "3" "4" "5" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=list("1",FALSE,b=list(2:4))) ; unlist(x) } a1 a2 a.b1 a.b2 a.b3 "1" "FALSE" "2" "3" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(a=list(1,FALSE,b=list(2:4))) ; unlist(x) } a1 a2 a.b1 a.b2 a.b3 1 0 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x <- list(list("1","2",b="3","4")) ; unlist(x) } b "1" "2" "3" "4" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ x<-quote(f(1,2)); y<-function(z) 42; l<-list(x, y, NULL); y<-unlist(l); c(length(y), typeof(y)) } [1] "2" "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testUnlist# #{ y<-c(2, 3); names(y)<-c("z", NA); x <- list(a=1,b=y,list(x=FALSE)) ; unlist(x, recursive=FALSE) } $a [1] 1 $b.z [1] 2 $b.NA [1] 3 $x [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist1# #argv <- list(list('yaxp'), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] "yaxp" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist10# #argv <- list(structure(' \'Jetz no chli züritüütsch: (noch ein bißchen Zürcher deutsch)\')\n', Rd_tag = 'RCODE'), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] " 'Jetz no chli züritüütsch: (noch ein bißchen Zürcher deutsch)')\n" attr(,"Rd_tag") [1] "RCODE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist11# #argv <- list(structure(list(`1 sec` = 345600, `2 secs` = 172800, `5 secs` = 69120, `10 secs` = 34560, `15 secs` = 23040, `30 secs` = 11520, `1 min` = 5760, `2 mins` = 2880, `5 mins` = 1152, `10 mins` = 576, `15 mins` = 384, `30 mins` = 192, `1 hour` = 96, `3 hours` = 32, `6 hours` = 16, `12 hours` = 8, `1 DSTday` = 4, `2 DSTdays` = 2, `1 week` = 0.571428571428571, halfmonth = 0.262833675564682, `1 month` = 0.131416837782341, `3 months` = 0.0438056125941136, `6 months` = 0.0219028062970568, `1 year` = 0.0109514031485284, `2 years` = 0.0054757015742642, `5 years` = 0.00219028062970568, `10 years` = 0.00109514031485284, `20 years` = 0.00054757015742642, `50 years` = 0.000219028062970568, `100 years` = 0.000109514031485284, `200 years` = 5.4757015742642e-05, `500 years` = 2.19028062970568e-05, `1000 years` = 1.09514031485284e-05), .Names = c('1 sec', '2 secs', '5 secs', '10 secs', '15 secs', '30 secs', '1 min', '2 mins', '5 mins', '10 mins', '15 mins', '30 mins', '1 hour', '3 hours', '6 hours', '12 hours', '1 DSTday', '2 DSTdays', '1 week', 'halfmonth', '1 month', '3 months', '6 months', '1 year', '2 years', '5 years', '10 years', '20 years', '50 years', '100 years', '200 years', '500 years', '1000 years')), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) 1 sec 2 secs 5 secs 10 secs 15 secs 30 secs 3.456000e+05 1.728000e+05 6.912000e+04 3.456000e+04 2.304000e+04 1.152000e+04 1 min 2 mins 5 mins 10 mins 15 mins 30 mins 5.760000e+03 2.880000e+03 1.152000e+03 5.760000e+02 3.840000e+02 1.920000e+02 1 hour 3 hours 6 hours 12 hours 1 DSTday 2 DSTdays 9.600000e+01 3.200000e+01 1.600000e+01 8.000000e+00 4.000000e+00 2.000000e+00 1 week halfmonth 1 month 3 months 6 months 1 year 5.714286e-01 2.628337e-01 1.314168e-01 4.380561e-02 2.190281e-02 1.095140e-02 2 years 5 years 10 years 20 years 50 years 100 years 5.475702e-03 2.190281e-03 1.095140e-03 5.475702e-04 2.190281e-04 1.095140e-04 200 years 500 years 1000 years 5.475702e-05 2.190281e-05 1.095140e-05 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist12# #argv <- list(structure(list(vector = TRUE, atomicVector = TRUE, index = TRUE, numIndex = TRUE, numLike = TRUE, number = TRUE, replValue = TRUE), .Names = c('vector', 'atomicVector', 'index', 'numIndex', 'numLike', 'number', 'replValue')), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) vector atomicVector index numIndex numLike number TRUE TRUE TRUE TRUE TRUE TRUE replValue TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist13# #argv <- list(structure(list(a = 6:10), .Names = 'a', row.names = 6:10), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist14# #argv <- list(structure(list(`2005` = structure(c(31L, 28L, 31L, 30L, 31L, 30L, 31L, 31L, 30L, 31L, 30L, 31L), .Dim = 12L, .Dimnames = structure(list(c('01', '02', '03', '04', '05', '06', '07', '08', '09', '10', '11', '12')), .Names = ''), class = 'table'), `2006` = structure(c(31L, 28L, 31L, 30L, 31L, 30L, 31L, 31L, 30L, 31L, 30L, 31L), .Dim = 12L, .Dimnames = structure(list(c('01', '02', '03', '04', '05', '06', '07', '08', '09', '10', '11', '12')), .Names = ''), class = 'table'), `2007` = structure(c(31L, 28L, 31L, 30L, 31L, 30L, 31L, 31L, 30L, 31L, 30L, 31L), .Dim = 12L, .Dimnames = structure(list(c('01', '02', '03', '04', '05', '06', '07', '08', '09', '10', '11', '12')), .Names = ''), class = 'table'), `2008` = structure(c(31L, 29L, 31L, 30L, 31L, 30L, 31L, 31L, 30L, 31L, 30L, 31L), .Dim = 12L, .Dimnames = structure(list(c('01', '02', '03', '04', '05', '06', '07', '08', '09', '10', '11', '12')), .Names = ''), class = 'table'), `2009` = structure(1L, .Dim = 1L, .Dimnames = structure(list('01'), .Names = ''), class = 'table')), .Names = c('2005', '2006', '2007', '2008', '2009')), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) 2005.01 2005.02 2005.03 2005.04 2005.05 2005.06 2005.07 2005.08 2005.09 2005.10 31 28 31 30 31 30 31 31 30 31 2005.11 2005.12 2006.01 2006.02 2006.03 2006.04 2006.05 2006.06 2006.07 2006.08 30 31 31 28 31 30 31 30 31 31 2006.09 2006.10 2006.11 2006.12 2007.01 2007.02 2007.03 2007.04 2007.05 2007.06 30 31 30 31 31 28 31 30 31 30 2007.07 2007.08 2007.09 2007.10 2007.11 2007.12 2008.01 2008.02 2008.03 2008.04 31 31 30 31 30 31 31 29 31 30 2008.05 2008.06 2008.07 2008.08 2008.09 2008.10 2008.11 2008.12 2009.01 31 30 31 31 30 31 30 31 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist15# #argv <- list(list(structure(list(structure(c(1395082040.29392, 1395082040.29392, 1395082040.29392, 1395082040.29392, 1395082040.29392), class = c('AsIs', 'POSIXct', 'POSIXt'))), row.names = c(NA, -5L), class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] "2014-03-17 18:47:20 GMT" "2014-03-17 18:47:20 GMT" [3] "2014-03-17 18:47:20 GMT" "2014-03-17 18:47:20 GMT" [5] "2014-03-17 18:47:20 GMT" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist16# #argv <- list(structure('print(.leap.seconds, tz = \'PST8PDT\') # and in Seattle\'s\n', Rd_tag = 'RCODE'), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] "print(.leap.seconds, tz = 'PST8PDT') # and in Seattle's\n" attr(,"Rd_tag") [1] "RCODE" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist17# #argv <- list(list(TRUE, TRUE, TRUE, TRUE), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist18# #argv <- list(list(c(NA_real_, NA_real_), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi'), c('Svansota', 'No. 462', 'Manchuria', 'No. 475', 'Velvet', 'Peatland', 'Glabron', 'No. 457', 'Wisconsin No. 38', 'Trebi')), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] NA NA "Svansota" [4] "No. 462" "Manchuria" "No. 475" [7] "Velvet" "Peatland" "Glabron" [10] "No. 457" "Wisconsin No. 38" "Trebi" [13] "Svansota" "No. 462" "Manchuria" [16] "No. 475" "Velvet" "Peatland" [19] "Glabron" "No. 457" "Wisconsin No. 38" [22] "Trebi" "Svansota" "No. 462" [25] "Manchuria" "No. 475" "Velvet" [28] "Peatland" "Glabron" "No. 457" [31] "Wisconsin No. 38" "Trebi" "Svansota" [34] "No. 462" "Manchuria" "No. 475" [37] "Velvet" "Peatland" "Glabron" [40] "No. 457" "Wisconsin No. 38" "Trebi" [43] "Svansota" "No. 462" "Manchuria" [46] "No. 475" "Velvet" "Peatland" [49] "Glabron" "No. 457" "Wisconsin No. 38" [52] "Trebi" "Svansota" "No. 462" [55] "Manchuria" "No. 475" "Velvet" [58] "Peatland" "Glabron" "No. 457" [61] "Wisconsin No. 38" "Trebi" "Svansota" [64] "No. 462" "Manchuria" "No. 475" [67] "Velvet" "Peatland" "Glabron" [70] "No. 457" "Wisconsin No. 38" "Trebi" [73] "Svansota" "No. 462" "Manchuria" [76] "No. 475" "Velvet" "Peatland" [79] "Glabron" "No. 457" "Wisconsin No. 38" [82] "Trebi" "Svansota" "No. 462" [85] "Manchuria" "No. 475" "Velvet" [88] "Peatland" "Glabron" "No. 457" [91] "Wisconsin No. 38" "Trebi" "Svansota" [94] "No. 462" "Manchuria" "No. 475" [97] "Velvet" "Peatland" "Glabron" [100] "No. 457" "Wisconsin No. 38" "Trebi" [103] "Svansota" "No. 462" "Manchuria" [106] "No. 475" "Velvet" "Peatland" [109] "Glabron" "No. 457" "Wisconsin No. 38" [112] "Trebi" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist19# #argv <- list(list(structure(list('/home/lzhao/tmp/RtmpTzriDZ/R.INSTALL30d4108a07be/mgcv/R/gamm.r'), row.names = c(NA, -1L), class = 'data.frame'), structure(list(1522L), row.names = c(NA, -1L), class = 'data.frame'), structure(list(1522L), row.names = c(NA, -1L), class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] "/home/lzhao/tmp/RtmpTzriDZ/R.INSTALL30d4108a07be/mgcv/R/gamm.r" [[2]] [1] 1522 [[3]] [1] 1522 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist2# #argv <- list(list(c(13823, NA)), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] 13823 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist20# #argv <- list(structure(list(`1` = 2.47032822920623e-323), .Names = '1'), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) 1 2.470328e-323 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist21# #argv <- list(structure(list(`1` = 5900.92307692308, `2` = 6784.76923076923), .Names = c('1', '2')), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) 1 2 5900.923 6784.769 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist22# #argv <- list(list(structure(list(surname = structure(c('Tukey', 'Venables', 'Tierney', 'Ripley', 'Ripley', 'McNeil'), class = 'AsIs'), nationality = structure(c(3L, 1L, 3L, 2L, 2L, 1L), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(2L, 1L, 1L, 1L, 1L, 1L), .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = c('1', '2', '3', '4', '4.1', '5'), class = 'data.frame'), structure(list(title = structure(c(2L, 5L, 4L, 6L, 7L, 3L), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA, 1L, NA, NA, NA, NA), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('title', 'other.author'), row.names = c(NA, 6L), class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] "Tukey" "Venables" "Tierney" "Ripley" "Ripley" "McNeil" [[2]] [1] US Australia US UK UK Australia Levels: Australia UK US [[3]] [1] yes no no no no no Levels: no yes [[4]] [1] Exploratory Data Analysis Modern Applied Statistics ... [3] LISP-STAT Spatial Statistics [5] Stochastic Simulation Interactive Data Analysis 7 Levels: An Introduction to R ... Stochastic Simulation [[5]] [1] Ripley Levels: Ripley Venables & Smith ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist23# #argv <- list(list(structure(c(-Inf, -Inf, -Inf, -Inf, 0, 0, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 0, 0, -Inf, -Inf, -Inf, -Inf, -Inf, -Inf, 0, 0, 0), .Dim = c(9L, 9L), .Dimnames = list(c('20%', '30%', '40%', '50%', '60%', '70%', '80%', '90%', '100%'), NULL)), structure(c(-Inf, -Inf, -Inf, 0, 0, 1, 1, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.5, 1, Inf, Inf, Inf, -Inf, -Inf, -Inf, -Inf, 0, 1, 1, 1, Inf, -Inf, -Inf, -Inf, -Inf, 0, 0.5, 1, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.5, 1, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.6, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.4, 0.8, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.533333333333334, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.525, Inf, Inf, Inf, Inf), .Dim = c(9L, 9L), .Dimnames = list(c('20%', '30%', '40%', '50%', '60%', '70%', '80%', '90%', '100%'), NULL)), structure(c(-Inf, -Inf, 0, 0, 1, 2, Inf, Inf, Inf, -Inf, -Inf, 0, 0.5, 1, 2, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0, 1, 2, 2, Inf, Inf, -Inf, -Inf, -Inf, 0, 0.8, 1.6, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.3, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.4, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.2, 1.9, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.499999999999999, 1.33333333333333, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.325, Inf, Inf, Inf, Inf), .Dim = c(9L, 9L), .Dimnames = list(c('20%', '30%', '40%', '50%', '60%', '70%', '80%', '90%', '100%'), NULL)), structure(c(-Inf, -Inf, 0, 1, 2, 3, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 2, 3, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2, 3, Inf, Inf, Inf, -Inf, -Inf, -Inf, 0.5, 1.6, 2.7, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2.1, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2.2, Inf, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 2, 3, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2.13333333333333, Inf, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2.125, Inf, Inf, Inf, Inf), .Dim = c(9L, 9L), .Dimnames = list(c('20%', '30%', '40%', '50%', '60%', '70%', '80%', '90%', '100%'), NULL)), structure(c(-Inf, -Inf, 0, 1, 3, 4, Inf, Inf, Inf, -Inf, -Inf, 0, 1.5, 3, 4, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 2, 4, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1, 2.4, 3.8, Inf, Inf, Inf, -Inf, -Inf, 0.100000000000001, 1.5, 2.9, Inf, Inf, Inf, Inf, -Inf, -Inf, 0, 1.5, 3, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.2, 1.5, 2.8, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.0666666666666664, 1.5, 2.93333333333333, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.0750000000000002, 1.5, 2.925, Inf, Inf, Inf, Inf), .Dim = c(9L, 9L), .Dimnames = list(c('20%', '30%', '40%', '50%', '60%', '70%', '80%', '90%', '100%'), NULL)), structure(c(-Inf, -Inf, 0, 2, 4, 5, Inf, Inf, Inf, -Inf, -Inf, 0, 2, 4, 5, Inf, Inf, Inf, -Inf, -Inf, 0, 1, 3, 5, Inf, Inf, Inf, -Inf, -Inf, -Inf, 1.5, 3.2, 4.9, Inf, Inf, Inf, -Inf, -Inf, 0.300000000000001, 2, 3.7, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.2, 2, 3.8, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.4, 2, 3.6, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.266666666666667, 2, 3.73333333333333, Inf, Inf, Inf, Inf, -Inf, -Inf, 0.275, 2, 3.725, Inf, Inf, Inf, Inf), .Dim = c(9L, 9L), .Dimnames = list(c('20%', '30%', '40%', '50%', '60%', '70%', '80%', '90%', '100%'), NULL))), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] -Inf -Inf -Inf -Inf 0.00000000 0.00000000 [7] 0.00000000 0.00000000 0.00000000 -Inf -Inf -Inf [13] -Inf 0.00000000 0.00000000 0.00000000 0.00000000 0.00000000 [19] -Inf -Inf -Inf -Inf -Inf -Inf [25] 0.00000000 0.00000000 0.00000000 -Inf -Inf -Inf [31] -Inf -Inf -Inf -Inf -Inf 0.00000000 [37] -Inf -Inf -Inf -Inf -Inf -Inf [43] 0.00000000 0.00000000 0.00000000 -Inf -Inf -Inf [49] -Inf -Inf 0.00000000 0.00000000 0.00000000 0.00000000 [55] -Inf -Inf -Inf -Inf -Inf -Inf [61] -Inf -Inf 0.00000000 -Inf -Inf -Inf [67] -Inf -Inf -Inf 0.00000000 0.00000000 0.00000000 [73] -Inf -Inf -Inf -Inf -Inf -Inf [79] 0.00000000 0.00000000 0.00000000 -Inf -Inf -Inf [85] 0.00000000 0.00000000 1.00000000 1.00000000 Inf Inf [91] -Inf -Inf -Inf 0.00000000 0.50000000 1.00000000 [97] Inf Inf Inf -Inf -Inf -Inf [103] -Inf 0.00000000 1.00000000 1.00000000 1.00000000 Inf [109] -Inf -Inf -Inf -Inf 0.00000000 0.50000000 [115] 1.00000000 Inf Inf -Inf -Inf -Inf [121] 0.00000000 0.50000000 1.00000000 Inf Inf Inf [127] -Inf -Inf -Inf 0.00000000 0.60000000 Inf [133] Inf Inf Inf -Inf -Inf -Inf [139] 0.00000000 0.40000000 0.80000000 Inf Inf Inf [145] -Inf -Inf -Inf 0.00000000 0.53333333 Inf [151] Inf Inf Inf -Inf -Inf -Inf [157] 0.00000000 0.52500000 Inf Inf Inf Inf [163] -Inf -Inf 0.00000000 0.00000000 1.00000000 2.00000000 [169] Inf Inf Inf -Inf -Inf 0.00000000 [175] 0.50000000 1.00000000 2.00000000 Inf Inf Inf [181] -Inf -Inf -Inf 0.00000000 1.00000000 2.00000000 [187] 2.00000000 Inf Inf -Inf -Inf -Inf [193] 0.00000000 0.80000000 1.60000000 Inf Inf Inf [199] -Inf -Inf -Inf 0.50000000 1.30000000 Inf [205] Inf Inf Inf -Inf -Inf -Inf [211] 0.50000000 1.40000000 Inf Inf Inf Inf [217] -Inf -Inf -Inf 0.50000000 1.20000000 1.90000000 [223] Inf Inf Inf -Inf -Inf -Inf [229] 0.50000000 1.33333333 Inf Inf Inf Inf [235] -Inf -Inf -Inf 0.50000000 1.32500000 Inf [241] Inf Inf Inf -Inf -Inf 0.00000000 [247] 1.00000000 2.00000000 3.00000000 Inf Inf Inf [253] -Inf -Inf 0.00000000 1.00000000 2.00000000 3.00000000 [259] Inf Inf Inf -Inf -Inf -Inf [265] 1.00000000 2.00000000 3.00000000 Inf Inf Inf [271] -Inf -Inf -Inf 0.50000000 1.60000000 2.70000000 [277] Inf Inf Inf -Inf -Inf -Inf [283] 1.00000000 2.10000000 Inf Inf Inf Inf [289] -Inf -Inf -Inf 1.00000000 2.20000000 Inf [295] Inf Inf Inf -Inf -Inf 0.00000000 [301] 1.00000000 2.00000000 3.00000000 Inf Inf Inf [307] -Inf -Inf -Inf 1.00000000 2.13333333 Inf [313] Inf Inf Inf -Inf -Inf -Inf [319] 1.00000000 2.12500000 Inf Inf Inf Inf [325] -Inf -Inf 0.00000000 1.00000000 3.00000000 4.00000000 [331] Inf Inf Inf -Inf -Inf 0.00000000 [337] 1.50000000 3.00000000 4.00000000 Inf Inf Inf [343] -Inf -Inf 0.00000000 1.00000000 2.00000000 4.00000000 [349] Inf Inf Inf -Inf -Inf -Inf [355] 1.00000000 2.40000000 3.80000000 Inf Inf Inf [361] -Inf -Inf 0.10000000 1.50000000 2.90000000 Inf [367] Inf Inf Inf -Inf -Inf 0.00000000 [373] 1.50000000 3.00000000 Inf Inf Inf Inf [379] -Inf -Inf 0.20000000 1.50000000 2.80000000 Inf [385] Inf Inf Inf -Inf -Inf 0.06666667 [391] 1.50000000 2.93333333 Inf Inf Inf Inf [397] -Inf -Inf 0.07500000 1.50000000 2.92500000 Inf [403] Inf Inf Inf -Inf -Inf 0.00000000 [409] 2.00000000 4.00000000 5.00000000 Inf Inf Inf [415] -Inf -Inf 0.00000000 2.00000000 4.00000000 5.00000000 [421] Inf Inf Inf -Inf -Inf 0.00000000 [427] 1.00000000 3.00000000 5.00000000 Inf Inf Inf [433] -Inf -Inf -Inf 1.50000000 3.20000000 4.90000000 [439] Inf Inf Inf -Inf -Inf 0.30000000 [445] 2.00000000 3.70000000 Inf Inf Inf Inf [451] -Inf -Inf 0.20000000 2.00000000 3.80000000 Inf [457] Inf Inf Inf -Inf -Inf 0.40000000 [463] 2.00000000 3.60000000 Inf Inf Inf Inf [469] -Inf -Inf 0.26666667 2.00000000 3.73333333 Inf [475] Inf Inf Inf -Inf -Inf 0.27500000 [481] 2.00000000 3.72500000 Inf Inf Inf Inf ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist24# #argv <- list(structure('# everything ', Rd_tag = 'VERB'), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] "# everything " attr(,"Rd_tag") [1] "VERB" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist25# #argv <- list(structure(list(sec = NA_real_, min = NA_integer_, hour = NA_integer_), .Names = c('sec', 'min', 'hour')), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) sec min hour NA NA NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist26# #argv <- list(structure(list(a = list(1:5, c('A', 'B', 'C', 'D', 'E')), b = 'Z', c = NA), .Names = c('a', 'b', 'c')), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) $a1 [1] 1 2 3 4 5 $a2 [1] "A" "B" "C" "D" "E" $b [1] "Z" $c [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist27#Output.IgnoreWhitespace# #argv <- list(list(structure(list(structure(c(0.398105880367068, -0.612026393250771, 0.341119691424425, -1.12936309608079, 1.43302370170104, 1.98039989850586, -0.367221476466509, -1.04413462631653, 0.569719627442413, -0.135054603880824, 2.40161776050478, -0.0392400027331692, 0.689739362450777, 0.0280021587806661, -0.743273208882405, 0.188792299514343, -1.80495862889104, 1.46555486156289, 0.153253338211898, 2.17261167036215, 0.475509528899663, -0.709946430921815, 0.610726353489055, -0.934097631644252, -1.2536334002391, 0.291446235517463, -0.443291873218433, 0.00110535163162413, 0.0743413241516641, -0.589520946188072, -0.568668732818502, -0.135178615123832, 1.1780869965732, -1.52356680042976, 0.593946187628422, 0.332950371213518, 1.06309983727636, -0.304183923634301, 0.370018809916288, 0.267098790772231, -0.54252003099165, 1.20786780598317, 1.16040261569495, 0.700213649514998, 1.58683345454085, 0.558486425565304, -1.27659220845804, -0.573265414236886, -1.22461261489836, -0.473400636439312, -0.620366677224124, 0.0421158731442352, -0.910921648552446, 0.158028772404075, -0.654584643918818, 1.76728726937265, 0.716707476017206, 0.910174229495227, 0.384185357826345, 1.68217608051942, -0.635736453948977, -0.461644730360566, 1.43228223854166, -0.650696353310367, -0.207380743601965, -0.392807929441984, -0.319992868548507, -0.279113302976559, 0.494188331267827, -0.177330482269606, -0.505957462114257, 1.34303882517041, -0.214579408546869, -0.179556530043387, -0.100190741213562, 0.712666307051405, -0.0735644041263263, -0.0376341714670479, -0.681660478755657, -0.324270272246319, 0.0601604404345152, -0.588894486259664, 0.531496192632572, -1.51839408178679, 0.306557860789766, -1.53644982353759, -0.300976126836611, -0.528279904445006, -0.652094780680999, -0.0568967778473925, -1.91435942568001, 1.17658331201856, -1.664972436212, -0.463530401472386, -1.11592010504285, -0.750819001193448, 2.08716654562835, 0.0173956196932517, -1.28630053043433, -1.64060553441858), .Label = structure(list(c(-1.91442143130152, -0.573203408615382), c(-0.934159637265755, -0.300914121215107), c(-0.568730738440006, 0.0174576253147555), c(-0.279175308598063, 0.384247363447848), c(0.0279401531591622, 1.16046462131646), c(0.398043874745564, 2.40167976612628)), class = 'shingleLevel'), class = 'shingle')), row.names = c(NA, -100L), class = 'data.frame'), structure(list(c(0.450187101272656, -0.018559832714638, -0.318068374543844, -0.929362147453702, -1.48746031014148, -1.07519229661568, 1.00002880371391, -0.621266694796823, -1.38442684738449, 1.86929062242358, 0.425100377372448, -0.238647100913033, 1.05848304870902, 0.886422651374936, -0.619243048231147, 2.20610246454047, -0.255027030141015, -1.42449465021281, -0.144399601954219, 0.207538339232345, 2.30797839905936, 0.105802367893711, 0.456998805423414, -0.077152935356531, -0.334000842366544, -0.0347260283112762, 0.787639605630162, 2.07524500865228, 1.02739243876377, 1.2079083983867, -1.23132342155804, 0.983895570053379, 0.219924803660651, -1.46725002909224, 0.521022742648139, -0.158754604716016, 1.4645873119698, -0.766081999604665, -0.430211753928547, -0.926109497377437, -0.17710396143654, 0.402011779486338, -0.731748173119606, 0.830373167981674, -1.20808278630446, -1.04798441280774, 1.44115770684428, -1.01584746530465, 0.411974712317515, -0.38107605110892, 0.409401839650934, 1.68887328620405, 1.58658843344197, -0.330907800682766, -2.28523553529247, 2.49766158983416, 0.667066166765493, 0.5413273359637, -0.0133995231459087, 0.510108422952926, -0.164375831769667, 0.420694643254513, -0.400246743977644, -1.37020787754746, 0.987838267454879, 1.51974502549955, -0.308740569225614, -1.25328975560769, 0.642241305677824, -0.0447091368939791, -1.73321840682484, 0.00213185968026965, -0.630300333928146, -0.340968579860405, -1.15657236263585, 1.80314190791747, -0.331132036391221, -1.60551341225308, 0.197193438739481, 0.263175646405474)), row.names = c(NA, -80L), class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] 0.398105880 -0.612026393 0.341119691 -1.129363096 1.433023702 [6] 1.980399899 -0.367221476 -1.044134626 0.569719627 -0.135054604 [11] 2.401617761 -0.039240003 0.689739362 0.028002159 -0.743273209 [16] 0.188792300 -1.804958629 1.465554862 0.153253338 2.172611670 [21] 0.475509529 -0.709946431 0.610726353 -0.934097632 -1.253633400 [26] 0.291446236 -0.443291873 0.001105352 0.074341324 -0.589520946 [31] -0.568668733 -0.135178615 1.178086997 -1.523566800 0.593946188 [36] 0.332950371 1.063099837 -0.304183924 0.370018810 0.267098791 [41] -0.542520031 1.207867806 1.160402616 0.700213650 1.586833455 [46] 0.558486426 -1.276592208 -0.573265414 -1.224612615 -0.473400636 [51] -0.620366677 0.042115873 -0.910921649 0.158028772 -0.654584644 [56] 1.767287269 0.716707476 0.910174229 0.384185358 1.682176081 [61] -0.635736454 -0.461644730 1.432282239 -0.650696353 -0.207380744 [66] -0.392807929 -0.319992869 -0.279113303 0.494188331 -0.177330482 [71] -0.505957462 1.343038825 -0.214579409 -0.179556530 -0.100190741 [76] 0.712666307 -0.073564404 -0.037634171 -0.681660479 -0.324270272 [81] 0.060160440 -0.588894486 0.531496193 -1.518394082 0.306557861 [86] -1.536449824 -0.300976127 -0.528279904 -0.652094781 -0.056896778 [91] -1.914359426 1.176583312 -1.664972436 -0.463530401 -1.115920105 [96] -0.750819001 2.087166546 0.017395620 -1.286300530 -1.640605534 attr(,"levels") [[1]] [1] -1.9144214 -0.5732034 [[2]] [1] -0.9341596 -0.3009141 [[3]] [1] -0.56873074 0.01745763 [[4]] [1] -0.2791753 0.3842474 [[5]] [1] 0.02794015 1.16046462 [[6]] [1] 0.3980439 2.4016798 attr(,"class") [1] "shingleLevel" attr(,"class") [1] "shingle" [[2]] [1] 0.45018710 -0.01855983 -0.31806837 -0.92936215 -1.48746031 -1.07519230 [7] 1.00002880 -0.62126669 -1.38442685 1.86929062 0.42510038 -0.23864710 [13] 1.05848305 0.88642265 -0.61924305 2.20610246 -0.25502703 -1.42449465 [19] -0.14439960 0.20753834 2.30797840 0.10580237 0.45699881 -0.07715294 [25] -0.33400084 -0.03472603 0.78763961 2.07524501 1.02739244 1.20790840 [31] -1.23132342 0.98389557 0.21992480 -1.46725003 0.52102274 -0.15875460 [37] 1.46458731 -0.76608200 -0.43021175 -0.92610950 -0.17710396 0.40201178 [43] -0.73174817 0.83037317 -1.20808279 -1.04798441 1.44115771 -1.01584747 [49] 0.41197471 -0.38107605 0.40940184 1.68887329 1.58658843 -0.33090780 [55] -2.28523554 2.49766159 0.66706617 0.54132734 -0.01339952 0.51010842 [61] -0.16437583 0.42069464 -0.40024674 -1.37020788 0.98783827 1.51974503 [67] -0.30874057 -1.25328976 0.64224131 -0.04470914 -1.73321841 0.00213186 [73] -0.63030033 -0.34096858 -1.15657236 1.80314191 -0.33113204 -1.60551341 [79] 0.19719344 0.26317565 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist28# #argv <- list(list(NULL), TRUE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist29# #argv <- list(structure(list(a = 'a', b = 2, c = 3.14159265358979+2i), .Names = c('a', 'b', 'c')), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) a b c "a" "2" "3.14159265358979+2i" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist3# #argv <- list(structure('A', .Names = 'x', package = '.GlobalEnv'), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) x "A" attr(,"package") [1] ".GlobalEnv" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist30# #argv <- list(structure(list(`1` = c(2, 1), `2` = c(3, 1.5, 1.5, 4), `3` = c(4, 2.5, 2.5, 5, 1), `4` = c(5, 3.5, 3.5, 7, 1.5, 6, 1.5), `5` = c(5, 3.5, 3.5, 8, 1.5, 6.5, 1.5, 6.5), `6` = c(6, 4.5, 4.5, 10, 2.5, 8.5, 2.5, 8.5, 1, 7), `7` = c(7, 5.5, 5.5, 11, 3.5, 9.5, 3.5, 9.5, 2, 8, 1)), .Dim = 7L, .Dimnames = list(c('1', '2', '3', '4', '5', '6', '7'))), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) 11 12 21 22 23 24 31 32 33 34 35 41 42 43 44 45 2.0 1.0 3.0 1.5 1.5 4.0 4.0 2.5 2.5 5.0 1.0 5.0 3.5 3.5 7.0 1.5 46 47 51 52 53 54 55 56 57 58 61 62 63 64 65 66 6.0 1.5 5.0 3.5 3.5 8.0 1.5 6.5 1.5 6.5 6.0 4.5 4.5 10.0 2.5 8.5 67 68 69 610 71 72 73 74 75 76 77 78 79 710 711 2.5 8.5 1.0 7.0 7.0 5.5 5.5 11.0 3.5 9.5 3.5 9.5 2.0 8.0 1.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist31# #argv <- list(list(c(TRUE, TRUE), c(TRUE, TRUE), c(TRUE, TRUE), c(TRUE, TRUE), c(1, 2, 3)), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] 1 1 1 1 1 1 1 1 1 2 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist32#Ignored.ImplementationError# #argv <- list(structure(list(mean = c(0, 1), vcov = structure(c(1, 1, 1, 0), .Dim = c(2L, 2L))), .Names = c('mean', 'vcov'), class = c('relistable', 'list')), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) mean1 mean2 vcov1 vcov2 vcov3 vcov4 0 1 1 1 1 0 attr(,"skeleton") $mean [1] 0 1 $vcov [,1] [,2] [1,] 1 1 [2,] 1 0 attr(,"class") [1] "relistable" "list" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist33# #argv <- list(list(c(' \036 The ‘internal’ graphics device invoked by .Call(\'R_GD_nullDevice\',', ' package = \'grDevices\') has been removed: use pdf(file = NULL)', ' instead.')), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] " \036 The ‘internal’ graphics device invoked by .Call('R_GD_nullDevice'," [2] " package = 'grDevices') has been removed: use pdf(file = NULL)" [3] " instead." ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist34# #argv <- list(structure(list(surname = structure(c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'AsIs'), nationality = structure(c('Australia', 'UK', 'US', 'US', 'Australia'), class = 'AsIs'), deceased = structure(c('no', 'no', 'no', 'yes', 'no'), class = 'AsIs'), title = structure(c(NA_character_, NA_character_, NA_character_, NA_character_, NA_character_), class = 'AsIs'), other.author = structure(c(NA_character_, NA_character_, NA_character_, NA_character_, NA_character_), class = 'AsIs')), .Names = c('surname', 'nationality', 'deceased', 'title', 'other.author'), row.names = c('1', '2', '3', '4', '5')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] "McNeil" "Ripley" "Tierney" "Tukey" "Venables" "Australia" [7] "UK" "US" "US" "Australia" "no" "no" [13] "no" "yes" "no" NA NA NA [19] NA NA NA NA NA NA [25] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist35# #argv <- list(list(structure(list(Ozone = c(96L, 78L, 73L, 91L, 47L, 32L, 20L, 23L, 21L, 24L, 44L, 21L, 28L, 9L, 13L, 46L, 18L, 13L, 24L, 16L, 13L, 23L, 36L, 7L, 14L, 30L, NA, 14L, 18L, 20L), Solar.R = c(167L, 197L, 183L, 189L, 95L, 92L, 252L, 220L, 230L, 259L, 236L, 259L, 238L, 24L, 112L, 237L, 224L, 27L, 238L, 201L, 238L, 14L, 139L, 49L, 20L, 193L, 145L, 191L, 131L, 223L), Wind = c(6.9, 5.1, 2.8, 4.6, 7.4, 15.5, 10.9, 10.3, 10.9, 9.7, 14.9, 15.5, 6.3, 10.9, 11.5, 6.9, 13.8, 10.3, 10.3, 8, 12.6, 9.2, 10.3, 10.3, 16.6, 6.9, 13.2, 14.3, 8, 11.5), Temp = c(91L, 92L, 93L, 93L, 87L, 84L, 80L, 78L, 75L, 73L, 81L, 76L, 77L, 71L, 71L, 78L, 67L, 76L, 68L, 82L, 64L, 71L, 81L, 69L, 63L, 70L, 77L, 75L, 76L, 68L), Month = c(9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L, 9L), Day = 1:30), .Names = c('Ozone', 'Solar.R', 'Wind', 'Temp', 'Month', 'Day'), row.names = 124:153, class = 'data.frame'), structure(list(c(2.67385465817826, 1.92826057080163, 1.7211511020859, 2.46674518946253, 0.6441818647641, 0.0228534586169083, -0.474209266300845, -0.349943585071407, -0.432787372557699, -0.308521691328261, 0.519916183534662, -0.432787372557699, -0.142834116355676, -0.929850097475453, -0.764162522502868, 0.602759971020954, -0.557053053787138, -0.764162522502868, -0.308521691328261, -0.63989684127343, -0.764162522502868, -0.349943585071407, 0.188541033589493, -1.01269388496175, -0.722740628759722, -0.059990328869384, NA, -0.722740628759722, -0.557053053787138, -0.474209266300845)), row.names = c(NA, -30L), class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] 96 78 73 91 47 32 20 23 21 24 44 21 28 9 13 46 18 13 24 16 13 23 36 7 14 [26] 30 NA 14 18 20 [[2]] [1] 167 197 183 189 95 92 252 220 230 259 236 259 238 24 112 237 224 27 238 [20] 201 238 14 139 49 20 193 145 191 131 223 [[3]] [1] 6.9 5.1 2.8 4.6 7.4 15.5 10.9 10.3 10.9 9.7 14.9 15.5 6.3 10.9 11.5 [16] 6.9 13.8 10.3 10.3 8.0 12.6 9.2 10.3 10.3 16.6 6.9 13.2 14.3 8.0 11.5 [[4]] [1] 91 92 93 93 87 84 80 78 75 73 81 76 77 71 71 78 67 76 68 82 64 71 81 69 63 [26] 70 77 75 76 68 [[5]] [1] 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 9 [[6]] [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 [[7]] [1] 2.67385466 1.92826057 1.72115110 2.46674519 0.64418186 0.02285346 [7] -0.47420927 -0.34994359 -0.43278737 -0.30852169 0.51991618 -0.43278737 [13] -0.14283412 -0.92985010 -0.76416252 0.60275997 -0.55705305 -0.76416252 [19] -0.30852169 -0.63989684 -0.76416252 -0.34994359 0.18854103 -1.01269388 [25] -0.72274063 -0.05999033 NA -0.72274063 -0.55705305 -0.47420927 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist36# #argv <- list(list(c(5.87030131383818+0i, 1.5889879152884+1.34124369386909i, 2.11222603449395-1.81528547759475i, 2.90982451403972-3.07851581383191i, -0.93444299242086+4.19201264862077i, -2.47319172794455-3.70050127054969i, 3.40387225833387-2.03794044354999i, 0.964146923537224+0.43683199768595i, 0.964146923537223-0.43683199768595i, 3.40387225833387+2.03794044354999i, -2.47319172794455+3.70050127054969i, -0.93444299242086-4.19201264862077i, 2.90982451403972+3.07851581383191i, 2.11222603449395+1.81528547759475i, 1.5889879152884-1.34124369386909i), c(-0.198575181429756+0i, 3.06901469564285-0.28753262878135i, 2.52792606446531+0.34832983414202i, -0.22897831647696+4.34107190550675i, -1.1328140942159+1.10933827962707i, -2.13015831304915-3.19551716353477i, 1.66248610578085-2.34843556657312i, 2.53273081248013+0.345339148259i, 2.53273081248013-0.345339148259i, 1.66248610578085+2.34843556657312i, -2.13015831304915+3.19551716353477i, -1.1328140942159-1.10933827962708i, -0.22897831647696-4.34107190550675i, 2.52792606446531-0.34832983414202i, 3.06901469564285+0.28753262878135i), c(-0.177389766587854+0i, -0.750507869921238-0.968112891774716i, 2.01908494011385-1.61353499070386i, -1.32842557557029+1.87677956172028i, 0.278793972604843+0.060190561256586i, 0.06482045217871+2.780245561063i, -3.05075608405522+4.21179315999883i, -0.12202595251607-1.65218285338028i, -0.12202595251607+1.65218285338028i, -3.05075608405522-4.21179315999883i, 0.06482045217871-2.780245561063i, 0.278793972604844-0.060190561256586i, -1.32842557557029-1.87677956172028i, 2.01908494011385+1.61353499070386i, -0.750507869921237+0.968112891774715i), c(-1.93496831243286+0i, -4.87879352188084-3.06857420991118i, 0.91348359987171+2.30355482564816i, 2.7631069926811+6.2396752311874i, -0.9934286053847-5.99510259160787i, 0.39705745560005+3.84166415349047i, -1.5293697261841+2.76025815484515i, 3.48992984345714-5.88708433976428i, 3.48992984345714+5.88708433976428i, -1.5293697261841-2.76025815484515i, 0.39705745560005-3.84166415349047i, -0.99342860538471+5.99510259160787i, 2.7631069926811-6.2396752311874i, 0.91348359987171-2.30355482564816i, -4.87879352188084+3.06857420991118i), c(1.6954625122129+0i, 0.96480086806796-2.54002409930623i, -3.5054253146275-7.05689416264505i, -2.10114573645889-1.07773818646711i, 1.81179418950692+1.03308206229221i, 0.84721205589596-4.740786425434i, -1.90295630545443-1.68686014535334i, -2.43557705822344-1.63964363160433i, -2.43557705822344+1.63964363160433i, -1.90295630545443+1.68686014535334i, 0.84721205589596+4.740786425434i, 1.81179418950692-1.03308206229221i, -2.10114573645889+1.07773818646711i, -3.50542531462751+7.05689416264504i, 0.96480086806796+2.54002409930623i)), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] 5.8703013+0.0000000i 1.5889879+1.3412437i 2.1122260-1.8152855i [4] 2.9098245-3.0785158i -0.9344430+4.1920126i -2.4731917-3.7005013i [7] 3.4038723-2.0379404i 0.9641469+0.4368320i 0.9641469-0.4368320i [10] 3.4038723+2.0379404i -2.4731917+3.7005013i -0.9344430-4.1920126i [13] 2.9098245+3.0785158i 2.1122260+1.8152855i 1.5889879-1.3412437i [16] -0.1985752+0.0000000i 3.0690147-0.2875326i 2.5279261+0.3483298i [19] -0.2289783+4.3410719i -1.1328141+1.1093383i -2.1301583-3.1955172i [22] 1.6624861-2.3484356i 2.5327308+0.3453391i 2.5327308-0.3453391i [25] 1.6624861+2.3484356i -2.1301583+3.1955172i -1.1328141-1.1093383i [28] -0.2289783-4.3410719i 2.5279261-0.3483298i 3.0690147+0.2875326i [31] -0.1773898+0.0000000i -0.7505079-0.9681129i 2.0190849-1.6135350i [34] -1.3284256+1.8767796i 0.2787940+0.0601906i 0.0648205+2.7802456i [37] -3.0507561+4.2117932i -0.1220260-1.6521829i -0.1220260+1.6521829i [40] -3.0507561-4.2117932i 0.0648205-2.7802456i 0.2787940-0.0601906i [43] -1.3284256-1.8767796i 2.0190849+1.6135350i -0.7505079+0.9681129i [46] -1.9349683+0.0000000i -4.8787935-3.0685742i 0.9134836+2.3035548i [49] 2.7631070+6.2396752i -0.9934286-5.9951026i 0.3970575+3.8416642i [52] -1.5293697+2.7602582i 3.4899298-5.8870843i 3.4899298+5.8870843i [55] -1.5293697-2.7602582i 0.3970575-3.8416642i -0.9934286+5.9951026i [58] 2.7631070-6.2396752i 0.9134836-2.3035548i -4.8787935+3.0685742i [61] 1.6954625+0.0000000i 0.9648009-2.5400241i -3.5054253-7.0568942i [64] -2.1011457-1.0777382i 1.8117942+1.0330821i 0.8472121-4.7407864i [67] -1.9029563-1.6868601i -2.4355771-1.6396436i -2.4355771+1.6396436i [70] -1.9029563+1.6868601i 0.8472121+4.7407864i 1.8117942-1.0330821i [73] -2.1011457+1.0777382i -3.5054253+7.0568942i 0.9648009+2.5400241i ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist37# #argv <- list(structure(list(inner = integer(0), outer = integer(0)), .Names = c('inner', 'outer')), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist38# #argv <- list(structure(c('mode', 'length', 'x', 'mode', 'x', 'mode'), .Dim = 2:3), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [,1] [,2] [,3] [1,] "mode" "x" "x" [2,] "length" "mode" "mode" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist39# #argv <- list(list(structure(list(b = structure(2L, .Label = c('C', 'D'), class = 'factor')), .Names = 'b', row.names = 2L, class = 'data.frame'), structure(list(a = structure(NA_real_, class = c('POSIXct', 'POSIXt'))), .Names = 'a', row.names = 'NA', class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] D Levels: C D [[2]] [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist4#Ignored.ImplementationError# #argv <- list(list(list(structure(function (e1, e2) standardGeneric('Ops'), generic = structure('Ops', package = 'base'), package = 'base', group = list(), valueClass = character(0), signature = c('e1', 'e2'), default = quote(`\001NULL\001`), skeleton = quote((function (e1, e2) stop('invalid call in method dispatch to \'Ops\' (no default method)', domain = NA))(e1, e2)), groupMembers = list('Arith', 'Compare', 'Logic'), class = structure('groupGenericFunction', package = 'methods')))), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] function (e1, e2) standardGeneric('Ops') attr(,"generic") [1] "Ops" attr(,"generic")attr(,"package") [1] "base" attr(,"package") [1] "base" attr(,"group") list() attr(,"valueClass") character(0) attr(,"signature") [1] "e1" "e2" attr(,"default") `\001NULL\001` attr(,"skeleton") (function(e1, e2) stop("invalid call in method dispatch to 'Ops' (no default method)", domain = NA))(e1, e2) attr(,"groupMembers") attr(,"groupMembers")[[1]] [1] "Arith" attr(,"groupMembers")[[2]] [1] "Compare" attr(,"groupMembers")[[3]] [1] "Logic" attr(,"class") [1] "groupGenericFunction" attr(,"class")attr(,"package") [1] "methods" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist40# #argv <- list(list(structure(list(structure(c('0.007239522', '0.014584634', '0.014207936', '0.018442267', '0.011128505', '0.019910082', '0.027072311', '0.034140379', '0.028320657', '0.037525507'), class = 'AsIs')), row.names = c(NA, -10L), class = 'data.frame'), structure(list(structure(c(' 1', ' 6', ' 7', ' 8', '13', '14', '15', '20', '21', '22'), class = 'AsIs')), row.names = c(NA, -10L), class = 'data.frame'), structure(list(structure(c(' 16', ' 16', '144', ' 16', ' 16', '128', ' 16', ' 16', '112', ' 16'), .Dim = 10L, .Dimnames = structure(list(c('1', '6', '7', '8', '13', '14', '15', '20', '21', '22')), .Names = ''))), row.names = c('1', '6', '7', '8', '13', '14', '15', '20', '21', '22'), class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] "0.007239522" "0.014584634" "0.014207936" "0.018442267" "0.011128505" [6] "0.019910082" "0.027072311" "0.034140379" "0.028320657" "0.037525507" [[2]] [1] " 1" " 6" " 7" " 8" "13" "14" "15" "20" "21" "22" [[3]] 1 6 7 8 13 14 15 20 21 22 " 16" " 16" "144" " 16" " 16" "128" " 16" " 16" "112" " 16" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist41# #argv <- list(structure(list(N = 84L, ZXrows = 18, ZXcols = 5, Q = 1L, StrRows = 18, qvec = structure(c(1, 0, 0), .Names = c('Seed', '', '')), ngrps = structure(c(14L, 1L, 1L), .Names = c('Seed', 'X', 'y')), DmOff = structure(c(0, 1, 10), .Names = c('', 'Seed', '')), ncol = structure(c(1, 3, 1), .Names = c('Seed', '', '')), nrot = structure(c(4, 1, 0), .Names = c('', '', '')), ZXoff = structure(list(Seed = c(0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13), X = structure(18, .Names = 'Seed'), y = structure(72, .Names = '')), .Names = c('Seed', 'X', 'y')), ZXlen = structure(list(Seed = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 5), X = 18, y = 18), .Names = c('Seed', 'X', 'y')), SToff = structure(list(Seed = c(0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13), X = structure(32, .Names = 'Seed'), y = structure(89, .Names = '')), .Names = c('Seed', 'X', 'y')), DecOff = structure(list(Seed = c(0, 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13), X = structure(18, .Names = 'Seed'), y = structure(72, .Names = '')), .Names = c('Seed', 'X', 'y')), DecLen = structure(list( Seed = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 5), X = 18, y = 18), .Names = c('Seed', 'X', 'y'))), .Names = c('N', 'ZXrows', 'ZXcols', 'Q', 'StrRows', 'qvec', 'ngrps', 'DmOff', 'ncol', 'nrot', 'ZXoff', 'ZXlen', 'SToff', 'DecOff', 'DecLen')), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) N ZXrows ZXcols Q StrRows 84 18 5 1 18 qvec.Seed qvec2 qvec3 ngrps.Seed ngrps.X 1 0 0 14 1 ngrps.y DmOff1 DmOff.Seed DmOff3 ncol.Seed 1 0 1 10 1 ncol2 ncol3 nrot1 nrot2 nrot3 3 1 4 1 0 ZXoff.Seed1 ZXoff.Seed2 ZXoff.Seed3 ZXoff.Seed4 ZXoff.Seed5 0 1 2 3 4 ZXoff.Seed6 ZXoff.Seed7 ZXoff.Seed8 ZXoff.Seed9 ZXoff.Seed10 5 6 7 8 9 ZXoff.Seed11 ZXoff.Seed12 ZXoff.Seed13 ZXoff.Seed14 ZXoff.X.Seed 10 11 12 13 18 ZXoff.y ZXlen.Seed1 ZXlen.Seed2 ZXlen.Seed3 ZXlen.Seed4 72 1 1 1 1 ZXlen.Seed5 ZXlen.Seed6 ZXlen.Seed7 ZXlen.Seed8 ZXlen.Seed9 1 1 1 1 1 ZXlen.Seed10 ZXlen.Seed11 ZXlen.Seed12 ZXlen.Seed13 ZXlen.Seed14 1 1 1 1 5 ZXlen.X ZXlen.y SToff.Seed1 SToff.Seed2 SToff.Seed3 18 18 0 1 2 SToff.Seed4 SToff.Seed5 SToff.Seed6 SToff.Seed7 SToff.Seed8 3 4 5 6 7 SToff.Seed9 SToff.Seed10 SToff.Seed11 SToff.Seed12 SToff.Seed13 8 9 10 11 12 SToff.Seed14 SToff.X.Seed SToff.y DecOff.Seed1 DecOff.Seed2 13 32 89 0 1 DecOff.Seed3 DecOff.Seed4 DecOff.Seed5 DecOff.Seed6 DecOff.Seed7 2 3 4 5 6 DecOff.Seed8 DecOff.Seed9 DecOff.Seed10 DecOff.Seed11 DecOff.Seed12 7 8 9 10 11 DecOff.Seed13 DecOff.Seed14 DecOff.X.Seed DecOff.y DecLen.Seed1 12 13 18 72 1 DecLen.Seed2 DecLen.Seed3 DecLen.Seed4 DecLen.Seed5 DecLen.Seed6 1 1 1 1 1 DecLen.Seed7 DecLen.Seed8 DecLen.Seed9 DecLen.Seed10 DecLen.Seed11 1 1 1 1 1 DecLen.Seed12 DecLen.Seed13 DecLen.Seed14 DecLen.X DecLen.y 1 1 5 18 18 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist42# #argv <- list(structure(list(structure('\n', Rd_tag = 'RCODE'), structure('Sys.timezone()\n', Rd_tag = 'RCODE'), structure('\n', Rd_tag = 'RCODE'), structure('#ifdef windows not active', Rd_tag = 'COMMENT'), structure(list(structure('\n', Rd_tag = 'VERB'), structure('## need to supply a suitable file path (if any) for your system\n', Rd_tag = 'VERB'), structure('tzfile <- \'/usr/share/zoneinfo/zone.tab\'\n', Rd_tag = 'VERB'), structure('tzones <- read.delim(tzfile, row.names = NULL, header = FALSE,\n', Rd_tag = 'VERB'), structure(' col.names = c(\'country\', \'coords\', \'name\', \'comments\'),\n', Rd_tag = 'VERB'), structure(' as.is = TRUE, fill = TRUE, comment.char = \'#\')\n', Rd_tag = 'VERB'), structure('str(tzones$name)\n', Rd_tag = 'VERB')), Rd_tag = '\\dontrun'), structure('\n', Rd_tag = 'RCODE')), Rd_tag = '\\examples'), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] "\n" [2] "Sys.timezone()\n" [3] "\n" [4] "#ifdef windows not active" [5] "\n" [6] "## need to supply a suitable file path (if any) for your system\n" [7] "tzfile <- '/usr/share/zoneinfo/zone.tab'\n" [8] "tzones <- read.delim(tzfile, row.names = NULL, header = FALSE,\n" [9] " col.names = c('country', 'coords', 'name', 'comments'),\n" [10] " as.is = TRUE, fill = TRUE, comment.char = '#')\n" [11] "str(tzones$name)\n" [12] "\n" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist43# #argv <- list(structure(list(`1` = 8.91763605923317e+38), .Names = '1'), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) 1 8.917636e+38 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist44# #argv <- list(list(c(0, 0), c(0, 0, 0, 1), NULL, c(1, 1)), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] 0 0 0 0 0 1 1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist45# #argv <- list(list(structure(list(structure(c('McNeil', 'Ripley', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'AsIs')), row.names = c(NA, -6L), class = 'data.frame'), structure(list(structure(c('Australia', 'UK', 'UK', 'US', 'US', 'Australia'), class = 'AsIs')), row.names = c(NA, -6L), class = 'data.frame'), structure(list(structure(c('no', 'no', 'no', 'no', 'yes', 'no'), class = 'AsIs')), row.names = c(NA, -6L), class = 'data.frame'), structure(list(structure(c('Interactive Data Analysis', 'Spatial Statistics', 'Stochastic Simulation', 'LISP-STAT', 'Exploratory Data Analysis', 'Modern Applied Statistics ...'), class = 'AsIs')), row.names = c(NA, -6L), class = 'data.frame'), structure(list(structure(c(NA, NA, NA, NA, NA, 'Ripley'), class = 'AsIs')), row.names = c(NA, -6L), class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] "McNeil" "Ripley" "Ripley" "Tierney" "Tukey" "Venables" [[2]] [1] "Australia" "UK" "UK" "US" "US" "Australia" [[3]] [1] "no" "no" "no" "no" "yes" "no" [[4]] [1] "Interactive Data Analysis" "Spatial Statistics" [3] "Stochastic Simulation" "LISP-STAT" [5] "Exploratory Data Analysis" "Modern Applied Statistics ..." [[5]] [1] NA NA NA NA NA "Ripley" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist46# #argv <- list(list(structure(list(surname = structure(c(4L, 5L, 3L, 2L, 2L, 1L, 6L), .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables', 'R Core'), class = 'factor'), nationality = structure(c(3L, 1L, 3L, 2L, 2L, 1L, NA), .Label = c('Australia', 'UK', 'US'), class = 'factor'), deceased = structure(c(2L, 1L, 1L, 1L, 1L, 1L, NA), .Label = c('no', 'yes'), class = 'factor')), .Names = c('surname', 'nationality', 'deceased'), row.names = c('1', '2', '3', '4', '4.1', '5', '7'), class = 'data.frame'), structure(list(title = structure(c(2L, 5L, 4L, 6L, 7L, 3L, 1L), .Label = c('An Introduction to R', 'Exploratory Data Analysis', 'Interactive Data Analysis', 'LISP-STAT', 'Modern Applied Statistics ...', 'Spatial Statistics', 'Stochastic Simulation'), class = 'factor'), other.author = structure(c(NA, 1L, NA, NA, NA, NA, 2L), .Label = c('Ripley', 'Venables & Smith'), class = 'factor')), .Names = c('title', 'other.author'), row.names = c(NA, 7L), class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] Tukey Venables Tierney Ripley Ripley McNeil R Core Levels: McNeil Ripley Tierney Tukey Venables R Core [[2]] [1] US Australia US UK UK Australia Levels: Australia UK US [[3]] [1] yes no no no no no Levels: no yes [[4]] [1] Exploratory Data Analysis Modern Applied Statistics ... [3] LISP-STAT Spatial Statistics [5] Stochastic Simulation Interactive Data Analysis [7] An Introduction to R 7 Levels: An Introduction to R ... Stochastic Simulation [[5]] [1] Ripley [5] Venables & Smith Levels: Ripley Venables & Smith ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist47# #argv <- list(list(structure(list(structure('DateTimeClasses', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('POSIXt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('print.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('print.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('summary.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('summary.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('+.POSIXt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('-.POSIXt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('Ops.POSIXt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('Math.POSIXt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('Summary.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('Math.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('Summary.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('[.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('[<-.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('[[.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('[.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('[<-.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('as.data.frame.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('as.data.frame.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('as.list.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('.leap.seconds', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('is.na.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('c.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('c.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list( structure('as.matrix.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('length.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('mean.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('mean.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('str.POSIXt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('check_tzones', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('duplicated.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('unique.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('split.POSIXct', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('names.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('names<-.POSIXlt', Rd_tag = 'VERB')), Rd_tag = '\\alias'), structure(list(structure('date-time', Rd_tag = 'VERB')), Rd_tag = '\\alias')), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] "DateTimeClasses" "POSIXct" "POSIXlt" [4] "POSIXt" "print.POSIXct" "print.POSIXlt" [7] "summary.POSIXct" "summary.POSIXlt" "+.POSIXt" [10] "-.POSIXt" "Ops.POSIXt" "Math.POSIXt" [13] "Summary.POSIXct" "Math.POSIXlt" "Summary.POSIXlt" [16] "[.POSIXct" "[<-.POSIXct" "[[.POSIXct" [19] "[.POSIXlt" "[<-.POSIXlt" "as.data.frame.POSIXct" [22] "as.data.frame.POSIXlt" "as.list.POSIXct" ".leap.seconds" [25] "is.na.POSIXlt" "c.POSIXct" "c.POSIXlt" [28] "as.matrix.POSIXlt" "length.POSIXlt" "mean.POSIXct" [31] "mean.POSIXlt" "str.POSIXt" "check_tzones" [34] "duplicated.POSIXlt" "unique.POSIXlt" "split.POSIXct" [37] "names.POSIXlt" "names<-.POSIXlt" "date-time" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist48# #argv <- list(structure(list(c(3L, 0L, 0L)), class = 'numeric_version'), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] 3 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist49# #argv <- list(list(structure(list(x = 1L, y = structure(1L, .Label = c('A', 'D', 'E'), class = 'factor'), z = 6), .Names = c('x', 'y', 'z'), row.names = 1L, class = 'data.frame'), structure(list(), .Names = character(0), row.names = 1L, class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] 1 [[2]] [1] A Levels: A D E [[3]] [1] 6 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist5# #argv <- list(structure(list(sec = c(8.40000009536743, 8.80000019073486), min = c(14L, 14L), hour = c(22L, 22L)), .Names = c('sec', 'min', 'hour')), TRUE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) sec1 sec2 min1 min2 hour1 hour2 8.4 8.8 14.0 14.0 22.0 22.0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist6# #argv <- list(list(structure(list(c(NA, 0L)), row.names = c(NA, -2L), class = 'data.frame'), structure(list(c(NA, 0)), row.names = c(NA, -2L), class = 'data.frame'), structure(list(c(10L, 10L)), row.names = c(NA, -2L), class = 'data.frame'), structure(list(c(2.74035772634541, 2.74035772634541)), row.names = c(NA, -2L), class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] [1] NA 0 [[2]] [1] NA 0 [[3]] [1] 10 10 [[4]] [1] 2.740358 2.740358 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist7# #argv <- list(structure(list(diagonalMatrix = 1, lMatrix = 1, sparseMatrix = 2, Matrix = 2, mMatrix = 4), .Names = c('diagonalMatrix', 'lMatrix', 'sparseMatrix', 'Matrix', 'mMatrix')), FALSE, TRUE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) diagonalMatrix lMatrix sparseMatrix Matrix mMatrix 1 1 2 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist8# #argv <- list(list(structure(list(), .Names = character(0), row.names = integer(0), class = 'data.frame'), structure(list(height = numeric(0), weight = numeric(0)), .Names = c('height', 'weight'), row.names = integer(0), class = 'data.frame')), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [[1]] numeric(0) [[2]] numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unlist.testunlist9# #argv <- list(list(c(TRUE, FALSE, FALSE, FALSE, FALSE), c(TRUE, TRUE, TRUE, TRUE, NA)), FALSE, FALSE); .Internal(unlist(argv[[1]], argv[[2]], argv[[3]])) [1] TRUE FALSE FALSE FALSE FALSE TRUE TRUE TRUE TRUE NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize("Hello world", NULL, version=2)) [1] "Hello world" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize("Hello world", NULL, version=3)) [1] "Hello world" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize((1:15)+0.1, NULL, version=2)) [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 11.1 12.1 13.1 14.1 15.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize((1:15)+0.1, NULL, version=3)) [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 11.1 12.1 13.1 14.1 15.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(1:15, NULL, version=2)) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(1:15, NULL, version=3)) [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(3+2i, NULL, version=2)) [1] 3+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(3+2i, NULL, version=3)) [1] 3+2i ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(3L, NULL, version=2)) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(3L, NULL, version=3)) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(42, NULL, version=2)) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(42, NULL, version=3)) [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(NULL, NULL, version=2)) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(NULL, NULL, version=3)) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(TRUE, NULL, version=2)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(TRUE, NULL, version=3)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(c(1,2,3,4), NULL, version=2)) [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(c(1,2,3,4), NULL, version=3)) [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(c(1L,2L,99L,NA), NULL, version=2)) [1] 1 2 99 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(c(1L,2L,99L,NA), NULL, version=3)) [1] 1 2 99 NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(c(3+2i, 5+944i, NA), NULL, version=2)) [1] 3+ 2i 5+944i NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(c(3+2i, 5+944i, NA), NULL, version=3)) [1] 3+ 2i 5+944i NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(c(TRUE, FALSE, NA, FALSE, TRUE), NULL, version=2)) [1] TRUE FALSE NA FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(c(TRUE, FALSE, NA, FALSE, TRUE), NULL, version=3)) [1] TRUE FALSE NA FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(data.frame(col1=c(9,8,7), col2=1:3), NULL, version=2)) col1 col2 1 9 1 2 8 2 3 7 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(data.frame(col1=c(9,8,7), col2=1:3), NULL, version=3)) col1 col2 1 9 1 2 8 2 3 7 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(expression(x+1), NULL, version=2)) expression(x + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(expression(x+1), NULL, version=3)) expression(x + 1) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(head(mtcars), NULL, version=2)) mpg cyl disp hp drat wt qsec vs am gear carb Mazda RX4 21.0 6 160 110 3.90 2.620 16.46 0 1 4 4 Mazda RX4 Wag 21.0 6 160 110 3.90 2.875 17.02 0 1 4 4 Datsun 710 22.8 4 108 93 3.85 2.320 18.61 1 1 4 1 Hornet 4 Drive 21.4 6 258 110 3.08 3.215 19.44 1 0 3 1 Hornet Sportabout 18.7 8 360 175 3.15 3.440 17.02 0 0 3 2 Valiant 18.1 6 225 105 2.76 3.460 20.22 1 0 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(head(mtcars), NULL, version=3)) mpg cyl disp hp drat wt qsec vs am gear carb Mazda RX4 21.0 6 160 110 3.90 2.620 16.46 0 1 4 4 Mazda RX4 Wag 21.0 6 160 110 3.90 2.875 17.02 0 1 4 4 Datsun 710 22.8 4 108 93 3.85 2.320 18.61 1 1 4 1 Hornet 4 Drive 21.4 6 258 110 3.08 3.215 19.44 1 0 3 1 Hornet Sportabout 18.7 8 360 175 3.15 3.440 17.02 0 0 3 2 Valiant 18.1 6 225 105 2.76 3.460 20.22 1 0 3 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(list(1,2), NULL, version=2)) [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.tests# #unserialize(serialize(list(1,2), NULL, version=3)) [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testserializeAndUnserializeClosure# #f <- function() x; e <- new.env(); e$x <- 123; environment(f) <- e; expr <- substitute({ FUN() }, list(FUN=f)); eval(expr); expr <- unserialize(serialize(expr, NULL, version=2)); eval(expr) [1] 123 [1] 123 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testserializeAndUnserializeClosure# #f <- function() x; e <- new.env(); e$x <- 123; environment(f) <- e; expr <- substitute({ FUN() }, list(FUN=f)); eval(expr); expr <- unserialize(serialize(expr, NULL, version=3)); eval(expr) [1] 123 [1] 123 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testserializeAndUnserializeClosure#Output.IgnoreWhitespace# #unserialize(serialize(function (x) { x }, NULL, version=2)) function (x) { x } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testserializeAndUnserializeClosure#Output.IgnoreWhitespace# #unserialize(serialize(function (x) { x }, NULL, version=3)) function (x) { x } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(function() { !T&F }), connection=NULL, version=2) Error in unserialize(serialize(function() { : unused argument (version = 2) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(function() { !T&F }), connection=NULL, version=3) Error in unserialize(serialize(function() { : unused argument (version = 3) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote("bar"), connection=NULL, version=2)) [1] "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote("bar"), connection=NULL, version=3)) [1] "bar" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote('asdf'), connection=NULL, version=2)) [1] "asdf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote('asdf'), connection=NULL, version=3)) [1] "asdf" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote('baz'), connection=NULL, version=2)) [1] "baz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote('baz'), connection=NULL, version=3)) [1] "baz" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote((a %asdf% b)), connection=NULL, version=2)) (a %asdf% b) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote((a %asdf% b)), connection=NULL, version=3)) (a %asdf% b) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote((a+b)), connection=NULL, version=2)) (a + b) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote((a+b)), connection=NULL, version=3)) (a + b) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(111+11), connection=NULL, version=2)) 111 + 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(111+11), connection=NULL, version=3)) 111 + 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(111+8i), connection=NULL, version=2)) 111 + (0+8i) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(111+8i), connection=NULL, version=3)) 111 + (0+8i) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(111L), connection=NULL, version=2)) [1] 111 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(111L), connection=NULL, version=3)) [1] 111 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(FALSE), connection=NULL, version=2)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(FALSE), connection=NULL, version=3)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(NA_character_ + NA_complex_ + NA_integer_ + NA_real_), connection=NULL, version=2)) NA_character_ + (NA_complex_) + NA_integer_ + NA_real_ ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(NA_character_ + NA_complex_ + NA_integer_ + NA_real_), connection=NULL, version=3)) NA_character_ + (NA_complex_) + NA_integer_ + NA_real_ ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(NA_character_), connection=NULL, version=2)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(NA_character_), connection=NULL, version=3)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(NA_complex_), connection=NULL, version=2)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(NA_complex_), connection=NULL, version=3)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(NA_integer_), connection=NULL, version=2)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(NA_integer_), connection=NULL, version=3)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(NA_real_), connection=NULL, version=2)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(NA_real_), connection=NULL, version=3)) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(TRUE), connection=NULL, version=2)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(TRUE), connection=NULL, version=3)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(a(b(c(d(function (e, ...) { f(g)$h.i}))))), connection=NULL, version=2)) a(b(c(d(function(e, ...) { f(g)$h.i })))) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(a(b(c(d(function (e, ...) { f(g)$h.i}))))), connection=NULL, version=3)) a(b(c(d(function(e, ...) { f(g)$h.i })))) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(a+b), connection=NULL, version=2)) a + b ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(a+b), connection=NULL, version=3)) a + b ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(f(g)$h.i), connection=NULL, version=2)) f(g)$h.i ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(f(g)$h.i), connection=NULL, version=3)) f(g)$h.i ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(foo(a,b,c)), connection=NULL, version=2)) foo(a, b, c) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(foo(a,b,c)), connection=NULL, version=3)) foo(a, b, c) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function() new("foo", x)), connection=NULL, version=2)) function() new("foo", x) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function() new("foo", x)), connection=NULL, version=3)) function() new("foo", x) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(function(x) { `+`(`(`("BAR"), x) }), connection=NULL, version=2)) function(x) { ("BAR") + x } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(function(x) { `+`(`(`("BAR"), x) }), connection=NULL, version=3)) function(x) { ("BAR") + x } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x) { new("BAR", x) }), connection=NULL, version=2)) function(x) { new("BAR", x) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x) { new("BAR", x) }), connection=NULL, version=3)) function(x) { new("BAR", x) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x, ...) { new("BAR", x) }), connection=NULL, version=2)) function(x, ...) { new("BAR", x) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x, ...) { new("BAR", x) }), connection=NULL, version=3)) function(x, ...) { new("BAR", x) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x,y) { TRUE }), connection=NULL, version=2)) function(x, y) { TRUE } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x,y) { TRUE }), connection=NULL, version=3)) function(x, y) { TRUE } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x,y) { new("BAR", x) }), connection=NULL, version=2)) function(x, y) { new("BAR", x) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x,y) { new("BAR", x) }), connection=NULL, version=3)) function(x, y) { new("BAR", x) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x,y,...) { 1 }), connection=NULL, version=2)) function(x, y, ...) { 1 } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x,y,...) { 1 }), connection=NULL, version=3)) function(x, y, ...) { 1 } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x,y=1,...) { NA }), connection=NULL, version=2)) function(x, y = 1, ...) { NA } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(function(x,y=1,...) { NA }), connection=NULL, version=3)) function(x, y = 1, ...) { NA } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(function(x={1 + a},y,...) { !!NA }), connection=NULL, version=2)) function(x = { 1 + a }, y, ...) { !!NA } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(function(x={1 + a},y,...) { !!NA }), connection=NULL, version=3)) function(x = { 1 + a }, y, ...) { !!NA } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(function(x={1 + a},y,...) { !1+5i }), connection=NULL, version=2)) function(x = { 1 + a }, y, ...) { !1 + (0+5i) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(function(x={1 + a},y,...) { !1+5i }), connection=NULL, version=3)) function(x = { 1 + a }, y, ...) { !1 + (0+5i) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(function(x={1 + a},y,...) { NA }), connection=NULL, version=2)) function(x = { 1 + a }, y, ...) { NA } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(function(x={1 + a},y,...) { NA }), connection=NULL, version=3)) function(x = { 1 + a }, y, ...) { NA } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(function(x={1 + a},y=c(1,2,3),z="foo",...) { !1+5i }), connection=NULL, version=2)) function(x = { 1 + a }, y = c(1, 2, 3), z = "foo", ...) { !1 + (0+5i) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(function(x={1 + a},y=c(1,2,3),z="foo",...) { !1+5i }), connection=NULL, version=3)) function(x = { 1 + a }, y = c(1, 2, 3), z = "foo", ...) { !1 + (0+5i) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(if (a * 2 < 199) b + foo(x,y,foo=z+1,bar=)), connection=NULL, version=2)) if (a * 2 < 199) b + foo(x, y, foo = z + 1, bar = ) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(if (a * 2 < 199) b + foo(x,y,foo=z+1,bar=)), connection=NULL, version=3)) if (a * 2 < 199) b + foo(x, y, foo = z + 1, bar = ) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(if (a) b else c), connection=NULL, version=2)) if (a) b else c ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(if (a) b else c), connection=NULL, version=3)) if (a) b else c ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(if (a) {b} else {c}), connection=NULL, version=2)) if (a) { b } else { c } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(if (a) {b} else {c}), connection=NULL, version=3)) if (a) { b } else { c } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(if ({a}) {b} else {c}), connection=NULL, version=2)) if ({ a }) { b } else { c } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(if ({a}) {b} else {c}), connection=NULL, version=3)) if ({ a }) { b } else { c } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(repeat {b; if (c) next else break}), connection=NULL, version=2)) repeat { b if (c) next else break } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.IgnoreWhitespace# #options(keep.source=FALSE); unserialize(serialize(quote(repeat {b; if (c) next else break}), connection=NULL, version=3)) repeat { b if (c) next else break } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(while (a) b), connection=NULL, version=2)) while (a) b ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(while (a) b), connection=NULL, version=3)) while (a) b ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(x), connection=NULL, version=2)) x ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote(x), connection=NULL, version=3)) x ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote({ foo(a,b,c) }), connection=NULL, version=2)) { foo(a, b, c) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); unserialize(serialize(quote({ foo(a,b,c) }), connection=NULL, version=3)) { foo(a, b, c) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); val <- defaultPrototype(); unserialize(serialize(val, connection=NULL, version=2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #options(keep.source=FALSE); val <- defaultPrototype(); unserialize(serialize(val, connection=NULL, version=3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- list(enclos = new.env(hash=FALSE)); unserialize(serialize(val, connection=NULL, version=2)) $enclos ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- list(enclos = new.env(hash=FALSE)); unserialize(serialize(val, connection=NULL, version=3)) $enclos ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); unserialize(serialize(val, connection=NULL, version=2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); unserialize(serialize(val, connection=NULL, version=3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$a <- 'foo'; unserialize(serialize(val, connection=NULL, version=2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$a <- 'foo'; unserialize(serialize(val, connection=NULL, version=3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$b <- 123; unserialize(serialize(val, connection=NULL, version=2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$b <- 123; unserialize(serialize(val, connection=NULL, version=3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$c <- 1233L; unserialize(serialize(val, connection=NULL, version=2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$c <- 1233L; unserialize(serialize(val, connection=NULL, version=3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$d <- TRUE; unserialize(serialize(val, connection=NULL, version=2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$d <- TRUE; unserialize(serialize(val, connection=NULL, version=3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$e <- 5+9i; unserialize(serialize(val, connection=NULL, version=2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$e <- 5+9i; unserialize(serialize(val, connection=NULL, version=3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$f <- NA; unserialize(serialize(val, connection=NULL, version=2)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize#Output.ContainsReferences# #options(keep.source=FALSE); val <- new.env(hash=FALSE); val$f <- NA; unserialize(serialize(val, connection=NULL, version=3)) ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #setClass('foo', slots = c(x='numeric', y='numeric')); t1 <- new('foo', x=4, y=c(77,88)); options(keep.source=FALSE); unserialize(serialize(t1, connection=NULL, version=2)) An object of class "foo" Slot "x": [1] 4 Slot "y": [1] 77 88 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserialize# #setClass('foo', slots = c(x='numeric', y='numeric')); t1 <- new('foo', x=4, y=c(77,88)); options(keep.source=FALSE); unserialize(serialize(t1, connection=NULL, version=3)) An object of class "foo" Slot "x": [1] 4 Slot "y": [1] 77 88 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeDeferredString# #e <- unserialize(file('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/builtins/data/serializedDeferredStrings', open='rb')); e$is; e$iv; e$rs; e$rv; e$isa; e$iva; e$rsa; e$rva [1] "1" "2" "3" [1] "2" "4" "6" [1] "1.1" "2.1" "3.1" [1] "2.1" "4.1" "6.1" [1] "1" "2" "3" attr(,"testattr") [1] "testattrValue" [1] "2" "4" "6" attr(,"testattr") [1] "testattrValue" [1] "1.1" "2.1" "3.1" attr(,"testattr") [1] "testattrValue" [1] "2.1" "4.1" "6.1" attr(,"testattr") [1] "testattrValue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.RDoubleVector<<>>') } else { v <- unserialize(serialize(1.1:10.1, connection=NULL, version=2)); .fastr.inspect(v) } com.oracle.truffle.r.runtime.data.RDoubleVector ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.RDoubleVector<<>>') } else { v <- unserialize(serialize(1.1:10.1, connection=NULL, version=3)); .fastr.inspect(v) } com.oracle.truffle.r.runtime.data.RDoubleVector ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.RIntSeqVectorData<<>>') } else { v <- unserialize(serialize(1:10, connection=NULL, version=3)); .fastr.inspect(v, inspectVectorData=T) } com.oracle.truffle.r.runtime.data.RIntSeqVectorData ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.RIntSeqVectorData<<>>') } else { v <- unserialize(serialize(1L:10L, connection=NULL, version=3)); .fastr.inspect(v, inspectVectorData=T) } com.oracle.truffle.r.runtime.data.RIntSeqVectorData ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq#Ignored.Unimplemented# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.RIntSequence<<>>') } else { s <- unserialize(serialize(1:2147483648, connection=NULL, version=3)); .fastr.inspect(s) } com.oracle.truffle.r.runtime.data.RIntSequence ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.RIntVector<<>>') } else { v <- unserialize(serialize(1:10, connection=NULL, version=2)); .fastr.inspect(v) } com.oracle.truffle.r.runtime.data.RIntVector ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.RIntVector<<>>') } else { v <- unserialize(serialize(1L:10L, connection=NULL, version=2)); .fastr.inspect(v) } com.oracle.truffle.r.runtime.data.RIntVector ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #s <- 1.1:10.1; attr(s, 'testattr') <- 'attrvalue'; unserialize(serialize(s, connection=NULL, version=2)) [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 attr(,"testattr") [1] "attrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #s <- 1.1:10.1; attr(s, 'testattr') <- 'attrvalue'; unserialize(serialize(s, connection=NULL, version=3)) [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 attr(,"testattr") [1] "attrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #s <- 1:10; attr(s, 'testattr') <- 'attrvalue'; unserialize(serialize(s, connection=NULL, version=2)) [1] 1 2 3 4 5 6 7 8 9 10 attr(,"testattr") [1] "attrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #s <- 1:10; attr(s, 'testattr') <- 'attrvalue'; unserialize(serialize(s, connection=NULL, version=3)) [1] 1 2 3 4 5 6 7 8 9 10 attr(,"testattr") [1] "attrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #s <- 1L:10L; attr(s, 'testattr') <- 'attrvalue'; unserialize(serialize(s, connection=NULL, version=2)) [1] 1 2 3 4 5 6 7 8 9 10 attr(,"testattr") [1] "attrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #s <- 1L:10L; attr(s, 'testattr') <- 'attrvalue'; unserialize(serialize(s, connection=NULL, version=3)) [1] 1 2 3 4 5 6 7 8 9 10 attr(,"testattr") [1] "attrvalue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #unserialize(serialize(1.1:10.1, connection=NULL, version=2)) [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #unserialize(serialize(1.1:10.1, connection=NULL, version=3)) [1] 1.1 2.1 3.1 4.1 5.1 6.1 7.1 8.1 9.1 10.1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #unserialize(serialize(1:10, connection=NULL, version=2)) [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #unserialize(serialize(1:10, connection=NULL, version=3)) [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #unserialize(serialize(1L:10L, connection=NULL, version=2)) [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeSeq# #unserialize(serialize(1L:10L, connection=NULL, version=3)) [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.builtins.TestBuiltin_unserialize.testunserializeWrappers# #e <- unserialize(file('com.oracle.truffle.r.test/src/com/oracle/truffle/r/test/builtins/data/serializedWrappers', open='rb')); e$iv; e$rv; e$iva; e$rva [1] 11 22 33 [1] 11.1 22.1 33.1 [1] 11 22 33 attr(,"testattr") [1] "testattrValue" [1] 11.1 22.1 33.1 attr(,"testattr") [1] "testattrValue" ##com.oracle.truffle.r.test.builtins.TestBuiltin_unzip.testunzip# #n <- tempfile(); writeBin(con=n,as.raw(c(0x50, 0x4b, 0x03, 0x04, 0x0a, 0x00, 0x00, 0x00, 0x00, 0x00, 0x60, 0x6e, 0xf3, 0x4a, 0xb7, 0xef, 0xdc, 0x83, 0x01, 0x00, 0x00, 0x00, 0x01, 0x00, 0x00, 0x00, 0x04, 0x00, 0x1c, 0x00, 0x66, 0x6f, 0x6f, 0x31, 0x55, 0x54, 0x09, 0x00, 0x03, 0xa3, 0x47, 0x6f, 0x59, 0xad, 0x47, 0x6f, 0x59, 0x75, 0x78, 0x0b, 0x00, 0x01, 0x04, 0xf5, 0x01, 0x00, 0x00, 0x04, 0x14, 0x00, 0x00, 0x00, 0x31, 0x50, 0x4b, 0x01, 0x02, 0x1e, 0x03, 0x0a, 0x00, 0x00, 0x00, 0x00, 0x00, 0x60, 0x6e, 0xf3, 0x4a, 0xb7, 0xef, 0xdc, 0x83, 0x01, 0x00, 0x00, 0x00, 0x01, 0x00, 0x00, 0x00, 0x04, 0x00, 0x18, 0x00, 0x00, 0x00, 0x00, 0x00, 0x01, 0x00, 0x00, 0x00, 0xa4, 0x81, 0x00, 0x00, 0x00, 0x00, 0x66, 0x6f, 0x6f, 0x31, 0x55, 0x54, 0x05, 0x00, 0x03, 0xa3, 0x47, 0x6f, 0x59, 0x75, 0x78, 0x0b, 0x00, 0x01, 0x04, 0xf5, 0x01, 0x00, 0x00, 0x04, 0x14, 0x00, 0x00, 0x00, 0x50, 0x4b, 0x05, 0x06, 0x00, 0x00, 0x00, 0x00, 0x01, 0x00, 0x01, 0x00, 0x4a, 0x00, 0x00, 0x00, 0x3f, 0x00, 0x00, 0x00, 0x00, 0x00)))<<>>length(unzip(n,list=T))<<>>names(unzip(n,list=T))<<>>unzip(n,list=T)[1:2]<<>>target <- tempdir()<<>>v <- unzip(n,exdir=target, files=c('bar','baz'))<<>>v<<>>file.exists(paste0(target, '/foo1'))<<>>v <- unzip(n,exdir=target)<<>>length(v)<<>>file.exists(v)<<>>readBin(paste0(target, '/foo1'), what='raw', n=1000) [1] 3 [1] "Name" "Length" "Date" Name Length 1 foo1 1 Warning message: In unzip(n, exdir = target, files = c("bar", "baz")) : requested file not found in the zip file character(0) [1] FALSE [1] 1 [1] TRUE [1] 31 ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testUtf8ToInt# #utf8ToInt('') integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testUtf8ToInt# #utf8ToInt('Hello') [1] 72 101 108 108 111 ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testUtf8ToInt# #utf8ToInt('a') [1] 97 ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testUtf8ToInt# #utf8ToInt(5) Error in utf8ToInt(5) : argument must be a character vector of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testUtf8ToInt# #utf8ToInt(NA) Error in utf8ToInt(NA) : argument must be a character vector of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testUtf8ToInt# #utf8ToInt(NULL) Error in utf8ToInt(NULL) : argument must be a character vector of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testUtf8ToInt#Output.IgnoreWhitespace# #utf8ToInt(c('a', 'b')) [1] 97 Warning message: In utf8ToInt(c("a", "b")) : argument should be a character vector of length 1 all but the first element will be ignored ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testUtf8ToInt# #utf8ToInt(character(0)) Error in utf8ToInt(character(0)) : argument must be a character vector of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testUtf8ToInt# #utf8ToInt(numeric(0)) Error in utf8ToInt(numeric(0)) : argument must be a character vector of length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testutf8ToInt1# #argv <- list('lasy'); .Internal(utf8ToInt(argv[[1]])) [1] 108 97 115 121 ##com.oracle.truffle.r.test.builtins.TestBuiltin_utf8ToInt.testutf8ToInt3# #argv <- structure(list(x = NA_character_), .Names = 'x');do.call('utf8ToInt', argv) [1] NA ##com.oracle.truffle.r.test.builtins.TestBuiltin_validUTF8.testUtf8ToInt# #validUTF8('abc') [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testApply# #{ m <- matrix(c(1,2,3,4,5,6),2) ; apply(m,1,sum) } [1] 9 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testApply# #{ m <- matrix(c(1,2,3,4,5,6),2) ; apply(m,2,sum) } [1] 3 7 11 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ f <- function(a, ...) vapply(a, function(.) identical(a, T, ...), NA); v <- c(1,2,3); f(v) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ f<-function(x) as.integer(x + 1) ; y<-vapply(list(1:3, 6:8), f, rep(7, 3)); y } [,1] [,2] [1,] 2 7 [2,] 3 8 [3,] 4 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ f<-function(x) x + 1 ; y<-vapply(list(1:3), f, rep(as.double(NA), 3)); y } [,1] [1,] 2 [2,] 3 [3,] 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ f<-function(x) x + 1 ; y<-vapply(list(1:3, 6:8), f, rep(as.double(NA), 3)); y } [,1] [,2] [1,] 2 7 [2,] 3 8 [3,] 4 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ f<-function(x,y) x-y; w<-c(42, 42); z<-7; vapply(w, f, as.double(NA), x=z) } [1] -35 -35 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ iv <- integer(1); iv[[1]] = 1L; vapply(c(1L, 2L, 3L, 4L), function(x) x+5L, iv) } [1] 6 7 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply#Output.IgnoreErrorContext# #{ vapply(1:3, function(x) rep(1, x), 1); } Error in vapply(1:3, function(x) rep(1, x), 1) : values must be length 1, but FUN(X[[2]]) result is length 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply#Output.IgnoreErrorContext# #{ vapply(1:3, function(x) rep(1, x), 1:3); } Error in vapply(1:3, function(x) rep(1, x), 1:3) : values must be length 3, but FUN(X[[1]]) result is length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply#Output.IgnoreErrorContext# #{ vapply(1:3, function(x) rep(1, x), 1L:3L); } Error in vapply(1:3, function(x) rep(1, x), 1L:3L) : values must be length 3, but FUN(X[[1]]) result is length 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c("foo", "bar"), 42, c(TRUE)) } Error in match.fun(FUN) : '42' is not a function, character or symbol ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply#Output.IgnoreErrorContext# #{ vapply(c("foo", "bar"), function(x) FALSE, c(TRUE), USE.NAMES="42") } Error in vapply(c("foo", "bar"), function(x) FALSE, c(TRUE), USE.NAMES = "42") : invalid 'USE.NAMES' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c("foo", "bar"), function(x) FALSE, c(TRUE), USE.NAMES=42) } foo bar FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply#Output.IgnoreErrorContext# #{ vapply(c("foo", "bar"), function(x) FALSE, c(TRUE), USE.NAMES=logical()) } Error in vapply(c("foo", "bar"), function(x) FALSE, c(TRUE), USE.NAMES = logical()) : invalid 'USE.NAMES' value ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply#Output.IgnoreErrorContext# #{ vapply(c("foo", "bar"), function(x) FALSE, function() 42) } Error in vapply(c("foo", "bar"), function(x) FALSE, function() 42) : 'FUN.VALUE' must be a vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c("hello", "goodbye", "up", "down"), function(x) x, c("a")) } hello goodbye up down "hello" "goodbye" "up" "down" ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c("hello", "goodbye", "up", "down"), function(x) x, c("a"), USE.NAMES = FALSE) } [1] "hello" "goodbye" "up" "down" ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c(1,2,3), 42, 1); } Error in match.fun(FUN) : '42' is not a function, character or symbol ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c(10, 20, 30, 40), function(x) x/2, c(1)) } [1] 5 10 15 20 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c(1L, 2L, 3L, 4L), function(x) x+5L, c(1L)) } [1] 6 7 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c(1L, 2L, 3L, 4L), function(x, y) x+5L, c(1L), 10) } [1] 6 7 8 9 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c(3+2i, 7-4i, 8+6i), function(x) x+(3+2i), c(1+1i)) } [1] 6+4i 10-2i 11+8i ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c(TRUE, FALSE, TRUE), function(x) FALSE, c(TRUE)) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(c(TRUE, FALSE, TRUE), function(x) x, c(TRUE)) } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply# #{ vapply(quote(a), function(x) 42, 1); } [1] 42 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapply#Output.IgnoreErrorContext# #{ vapply(quote(a), function(x) quote(b), quote(a)); } Error in vapply(quote(a), function(x) quote(b), quote(a)) : 'FUN.VALUE' must be a vector ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapplyNames# #{ a <- vapply(list(a=1:20,b=1:20), function (x) x, FUN.VALUE=1:20); attributes(a); a[1:5] } [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapplyNames# #{ a<-structure(1:2, names=c('a1','a2')); b<-vapply(a, function(v) v + 3, 0); names(b)[1]<-'x'; a } a1 a2 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vapply.testVapplyNames# #{ b <- list(a=structure(c(1:3), names=c('x','y')),b=structure(c(1:3), names=c('x2','y2','z2'))); a <- vapply(b, function (x) x, FUN.VALUE=1:3); attributes(a); a[1:5] } [1] 1 2 3 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorConstructor# #{ vector("numeric", c(7, 42)) } Error in vector("numeric", c(7, 42)) : invalid 'length' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorConstructor# #{ vector("numeric", integer()) } Error in vector("numeric", integer()) : invalid 'length' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorConstructor# #{ vector("integer") } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorConstructor# #{ vector("numeric") } numeric(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorConstructor# #{ vector("numeric", length=4) } [1] 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorConstructor# #{ vector() } logical(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorConstructor# #{ vector(c("numeric", "numeric")) } Error in vector(c("numeric", "numeric")) : invalid 'mode' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorConstructor# #{ vector(character()) } Error in vector(character()) : invalid 'mode' argument ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorConstructor# #{ vector(length=3) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorConstructor# #{ x<-as.vector(3); y<-vector(length=x) } ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorNASubscript# #v <- as.integer(c(1, 2)); v[1]<-NA_integer_; v [1] NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorNASubscript# #v <- as.integer(c(1, 2, 3, 4)); dim(v)<-c(2,2); v[1, 1]<-NA_integer_; v [,1] [,2] [1,] NA 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorNASubscript# #v <- c('a', 'b'); v[1]<-NA_character_; v [1] NA "b" ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorNASubscript# #v <- c('a', 'b', 'c', 'd'); dim(v)<-c(2,2); v[1, 1]<-NA_character_; v [,1] [,2] [1,] NA "c" [2,] "b" "d" ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorNASubscript# #v <- c(1, 2); v[1]<-NA_integer_; v [1] NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorNASubscript# #v <- c(1, 2); v[1]<-NA_real_; v [1] NA 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorNASubscript# #v <- c(1, 2, 3, 4); dim(v)<-c(2,2); v[1, 1]<-NA_integer_; v [,1] [,2] [1,] NA 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorNASubscript# #v <- c(1, 2, 3, 4); dim(v)<-c(2,2); v[1, 1]<-NA_real_; v [,1] [,2] [1,] NA 3 [2,] 2 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorWithPairlist# #vector('pairlist', 0) NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testVectorWithPairlist# #vector('pairlist', 3) [[1]] NULL [[2]] NULL [[3]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testvector1# #argv <- list('integer', 0L); .Internal(vector(argv[[1]], argv[[2]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testvector10# #argv <- list('list', structure(1L, .Names = '\\c')); .Internal(vector(argv[[1]], argv[[2]])) [[1]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testvector11# #argv <- structure(list(mode = 'complex', length = 7), .Names = c('mode', 'length'));do.call('vector', argv) [1] 0+0i 0+0i 0+0i 0+0i 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testvector2# #argv <- list('double', 17.1); .Internal(vector(argv[[1]], argv[[2]])) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testvector3# #argv <- list('list', 1L); .Internal(vector(argv[[1]], argv[[2]])) [[1]] NULL ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testvector4# #argv <- list('logical', 15L); .Internal(vector(argv[[1]], argv[[2]])) [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testvector5# #argv <- list('double', 2); .Internal(vector(argv[[1]], argv[[2]])) [1] 0 0 ##com.oracle.truffle.r.test.builtins.TestBuiltin_vector.testvector9# #argv <- list('raw', 0L); .Internal(vector(argv[[1]], argv[[2]])) raw(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_warning.testwarning# #f <- function() warning('foo'); f() Warning message: In f() : foo ##com.oracle.truffle.r.test.builtins.TestBuiltin_warning.testwarning# #f <- function() warning('foo'); f2 <- function() f(); f2() Warning message: In f() : foo ##com.oracle.truffle.r.test.builtins.TestBuiltin_warning.testwarning# #op.warn <- getOption('warn'); options(warn = 2); f <- function() warning('foo'); f2 <- function() f(); tryCatch(f2(), finally={options(warn = op.warn)}) Error in f() : (converted from warning) foo ##com.oracle.truffle.r.test.builtins.TestBuiltin_warning.testwarning# #op.warn <- getOption('warn'); options(warn = 2); f <- function() warning('foo'); tryCatch(f(), finally={options(warn = op.warn)}) Error in f() : (converted from warning) foo ##com.oracle.truffle.r.test.builtins.TestBuiltin_warning.testwarning# #options(warn=1); f <- function() warning('foo'); f() Warning in f() : foo ##com.oracle.truffle.r.test.builtins.TestBuiltin_warning.testwarning# #options(warn=1); f <- function() warning('foo'); f2 <- function() f(); f2() Warning in f() : foo ##com.oracle.truffle.r.test.builtins.TestBuiltin_warning.testwarning# #warning('foo') Warning message: foo ##com.oracle.truffle.r.test.builtins.TestBuiltin_weekdaysDate.testweekdaysDate1# #argv <- structure(list(x = structure(16352, class = 'Date')), .Names = 'x');do.call('weekdays.Date', argv) [1] "Thursday" ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testWhich# #{ which(NA) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testWhich# #{ which(TRUE) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testWhich# #{ which(c(TRUE, FALSE, NA, TRUE)) } [1] 1 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testWhich# #{ which(c(a=TRUE,b=FALSE,c=TRUE)) } a c 1 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testWhich# #{ which(logical()) } integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testWhich# #{ x<-c(1,2); names(x)<-c(11, 12); attributes(which (x > 1)) } $names [1] "12" ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testwhich1# #argv <- list(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE)); .Internal(which(argv[[1]])) [1] 18 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 [26] 43 44 45 46 47 48 49 50 51 52 53 54 55 56 57 58 59 60 61 62 63 64 65 66 67 [51] 68 69 70 ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testwhich2# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE), .Dim = c(2L, 2L), .Dimnames = list(c('A', 'B'), c('A', 'B')))); .Internal(which(argv[[1]])) [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testwhich3# #argv <- list(c(FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE)); .Internal(which(argv[[1]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testwhich4# #argv <- list(structure(TRUE, .Names = 'V1')); .Internal(which(argv[[1]])) V1 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testwhich5# #argv <- list(logical(0)); .Internal(which(argv[[1]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testwhich6# #argv <- list(structure(c(TRUE, TRUE, TRUE, TRUE), .Dim = c(2L, 2L))); .Internal(which(argv[[1]])) [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testwhich7# #argv <- list(c(FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE)); .Internal(which(argv[[1]])) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testwhich8# #argv <- list(structure(c(FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE), .Dim = 12L)); .Internal(which(argv[[1]])) [1] 3 6 9 12 ##com.oracle.truffle.r.test.builtins.TestBuiltin_which.testwhich9# #argv <- list(structure(FALSE, .Names = 'signature-class.Rd')); .Internal(which(argv[[1]])) named integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testWhichMax# #{ which.max(c(1,2,3,4,5)) } [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testWhichMax# #{ which.max(c(1,2,3,4,5))} [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testWhichMax# #{ which.max(c(1:10000))} [1] 10000 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testWhichMax# #{ which.max(c(1:5))} [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testWhichMax# #{ which.max(c(2,4))} [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testWhichMax# #{ which.max(c(2L,4L,3L))} [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testWhichMax# #{ which.max(c(5,5,5,5,5)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testWhichMax# #{ which.max(c(5:1))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testWhichMax# #{ which.max(c(TRUE, FALSE))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testWhichMax# #{ which.max(c(TRUE, TRUE))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testwhichmax1# #argv <- list(structure(c(TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, FALSE, FALSE, TRUE, FALSE, FALSE, TRUE, TRUE, FALSE, FALSE, FALSE, FALSE, FALSE), .Dim = 4:5, .Dimnames = list(c('I(a)', 'b', 'c', 'a'), c('I(a)', 'b', 'c', 'b:c', 'a:x')))); .Internal(which.max(argv[[1]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testwhichmax2# #argv <- list(structure(c(TRUE, FALSE), .Names = c('d', 'I(as.numeric(d)^2)'))); .Internal(which.max(argv[[1]])) d 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testwhichmax3# #argv <- list(c(7985.84636551931, 7366.07281363396, 7342.71367123673, 7315.48787041648, 7290.90503004105)); .Internal(which.max(argv[[1]])) [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testwhichmax4# #argv <- list(structure(c(NA, 87, 82, 75, 63, 50, 43, 32, 35, 60, 54, 55, 36, 39, NA, NA, 69, 57, 57, 51, 45, 37, 46, 39, 36, 24, 32, 23, 25, 32, NA, 32, 59, 74, 75, 60, 71, 61, 71, 57, 71, 68, 79, 73, 76, 71, 67, 75, 79, 62, 63, 57, 60, 49, 48, 52, 57, 62, 61, 66, 71, 62, 61, 57, 72, 83, 71, 78, 79, 71, 62, 74, 76, 64, 62, 57, 80, 73, 69, 69, 71, 64, 69, 62, 63, 46, 56, 44, 44, 52, 38, 46, 36, 49, 35, 44, 59, 65, 65, 56, 66, 53, 61, 52, 51, 48, 54, 49, 49, 61, NA, NA, 68, 44, 40, 27, 28, 25, 24, 24), .Tsp = c(1945, 1974.75, 4), class = 'ts')); .Internal(which.max(argv[[1]])) [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testwhichmax5# #argv <- list(NULL); .Internal(which.max(argv[[1]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testwhichmax6# #argv <- list(list()); .Internal(which.max(argv[[1]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmax.testwhichmax8# #argv <- structure(list(x = c(NA, NA)), .Names = 'x');do.call('which.max', argv) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testWhichMin# #{ which.min(c(1,2,3,4,5)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testWhichMin# #{ which.min(c(1,2,3,4,5))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testWhichMin# #{ which.min(c(1:10000))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testWhichMin# #{ which.min(c(1:5))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testWhichMin# #{ which.min(c(2,4))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testWhichMin# #{ which.min(c(2L,4L,3L))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testWhichMin# #{ which.min(c(5,5,5,5,5)) } [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testWhichMin# #{ which.min(c(5:1))} [1] 5 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testWhichMin# #{ which.min(c(TRUE, FALSE))} [1] 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testWhichMin# #{ which.min(c(TRUE, TRUE))} [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testwhichmin1# #argv <- list(structure(c(345595, 172795, 69115, 34555, 23035, 11515, 5755, 2875, 1147, 571, 379, 187, 91, 27, 11, 3, 1, 3, 4.42857142857143, 4.73716632443532, 4.86858316221766, 4.95619438740589, 4.97809719370294, 4.98904859685147, 4.99452429842574, 4.99780971937029, 4.99890485968515, 4.99945242984257, 4.99978097193703, 4.99989048596851, 4.99994524298426, 4.9999780971937, 4.99998904859685), .Names = c('1 sec', '2 secs', '5 secs', '10 secs', '15 secs', '30 secs', '1 min', '2 mins', '5 mins', '10 mins', '15 mins', '30 mins', '1 hour', '3 hours', '6 hours', '12 hours', '1 DSTday', '2 DSTdays', '1 week', 'halfmonth', '1 month', '3 months', '6 months', '1 year', '2 years', '5 years', '10 years', '20 years', '50 years', '100 years', '200 years', '500 years', '1000 years'))); .Internal(which.min(argv[[1]])) 1 DSTday 17 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testwhichmin2# #argv <- list(structure(c(295, 145, 55, 25, 15, 5, 0, 2.5, 4, 4.5, 4.66666666666667, 4.83333333333333, 4.91666666666667, 4.97222222222222, 4.98611111111111, 4.99305555555556, 4.99652777777778, 4.99826388888889, 4.99950396825397, 4.99977184576774, 4.99988592288387, 4.99996197429462, 4.99998098714731, 4.99999049357366, 4.99999524678683, 4.99999809871473, 4.99999904935737, 4.99999952467868, 4.99999980987147, 4.99999990493574, 4.99999995246787, 4.99999998098715, 4.99999999049357), .Names = c('1 sec', '2 secs', '5 secs', '10 secs', '15 secs', '30 secs', '1 min', '2 mins', '5 mins', '10 mins', '15 mins', '30 mins', '1 hour', '3 hours', '6 hours', '12 hours', '1 DSTday', '2 DSTdays', '1 week', 'halfmonth', '1 month', '3 months', '6 months', '1 year', '2 years', '5 years', '10 years', '20 years', '50 years', '100 years', '200 years', '500 years', '1000 years'))); .Internal(which.min(argv[[1]])) 1 min 7 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testwhichmin3# #argv <- list(NULL); .Internal(which.min(argv[[1]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testwhichmin4# #argv <- list(list()); .Internal(which.min(argv[[1]])) integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testwhichmin5# #argv <- list(c(NA, 0.951840581382975, 0.805577027554469, 0.663985017923499, 0.53717416750558, 0.496765449963868, 0.472038350505409, 0.463306413812878, 0.485896454097402, 0.520777596351646, 0.524391122960607, 0.492063804965834, 0.513821989320989, 0.521702559081969, 0.533525525673351)); .Internal(which.min(argv[[1]])) [1] 8 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testwhichmin6# #argv <- list(structure(c(NA, 87, 82, 75, 63, 50, 43, 32, 35, 60, 54, 55, 36, 39, NA, NA, 69, 57, 57, 51, 45, 37, 46, 39, 36, 24, 32, 23, 25, 32, NA, 32, 59, 74, 75, 60, 71, 61, 71, 57, 71, 68, 79, 73, 76, 71, 67, 75, 79, 62, 63, 57, 60, 49, 48, 52, 57, 62, 61, 66, 71, 62, 61, 57, 72, 83, 71, 78, 79, 71, 62, 74, 76, 64, 62, 57, 80, 73, 69, 69, 71, 64, 69, 62, 63, 46, 56, 44, 44, 52, 38, 46, 36, 49, 35, 44, 59, 65, 65, 56, 66, 53, 61, 52, 51, 48, 54, 49, 49, 61, NA, NA, 68, 44, 40, 27, 28, 25, 24, 24), .Tsp = c(1945, 1974.75, 4), class = 'ts')); .Internal(which.min(argv[[1]])) [1] 28 ##com.oracle.truffle.r.test.builtins.TestBuiltin_whichmin.testwhichmin8# #argv <- structure(list(x = c(NA, NA, Inf)), .Names = 'x');do.call('which.min', argv) [1] 3 ##com.oracle.truffle.r.test.builtins.TestBuiltin_withVisible.testInvisibleValueForWithVisible#Ignored.ImplementationError# #{ id <- function(x) x; f <- function(x) { res <- withVisible(x); res$visible }; f(id(invisible(1))) } [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_withVisible.testwithVisible# #f <- function(x) { 1 + x }; withVisible(f(1)) $value [1] 2 $visible [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_withVisible.testwithVisible# #f <- function(x) { foo <- 1 + x }; withVisible(f(1)) $value [1] 2 $visible [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_withVisible.testwithVisible# #withVisible() Error in withVisible() : argument "x" is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_withVisible.testwithVisible# #withVisible(1) $value [1] 1 $visible [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_withVisible.testwithVisible# #withVisible(x <- 1) $value [1] 1 $visible [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_withVisible.testwithVisible# #withVisible({ 1; x <- 1 }) $value [1] 1 $visible [1] FALSE ##com.oracle.truffle.r.test.builtins.TestBuiltin_withVisible.testwithVisible# #withVisible({ x <- 1; 1 }) $value [1] 1 $visible [1] TRUE ##com.oracle.truffle.r.test.builtins.TestBuiltin_withdefault.testwithdefault1# #argv <- structure(list(data = structure(list(X = 22.1693750707316, Y = -0.652127930273561, Z = 1.03034043827436, a = -2.66666666666667, b = -10, c = 28), .Names = c('X', 'Y', 'Z', 'a', 'b', 'c')), expr = expression({ dX <- a * X + Y * Z; dY <- b * (Y - Z); dZ <- -X * Y + c * Y - Z; list(c(dX, dY, dZ)) })), .Names = c('data', 'expr'));do.call('with.default', argv) [[1]] [1] -59.790247 16.824684 -4.832654 ##com.oracle.truffle.r.test.builtins.TestBuiltin_within.testwithin1#Output.IgnoreErrorMessage# #argv <- structure(list(data = structure(list(a = 1:5, b = 2:6, c = 3:7), .Names = c('a', 'b', 'c'), row.names = c(NA, -5L), class = 'data.frame')), .Names = 'data');do.call('within', argv) Error in eval(substitute(expr), e) : argument is missing, with no default ##com.oracle.truffle.r.test.builtins.TestBuiltin_writeChar.testwriteCharArgumentsValidation# #writeChar(42, 1) Error in writeChar(42, 1) : can only write character objects ##com.oracle.truffle.r.test.builtins.TestBuiltin_writeChar.testwriteCharArgumentsValidation# #writeChar(NULL, 1) Error in writeChar(NULL, 1) : can only write character objects ##com.oracle.truffle.r.test.builtins.TestBuiltin_writeChar.testwriteCharArgumentsValidation# #writeChar(list(), 1) Error in writeChar(list(), 1) : can only write character objects ##com.oracle.truffle.r.test.builtins.TestBuiltin_writeLines.testwriteLines1#Ignored.SideEffects# #argv <- structure(list(text = ' \' A \'; \'B\' ;\'C\';\' D \';\'E \'; F ;G ', con = 'foo'), .Names = c('text', 'con'));do.call('writeLines', argv) ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm1# #argv <- list(structure(c(4L, 5L, 3L, 2L, 1L), .Label = c('McNeil', 'Ripley', 'Tierney', 'Tukey', 'Venables'), class = 'factor'));xtfrm(argv[[1]]); [1] 4 5 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm10# #argv <- list(structure(c(-0.00456054471709705, -0.0386783362736307, -0.0164476694679408, -0.191054486056936, -0.648560736432306, -0.0674820314025517, -0.0740415039370447, -0.0243389397466521, -0.00751319716764208, -2.290078352999e-05, -0.0207911295071267, -0.0697881087827301, -0.00348607275095251, -0.00951045408299201, -0.00166106374745221, -0.0259659490166321, -0.0293880116898911, -0.0140288480262381, -0.0027358575950958, -0.000491817024731849, -0.00823790481253382, -0.00148071888751321, -0.00122448210109329, -0.0168483392795904, -0.0206872529040578, -0.000471241810355829, -0.00239800266383851, -0.00875711097940079, -0.0461679706262251, -0.0100810672498937, -0.0758745277496017, -0.0537304828043233, -0.0171367489531612, -0.01057973675541, -0.0676085282986778, -0.069201293818924, -0.00065957876422003, -1.97617272327839e-05, -0.00439039022584134), .Names = c('1962.25', '1962.5', '1962.75', '1963', '1963.25', '1963.5', '1963.75', '1964', '1964.25', '1964.5', '1964.75', '1965', '1965.25', '1965.5', '1965.75', '1966', '1966.25', '1966.5', '1966.75', '1967', '1967.25', '1967.5', '1967.75', '1968', '1968.25', '1968.5', '1968.75', '1969', '1969.25', '1969.5', '1969.75', '1970', '1970.25', '1970.5', '1970.75', '1971', '1971.25', '1971.5', '1971.75')));xtfrm(argv[[1]]); 1962.25 1962.5 1962.75 1963 1963.25 -4.560545e-03 -3.867834e-02 -1.644767e-02 -1.910545e-01 -6.485607e-01 1963.5 1963.75 1964 1964.25 1964.5 -6.748203e-02 -7.404150e-02 -2.433894e-02 -7.513197e-03 -2.290078e-05 1964.75 1965 1965.25 1965.5 1965.75 -2.079113e-02 -6.978811e-02 -3.486073e-03 -9.510454e-03 -1.661064e-03 1966 1966.25 1966.5 1966.75 1967 -2.596595e-02 -2.938801e-02 -1.402885e-02 -2.735858e-03 -4.918170e-04 1967.25 1967.5 1967.75 1968 1968.25 -8.237905e-03 -1.480719e-03 -1.224482e-03 -1.684834e-02 -2.068725e-02 1968.5 1968.75 1969 1969.25 1969.5 -4.712418e-04 -2.398003e-03 -8.757111e-03 -4.616797e-02 -1.008107e-02 1969.75 1970 1970.25 1970.5 1970.75 -7.587453e-02 -5.373048e-02 -1.713675e-02 -1.057974e-02 -6.760853e-02 1971 1971.25 1971.5 1971.75 -6.920129e-02 -6.595788e-04 -1.976173e-05 -4.390390e-03 ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm11# #argv <- list(structure(list(c(2L, 10L, 0L), c(2L, 10L, 1L), c(2L, 10L, 1L, 1L), c(2L, 11L, 0L), c(2L, 11L, 1L), c(2L, 11L, 1L, 1L), c(2L, 12L, 0L), c(2L, 12L, 1L), c(2L, 12L, 2L), c(2L, 12L, 2L, 1L), c(2L, 13L, 0L), c(2L, 13L, 1L), c(2L, 13L, 2L), c(2L, 14L, 0L), c(2L, 14L, 1L), c(2L, 14L, 2L), c(2L, 15L, 0L), c(2L, 15L, 1L), c(2L, 15L, 2L), c(2L, 15L, 3L), c(3L, 0L, 0L), c(3L, 0L, 1L)), class = 'numeric_version'));xtfrm(argv[[1]]); [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm12# #argv <- list(structure(list(c(2L, 11L, 0L)), class = 'numeric_version'));xtfrm(argv[[1]]); [1] 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm13# #argv <- list(structure(c(607L, 30L, 3L, 11L, 44L, 67L, 17L, 16L, 67L, 6L, 1L, 13L, 672L, 46L, 8L, 18L, 10L, 22L, 16L, 5L, 55L, 2L), .Dim = 22L, .Dimnames = structure(list(c('BUG FIXES', 'C-LEVEL FACILITIES', 'CODE MIGRATION', 'COMPRESSION', 'DEPRECATED & DEFUNCT', 'DEPRECATED AND DEFUNCT', 'GRAPHICS DEVICES', 'HELP & Rd FILE CHANGES', 'INSTALLATION', 'INTERNATIONALIZATION', 'LICENCE', 'LONG VECTORS', 'NEW FEATURES', 'PACKAGE INSTALLATION', 'PACKAGE parallel', 'PERFORMANCE IMPROVEMENTS', 'REGULAR EXPRESSIONS', 'SIGNIFICANT USER-VISIBLE CHANGES', 'SWEAVE & VIGNETTES', 'SWEAVE CHANGES', 'UTILITIES', 'WINDOWS-SPECIFIC CHANGES')), .Names = ''), class = 'table'));xtfrm(argv[[1]]); BUG FIXES C-LEVEL FACILITIES 607 30 CODE MIGRATION COMPRESSION 3 11 DEPRECATED & DEFUNCT DEPRECATED AND DEFUNCT 44 67 GRAPHICS DEVICES HELP & Rd FILE CHANGES 17 16 INSTALLATION INTERNATIONALIZATION 67 6 LICENCE LONG VECTORS 1 13 NEW FEATURES PACKAGE INSTALLATION 672 46 PACKAGE parallel PERFORMANCE IMPROVEMENTS 8 18 REGULAR EXPRESSIONS SIGNIFICANT USER-VISIBLE CHANGES 10 22 SWEAVE & VIGNETTES SWEAVE CHANGES 16 5 UTILITIES WINDOWS-SPECIFIC CHANGES 55 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm15# #argv <- list(structure(1:3, id = 'An Example', class = structure('numWithId', package = '.GlobalEnv')));do.call('xtfrm', argv) [1] 1 2 3 attr(,"id") [1] "An Example" ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm2# #argv <- list(structure(c('Tukey', 'Venables', 'Tierney', 'Ripley', 'Ripley', 'McNeil', 'R Core'), class = 'AsIs'));xtfrm(argv[[1]]); [1] 6 7 5 3 3 1 2 ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm3# #argv <- list(c('9', '9', '8', '7', '6', '5', '4', '3', '2', '1'));xtfrm(argv[[1]]); [1] 9 9 8 7 6 5 4 3 2 1 ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm4# #argv <- list(list());xtfrm(argv[[1]]); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm5#Ignored.ImplementationError# #argv <- list(NULL);xtfrm(argv[[1]]); integer(0) ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm6# #argv <- list(structure(c(11354, 11382, 11413), class = 'Date'));xtfrm(argv[[1]]); [1] 11354 11382 11413 ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm7# #argv <- list(structure(1:3, id = 'An Example', class = structure('numWithId', package = '.GlobalEnv')));xtfrm(argv[[1]]); [1] 1 2 3 attr(,"id") [1] "An Example" ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm8# #argv <- list(structure(1:48, .Label = c('1', '2', '3', '4', '5', '6', '7', '8', '9', '10', '11', '12', '13', '14', '15', '16', '17', '18', '19', '20', '21', '22', '23', '24', '25', '26', '27', '28', '29', '30', '31', '32', '33', '34', '35', '36', '37', '38', '39', '40', '41', '42', '43', '44', '45', '46', '47', '48'), class = 'factor'));xtfrm(argv[[1]]); [1] 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24 25 [26] 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrm.testxtfrm9# #argv <- list(structure(c(0.00318983494910604, -0.0111499005186203, -0.00684577108225438, -0.0259425874127965, 0.0236273472621072, 0.0160653568112268, 0.0169512728197135, -0.0108668370208327, 0.0075620519889718, 0.000382355180538597, 0.0147085004994818, -0.0237528559595188, -0.00450253418485462, -0.00933970368616398, -0.00295998622541489, -0.0142621134100646, 0.0149334478604598, 0.0102146485133766, 0.00423575454949581, -0.00284331639280456, 0.0113535382887161, -0.00395897382574548, -0.00413390950862867, -0.0165713012838917, -0.018012405938438, 0.00225076128639717, 0.00786949110453678, 0.00890171601854386, 0.0241231688586559, 0.0104325796748375, 0.0267124035293778, -0.0242586202225146, 0.011564413201586, -0.00791916545648325, -0.020000071186273, -0.0160024870044187, 0.00243365269147765, 0.000371702019451462, 0.00543854321166064), .Names = c('1962.25', '1962.5', '1962.75', '1963', '1963.25', '1963.5', '1963.75', '1964', '1964.25', '1964.5', '1964.75', '1965', '1965.25', '1965.5', '1965.75', '1966', '1966.25', '1966.5', '1966.75', '1967', '1967.25', '1967.5', '1967.75', '1968', '1968.25', '1968.5', '1968.75', '1969', '1969.25', '1969.5', '1969.75', '1970', '1970.25', '1970.5', '1970.75', '1971', '1971.25', '1971.5', '1971.75')));xtfrm(argv[[1]]); 1962.25 1962.5 1962.75 1963 1963.25 0.0031898349 -0.0111499005 -0.0068457711 -0.0259425874 0.0236273473 1963.5 1963.75 1964 1964.25 1964.5 0.0160653568 0.0169512728 -0.0108668370 0.0075620520 0.0003823552 1964.75 1965 1965.25 1965.5 1965.75 0.0147085005 -0.0237528560 -0.0045025342 -0.0093397037 -0.0029599862 1966 1966.25 1966.5 1966.75 1967 -0.0142621134 0.0149334479 0.0102146485 0.0042357545 -0.0028433164 1967.25 1967.5 1967.75 1968 1968.25 0.0113535383 -0.0039589738 -0.0041339095 -0.0165713013 -0.0180124059 1968.5 1968.75 1969 1969.25 1969.5 0.0022507613 0.0078694911 0.0089017160 0.0241231689 0.0104325797 1969.75 1970 1970.25 1970.5 1970.75 0.0267124035 -0.0242586202 0.0115644132 -0.0079191655 -0.0200000712 1971 1971.25 1971.5 1971.75 -0.0160024870 0.0024336527 0.0003717020 0.0054385432 ##com.oracle.truffle.r.test.builtins.TestBuiltin_xtfrmdefault.testxtfrmdefault1# #argv <- structure(list(x = structure(1:3, id = 'An Example', class = structure('numWithId', package = '.GlobalEnv'))), .Names = 'x');do.call('xtfrm.default', argv) [1] 1 2 3 attr(,"id") [1] "An Example" ##com.oracle.truffle.r.test.builtins.TestBuiltin_zzfile.test1# #{ f <- tempfile(); c <- bzfile(f); writeLines(as.character(1:100), c); close(c); readLines(f) } [1] "1" "2" "3" "4" "5" "6" "7" "8" "9" "10" "11" "12" [13] "13" "14" "15" "16" "17" "18" "19" "20" "21" "22" "23" "24" [25] "25" "26" "27" "28" "29" "30" "31" "32" "33" "34" "35" "36" [37] "37" "38" "39" "40" "41" "42" "43" "44" "45" "46" "47" "48" [49] "49" "50" "51" "52" "53" "54" "55" "56" "57" "58" "59" "60" [61] "61" "62" "63" "64" "65" "66" "67" "68" "69" "70" "71" "72" [73] "73" "74" "75" "76" "77" "78" "79" "80" "81" "82" "83" "84" [85] "85" "86" "87" "88" "89" "90" "91" "92" "93" "94" "95" "96" [97] "97" "98" "99" "100" ##com.oracle.truffle.r.test.builtins.TestBuiltin_zzfile.test1# #{ f <- tempfile(); c <- gzfile(f); writeLines(as.character(1:100), c); close(c); readLines(f) } [1] "1" "2" "3" "4" "5" "6" "7" "8" "9" "10" "11" "12" [13] "13" "14" "15" "16" "17" "18" "19" "20" "21" "22" "23" "24" [25] "25" "26" "27" "28" "29" "30" "31" "32" "33" "34" "35" "36" [37] "37" "38" "39" "40" "41" "42" "43" "44" "45" "46" "47" "48" [49] "49" "50" "51" "52" "53" "54" "55" "56" "57" "58" "59" "60" [61] "61" "62" "63" "64" "65" "66" "67" "68" "69" "70" "71" "72" [73] "73" "74" "75" "76" "77" "78" "79" "80" "81" "82" "83" "84" [85] "85" "86" "87" "88" "89" "90" "91" "92" "93" "94" "95" "96" [97] "97" "98" "99" "100" ##com.oracle.truffle.r.test.builtins.TestBuiltin_zzfile.test1# #{ f <- tempfile(); c <- xzfile(f); writeLines(as.character(1:100), c); close(c); readLines(f) } [1] "1" "2" "3" "4" "5" "6" "7" "8" "9" "10" "11" "12" [13] "13" "14" "15" "16" "17" "18" "19" "20" "21" "22" "23" "24" [25] "25" "26" "27" "28" "29" "30" "31" "32" "33" "34" "35" "36" [37] "37" "38" "39" "40" "41" "42" "43" "44" "45" "46" "47" "48" [49] "49" "50" "51" "52" "53" "54" "55" "56" "57" "58" "59" "60" [61] "61" "62" "63" "64" "65" "66" "67" "68" "69" "70" "71" "72" [73] "73" "74" "75" "76" "77" "78" "79" "80" "81" "82" "83" "84" [85] "85" "86" "87" "88" "89" "90" "91" "92" "93" "94" "95" "96" [97] "97" "98" "99" "100" ##com.oracle.truffle.r.test.builtins.TestBuiltin_zzfile.test2# #{ f <- tempfile(); c <- bzfile(f); writeLines(as.character(1:50), c); close(c); c <- bzfile(f, "a"); writeLines(as.character(51:70), c); close(c); readLines(f) } [1] "1" "2" "3" "4" "5" "6" "7" "8" "9" "10" "11" "12" "13" "14" "15" [16] "16" "17" "18" "19" "20" "21" "22" "23" "24" "25" "26" "27" "28" "29" "30" [31] "31" "32" "33" "34" "35" "36" "37" "38" "39" "40" "41" "42" "43" "44" "45" [46] "46" "47" "48" "49" "50" "51" "52" "53" "54" "55" "56" "57" "58" "59" "60" [61] "61" "62" "63" "64" "65" "66" "67" "68" "69" "70" ##com.oracle.truffle.r.test.builtins.TestBuiltin_zzfile.test2# #{ f <- tempfile(); c <- gzfile(f); writeLines(as.character(1:50), c); close(c); c <- gzfile(f, "a"); writeLines(as.character(51:70), c); close(c); readLines(f) } [1] "1" "2" "3" "4" "5" "6" "7" "8" "9" "10" "11" "12" "13" "14" "15" [16] "16" "17" "18" "19" "20" "21" "22" "23" "24" "25" "26" "27" "28" "29" "30" [31] "31" "32" "33" "34" "35" "36" "37" "38" "39" "40" "41" "42" "43" "44" "45" [46] "46" "47" "48" "49" "50" "51" "52" "53" "54" "55" "56" "57" "58" "59" "60" [61] "61" "62" "63" "64" "65" "66" "67" "68" "69" "70" ##com.oracle.truffle.r.test.builtins.TestBuiltin_zzfile.test2# #{ f <- tempfile(); c <- xzfile(f); writeLines(as.character(1:50), c); close(c); c <- xzfile(f, "a"); writeLines(as.character(51:70), c); close(c); readLines(f) } [1] "1" "2" "3" "4" "5" "6" "7" "8" "9" "10" "11" "12" "13" "14" "15" [16] "16" "17" "18" "19" "20" "21" "22" "23" "24" "25" "26" "27" "28" "29" "30" [31] "31" "32" "33" "34" "35" "36" "37" "38" "39" "40" "41" "42" "43" "44" "45" [46] "46" "47" "48" "49" "50" "51" "52" "53" "54" "55" "56" "57" "58" "59" "60" [61] "61" "62" "63" "64" "65" "66" "67" "68" "69" "70" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayConstructors# #{ character(1L) } [1] "" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayConstructors# #{ double() } numeric(0) ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayConstructors# #{ double(3) } [1] 0 0 0 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayConstructors# #{ integer() } integer(0) ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayConstructors# #{ logical() } logical(0) ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayConstructors# #{ logical(3L) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayConstructors# #{ raw() } raw(0) ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #is.array(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testArrayTypeCheck# #{ is.array(as.array(1)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic("1") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(1) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(1L) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(1i) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(NULL) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(pairlist()) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #is.atomic(raw()) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testAtomicTypeCheck# #{ is.atomic(integer()) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(call("foo")) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.call(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character("1") [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.character(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(1i) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.complex(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(1) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.double(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(expression(x + 1)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.expression(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(function() { }) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.function(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(1L) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.integer(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(list()) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.list(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(TRUE) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.logical(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(quote(x)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.name(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(NULL) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(pairlist()) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.null(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(NULL) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(pairlist()) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.pairlist(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.raw(raw()) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(quote(x)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testBasicTypes# #is.symbol(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCall# #{ call("f") } f() ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCall# #{ call("f", 2, 3) } f(2, 3) ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCall# #{ call("f", quote(A)) } f(A) ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCall# #{ cl <- call("f") ; class(cl) } [1] "call" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCall# #{ cl <- call("f") ; typeof(cl) } [1] "language" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCall# #{ f <- "f" ; call(f, quote(A)) } f(A) ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCall# #{ f <- function() 23 ; cl <- call("f") ; eval(cl) } [1] 23 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCall# #{ f <- function(a, b) { a + b } ; l <- call("f", 2, 3) ; eval(l) } [1] 5 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCall# #{ f <- function(a, b) { a + b } ; x <- 1 ; y <- 2 ; l <- call("f", x, y) ; x <- 10 ; eval(l) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCall# #{ f <- round ; call(f, quote(A)) } Error in call(f, quote(A)) : first argument must be a character string ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.character(as.complex(1:2)) } [1] "1+0i" "2+0i" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.character(as.double(1:5)) } [1] "1" "2" "3" "4" "5" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.complex(as.character(c(1+1i,1+1i))) } [1] 1+1i 1+1i ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.complex(as.double(c(1+1i,1+1i))) } [1] 1+0i 1+0i Warning message: imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.complex(as.integer(c(1+1i,1+1i))) } [1] 1+0i 1+0i Warning message: imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.complex(as.logical(c(1+1i,1+1i))) } [1] 1+0i 1+0i ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.complex(as.raw(c(1+1i,1+1i))) } [1] 1+0i 1+0i Warning message: imaginary parts discarded in coercion ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.double(as.logical(c(10,10))) } [1] 1 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.integer(as.logical(-1:1)) } [1] 1 0 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.list(3:6) } [[1]] [1] 3 [[2]] [1] 4 [[3]] [1] 5 [[4]] [1] 6 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.list(c(1,2,3,2,1)) } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 [[4]] [1] 2 [[5]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.list(list(1,2,"eep")) } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] "eep" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.matrix(1) } [,1] [1,] 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.matrix(1:3) } [,1] [1,] 1 [2,] 2 [3,] 3 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.raw(as.logical(as.raw(c(1,2)))) } [1] 01 01 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ as.vector(list(1,2,3), mode="integer") } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ env <- new.env(); env$x<-7; env$.y<-42; length(as.list(env, all.names=TRUE)) } [1] 2 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ k <- as.list(3:6) ; l <- as.list(1) ; list(k,l) } [[1]] [[1]][[1]] [1] 3 [[1]][[2]] [1] 4 [[1]][[3]] [1] 5 [[1]][[4]] [1] 6 [[2]] [[2]][[1]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ l <- 1 ; attr(l, "my") <- 1; as.list(l) } [[1]] [1] 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ l <- c(x=1) ; as.list(l) } $x [1] 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ l <- list(1) ; attr(l, "my") <- 1; as.list(l) } [[1]] [1] 1 attr(,"my") [1] 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m <- matrix(1:6, nrow=2) ; as.double(m) } [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m <- matrix(c(1,2,3,4,5,6), nrow=2) ; as.integer(m) } [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m <- matrix(c(1,2,3,4,5,6), nrow=2) ; as.logical(m) } [1] TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(1:6, nrow=3) ; as.integer(m) } [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(1:6, nrow=3) ; as.vector(m, "any") } [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(1:6, nrow=3) ; as.vector(mode = "integer", x=m) } [1] 1 2 3 4 5 6 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(as.raw(c(1,2,3,4)), nrow=2) ; as.vector(m) } [1] 01 02 03 04 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(c("a","b","c","d"), nrow=2) ; as.vector(m) } [1] "a" "b" "c" "d" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(c(1+1i,2+2i,3-3i,4-4i), nrow=2) ; as.vector(m) } [1] 1+1i 2+2i 3-3i 4-4i ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(c(1,0,1,0), nrow=2) ; as.vector(m, mode = "logical") } [1] TRUE FALSE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(c(1,2,3,4), nrow=2) ; as.vector(m) } [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(c(1,2,3,4), nrow=2) ; as.vector(m, mode = "character") } [1] "1" "2" "3" "4" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(c(1,2,3,4), nrow=2) ; as.vector(m, mode = "complex") } [1] 1+0i 2+0i 3+0i 4+0i ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(c(1,2,3,4), nrow=2) ; as.vector(m, mode = "double") } [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(c(1,2,3,4), nrow=2) ; as.vector(m, mode = "numeric") } [1] 1 2 3 4 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(c(1,2,3,4), nrow=2) ; as.vector(m, mode = "raw") } [1] 01 02 03 04 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ m<-matrix(c(TRUE,FALSE,FALSE,TRUE), nrow=2) ; as.vector(m) } [1] TRUE FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ x <- 1:2; names(x) <- c("hello","hi") ; as.double(x) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ x <- 1:3 ; attr(x,"my") <- 10 ; attributes(as.matrix(x)) } $dim [1] 3 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ x <- 1:3; z <- as.matrix(x); x } [1] 1 2 3 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ x <- c(0,2); names(x) <- c("hello","hi") ; as.logical(x) } [1] FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ x <- c(1,2); names(x) <- c("hello","hi") ; as.integer(x) } [1] 1 2 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ x<-7; .y<-42; as.list(environment()) } $x [1] 7 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ x<-7; as.list(environment()) } $x [1] 7 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testCasts# #{ x<-7; f<-function() x<<-42; f_copy<-as.list(environment())[["f"]]; f_copy(); x } [1] 42 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #is.data.frame(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDataFrameTypeCheck# #{ is.data.frame(as.data.frame(1)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testDiagnostics# #{ f <- function() { stop("hello","world") } ; f() } Error in f() : helloworld ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testEigen# #{ eigen(10, only.values=FALSE) } eigen() decomposition $values [1] 10 $vectors [,1] [1,] 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testEigen# #{ r <- eigen(matrix(c(1,2,2,3), nrow=2), only.values=FALSE); round( r$values, digits=5 ) } [1] 4.23607 -0.23607 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testEigen# #{ r <- eigen(matrix(c(1,2,2,3), nrow=2), only.values=FALSE); round( r$vectors, digits=5 ) } [,1] [,2] [1,] 0.52573 -0.85065 [2,] 0.85065 0.52573 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testEigen# #{ r <- eigen(matrix(c(1,2,3,4), nrow=2), only.values=FALSE); round( r$values, digits=5 ) } [1] 5.37228 -0.37228 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testEigen# #{ r <- eigen(matrix(c(1,2,3,4), nrow=2), only.values=FALSE); round( r$vectors, digits=5 ) } [,1] [,2] [1,] -0.56577 -0.90938 [2,] -0.82456 0.41597 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testEigen# #{ r <- eigen(matrix(c(3,-2,4,-1), nrow=2), only.values=FALSE); round( r$values, digits=5 ) } [1] 1+2i 1-2i ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testEigen# #{ r <- eigen(matrix(c(3,-2,4,-1), nrow=2), only.values=FALSE); round( r$vectors, digits=5 ) } [,1] [,2] [1,] 0.81650+0.00000i 0.81650+0.00000i [2,] -0.40825+0.40825i -0.40825-0.40825i ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testEigen# #{ r <- eigen(matrix(rep(1,4), nrow=2), only.values=FALSE) ; round( r$values, digits=5 ) } [1] 2 0 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testEigen# #{ r <- eigen(matrix(rep(1,4), nrow=2), only.values=FALSE) ; round( r$vectors, digits=5 ) } [,1] [,2] [1,] 0.70711 -0.70711 [2,] 0.70711 0.70711 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testGL# #{ a <- gl(2, 4, 8) ; print(a) } [1] 1 1 1 1 2 2 2 2 Levels: 1 2 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testGL# #{ b <- gl(2, 2, 8, labels = c("ctrl", "treat")) ; print(b) } [1] ctrl ctrl treat treat ctrl ctrl treat treat Levels: ctrl treat ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testGL# #{x<-gl(2, 1, 20); print(x)} [1] 1 2 1 2 1 2 1 2 1 2 1 2 1 2 1 2 1 2 1 2 Levels: 1 2 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testGL# #{x<-gl(2, 2, 20); print(x)} [1] 1 1 2 2 1 1 2 2 1 1 2 2 1 1 2 2 1 1 2 2 Levels: 1 2 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testGL# #{x<-gl(2, 8, labels = c("Control", "Treat")); print(x)} [1] Control Control Control Control Control Control Control Control Treat [10] Treat Treat Treat Treat Treat Treat Treat Levels: Control Treat ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(call("foo")) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(expression(x + 1)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(quote(x)) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLanguageTypeCheck# #is.language(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLocal# #{ kk <- local({k <- function(x) {x*2}}); kk(8)} [1] 16 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLocal# #{ ne <- new.env(); local(a <- 1, ne); ls(ne) } [1] "a" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLowerTriangular# #{ lower.tri(1:3, diag=FALSE) } [,1] [1,] FALSE [2,] TRUE [3,] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLowerTriangular# #{ lower.tri(1:3, diag=TRUE) } [,1] [1,] TRUE [2,] TRUE [3,] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLowerTriangular# #{ m <- matrix(1:6, nrow=2) ; lower.tri(m, diag=FALSE) } [,1] [,2] [,3] [1,] FALSE FALSE FALSE [2,] TRUE FALSE FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testLowerTriangular# #{ m <- matrix(1:6, nrow=2) ; lower.tri(m, diag=TRUE) } [,1] [,2] [,3] [1,] TRUE FALSE FALSE [2,] TRUE TRUE FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #is.matrix(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testMatrixTypeCheck# #{ is.matrix(as.matrix(1)) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testModeSet# #{ x<-c(1,2); mode(x)<-"character"; x } [1] "1" "2" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(1) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(1L) [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #is.numeric(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testNumericTypeCheck# #{ is.numeric(1:6) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object("1") [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(1) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(1L) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(1i) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(NULL) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(TRUE) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(call("foo")) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(expression(x + 1)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(function() { }) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(list()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(pairlist()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(quote(x)) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #is.object(raw()) [1] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testObjectTypeCheck# #{ e <- expression(x + 1); class(e) <- "foo"; is.object(e) } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOther# #{ rev.mine <- function(x) { if (length(x)) x[length(x):1L] else x } ; rev.mine(1:3) } [1] 3 2 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ foo <- function (x,y) { x + y * 1i } ; outer(1:3,1:3,foo) } [,1] [,2] [,3] [1,] 1+1i 1+2i 1+3i [2,] 2+1i 2+2i 2+3i [3,] 3+1i 3+2i 3+3i ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ foo <- function (x,y) { x + y * 1i } ; outer(3,3,"foo") } [,1] [1,] 3+3i ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ foo <- function (x,y) { x + y * 1i } ; outer(3,3,foo) } [,1] [1,] 3+3i ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ outer(1, 3, "-") } [,1] [1,] -2 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ outer(1:2, 1:3, "<") } [,1] [,2] [,3] [1,] FALSE TRUE TRUE [2,] FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ outer(1:2, 1:3, '<') } [,1] [,2] [,3] [1,] FALSE TRUE TRUE [2,] FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ outer(1:3,1:2) } [,1] [,2] [1,] 1 2 [2,] 2 4 [3,] 3 6 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ outer(1:3,1:2, function(x,y,z) { x*y*z }, 10) } [,1] [,2] [1,] 10 20 [2,] 20 40 [3,] 30 60 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ outer(1:3,1:2,"*") } [,1] [,2] [1,] 1 2 [2,] 2 4 [3,] 3 6 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ outer(c(1,2,3),c(1,2),"*") } [,1] [,2] [1,] 1 2 [2,] 2 4 [3,] 3 6 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ outer(c(1,2,3),c(1,2),"+") } [,1] [,2] [1,] 2 3 [2,] 3 4 [3,] 4 5 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOuter# #{ outer(c(1,2,3),c(1,2),"-") } [,1] [,2] [1,] 0 -1 [2,] 1 0 [3,] 2 1 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testOverride# #{ sub <- function(x,y) { x - y }; sub(10,5) } [1] 5 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testParen# #{ a = array(1,c(3,3,3)); (a[1,2,3] = 3) } [1] 3 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testSimpleRm# #{ rm("ieps") } Warning message: In rm("ieps") : object 'ieps' not found ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testSimpleRm# #{ rm("sum", envir=getNamespace("stats")) } Error in rm("sum", envir = getNamespace("stats")) : cannot remove bindings from a locked environment ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testSimpleRm# #{ x <- 200 ; rm("x") ; x } Error: object 'x' not found ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testSimpleRm# #{ x <- 200 ; rm("x") } ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testSimpleRm# #{ x<-200; y<-100; rm("x", "y"); x } Error: object 'x' not found ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testSimpleRm# #{ x<-200; y<-100; rm("x", "y"); y } Error: object 'y' not found ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testTable# #{ a<-c("a", "b", "c"); t<-table(a, sample(a)); dimnames(t) } $a [1] "a" "b" "c" [[2]] [1] "a" "b" "c" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testTriangular# #{ m <- { matrix( (1:6) * (1+3i), nrow=2 ) } ; diag(m) <- c(1,2) ; m } [,1] [,2] [,3] [1,] 1+0i 3+9i 5+15i [2,] 2+6i 2+0i 6+18i ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testTriangular# #{ m <- { matrix( as.character(1:6), nrow=2 ) } ; diag(m) <- c(1,2) ; m } [,1] [,2] [,3] [1,] "1" "3" "5" [2,] "2" "2" "6" ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testTriangular# #{ m <- { matrix( as.raw(11:16), nrow=2 ) } ; diag(m) <- c(as.raw(1),as.raw(2)) ; m } [,1] [,2] [,3] [1,] 01 0d 0f [2,] 0c 02 10 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testTypeConvert# #{ x<-as.character(list(a="0", b="0", c="0.3")); type.convert(x, as.is=FALSE) } [1] 0.0 0.0 0.3 ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testUpperTriangular# #{ m <- matrix(1:6, nrow=2) ; upper.tri(m, diag=FALSE) } [,1] [,2] [,3] [1,] FALSE TRUE TRUE [2,] FALSE FALSE TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testUpperTriangular# #{ m <- matrix(1:6, nrow=2) ; upper.tri(m, diag=TRUE) } [,1] [,2] [,3] [1,] TRUE TRUE TRUE [2,] FALSE TRUE TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testUpperTriangular# #{ upper.tri(1:3, diag=FALSE) } [,1] [1,] FALSE [2,] FALSE [3,] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testUpperTriangular# #{ upper.tri(1:3, diag=TRUE) } [,1] [1,] TRUE [2,] FALSE [3,] FALSE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testWorkingDirectory# #{ cur <- getwd(); cur1 <- setwd(c(cur, "dummy")) ; cur2 <- getwd() ; cur == cur1 } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testWorkingDirectory# #{ cur <- getwd(); cur1 <- setwd(getwd()) ; cur2 <- getwd() ; cur == cur1 && cur == cur2 } [1] TRUE ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testWorkingDirectory# #{ setwd(1) } Error in setwd(1) : character argument expected ##com.oracle.truffle.r.test.builtins.TestMiscBuiltins.testWorkingDirectory# #{ setwd(character()) } Error in setwd(character()) : character argument expected ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a=sys.call(),b=sys.call()) data frame with 0 columns and 0 rows ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a=sys.call(-2),b=sys.call(-2)) Error in sys.call(-2) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a=sys.call(1),b=sys.call(1)) Error in sys.call(1) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a=sys.call(4),b=sys.call(4)) Error in sys.call(4) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a=sys.calls(),b=sys.calls()) data frame with 0 columns and 0 rows ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a=sys.nframe(),b=sys.nframe()) a b 1 0 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a=sys.parent(),b=sys.parent()) a b 1 0 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a=sys.parent(2),b=sys.parent(2)) a b 1 0 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a=sys.parent(4),b=sys.parent(4)) a b 1 0 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a={ e <- parent.frame(); e$n},b={ e <- parent.frame(); e$n}) a b 1 100 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; data.frame(a={ e <- parent.frame(2); e$n},b={ e <- parent.frame(2); e$n}) a b 1 100 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character(sys.call()),b=as.character(sys.call()),c=x) }; f('foo') a b c 1 f f foo 2 foo foo foo ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character(sys.call(-2)),b=as.character(sys.call(-2)),c=x) }; f('foo') Error in sys.call(-2) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character(sys.call(1)),b=as.character(sys.call(1)),c=x) }; f('foo') a b c 1 f f foo 2 foo foo foo ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character(sys.call(4)),b=as.character(sys.call(4)),c=x) }; f('foo') Error in sys.call(4) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character(sys.calls()),b=as.character(sys.calls()),c=x) }; f('foo') a b c 1 f("foo") f("foo") foo ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character(sys.nframe()),b=as.character(sys.nframe()),c=x) }; f('foo') a b c 1 1 1 foo ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character(sys.parent()),b=as.character(sys.parent()),c=x) }; f('foo') a b c 1 0 0 foo ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character(sys.parent(2)),b=as.character(sys.parent(2)),c=x) }; f('foo') a b c 1 0 0 foo ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character(sys.parent(4)),b=as.character(sys.parent(4)),c=x) }; f('foo') a b c 1 0 0 foo ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character({ e <- parent.frame(); e$n}),b=as.character({ e <- parent.frame(); e$n}),c=x) }; f('foo') a b c 1 100 100 foo ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #n <- 100; f <- function(x) { n <- 101; data.frame(a=as.character({ e <- parent.frame(2); e$n}),b=as.character({ e <- parent.frame(2); e$n}),c=x) }; f('foo') a b c 1 100 100 foo ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testDataFrame# #options(keep.source = TRUE); ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testErrors# #options(keep.source = TRUE); ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testErrors# #parent.frame(-1) Error in parent.frame(-1) : invalid 'n' value ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; sys.call() }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) foo.default(v) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3#Ignored.ImplementationError# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; sys.call(-2) }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) UseMethod('foo') ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; sys.call(1) }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) ident(try(foo(v))) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; sys.call(4) }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) tryCatchList(expr, classes, parentenv, handlers) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3#Ignored.ImplementationError# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; sys.calls() }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) [[1]] ident(try(foo(v))) [[2]] x [[3]] tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call)[1L] prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e)) }) [[4]] tryCatchList(expr, classes, parentenv, handlers) [[5]] tryCatchOne(expr, names, parentenv, handlers[[1L]]) [[6]] doTryCatch(return(expr), name, parentenv, handler) [[7]] foo(v) [[8]] UseMethod('foo') [[9]] NextMethod() [[10]] foo.default(v) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3#Ignored.ImplementationError# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; sys.nframe() }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) [1] 10 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; sys.parent() }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; sys.parent(2) }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; sys.parent(4) }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; { e <- parent.frame(); e$n} }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3# #n <- 100; v <- 123; class(v) <- 'cls'; foo <- function(o) { n <- 101; UseMethod('foo') }; foo.cls <- function(o) { n <- 102; NextMethod() }; foo.default <- function(o) { n <- 103; { e <- parent.frame(2); e$n} }; ident <- function(x) { n <- 104; x }; ident(try(foo(v))) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testS3# #options(keep.source = TRUE); ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call() }; ident <- function(x) { n <- 102; x }; ident(try(f())) f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call(-2) }; ident <- function(x) { n <- 102; x }; ident(try(f())) tryCatchOne(expr, names, parentenv, handlers[[1L]]) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call(1) }; ident <- function(x) { n <- 102; x }; ident(try(f())) ident(try(f())) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call(4) }; ident <- function(x) { n <- 102; x }; ident(try(f())) tryCatchList(expr, classes, parentenv, handlers) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.calls() }; ident <- function(x) { n <- 102; x }; ident(try(f())) [[1]] ident(try(f())) [[2]] try(f()) [[3]] tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call)[1L] prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e)) }) [[4]] tryCatchList(expr, classes, parentenv, handlers) [[5]] tryCatchOne(expr, names, parentenv, handlers[[1L]]) [[6]] doTryCatch(return(expr), name, parentenv, handler) [[7]] f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.nframe() }; ident <- function(x) { n <- 102; x }; ident(try(f())) [1] 7 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.parent() }; ident <- function(x) { n <- 102; x }; ident(try(f())) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.parent(2) }; ident <- function(x) { n <- 102; x }; ident(try(f())) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.parent(4) }; ident <- function(x) { n <- 102; x }; ident(try(f())) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; { e <- parent.frame(); e$n} }; ident <- function(x) { n <- 102; x }; ident(try(f())) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; { e <- parent.frame(2); e$n} }; ident <- function(x) { n <- 102; x }; ident(try(f())) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #options(keep.source = TRUE); ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #tryCatch(cat('Hello\n')) Hello ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testTry# #tryCatch(print.default('Hello')) [1] "Hello" ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; sys.call() }; f() f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; sys.call(-2) }; f() Error in sys.call(-2) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; sys.call(1) }; f() f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; sys.call(4) }; f() Error in sys.call(4) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; sys.calls() }; f() [[1]] f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; sys.nframe() }; f() [1] 1 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; sys.parent() }; f() [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; sys.parent(2) }; f() [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; sys.parent(4) }; f() [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; { e <- parent.frame(); e$n} }; f() [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; f <- function() { n <- 101; { e <- parent.frame(2); e$n} }; f() [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.call() }; g() f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.call(-2) }; g() NULL ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.call(1) }; g() g() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.call(4) }; g() Error in sys.call(4) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.calls() }; g() [[1]] g() [[2]] f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.nframe() }; g() [1] 2 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.parent() }; g() [1] 1 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.parent(2) }; g() [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.parent(4) }; g() [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; { e <- parent.frame(); e$n} }; g() [1] 101 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; { e <- parent.frame(2); e$n} }; g() [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; sys.call() NULL ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; sys.call(-2) Error in sys.call(-2) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; sys.call(1) Error in sys.call(1) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; sys.call(4) Error in sys.call(4) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; sys.calls() NULL ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; sys.nframe() [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; sys.parent() [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; sys.parent(2) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; sys.parent(4) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; { e <- parent.frame(); e$n} [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #n <- 100; { e <- parent.frame(2); e$n} [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call() }; ident <- function(x) { n <- 102; x }; ident(f()) f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call() }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call(-2) }; ident <- function(x) { n <- 102; x }; ident(f()) NULL ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call(-2) }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) ident(ident(f())) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call(1) }; ident <- function(x) { n <- 102; x }; ident(f()) ident(f()) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call(1) }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) ident(ident(ident(f()))) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call(4) }; ident <- function(x) { n <- 102; x }; ident(f()) Error in sys.call(4) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.call(4) }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.calls() }; ident <- function(x) { n <- 102; x }; ident(f()) [[1]] ident(f()) [[2]] f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.calls() }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) [[1]] ident(ident(ident(f()))) [[2]] ident(ident(f())) [[3]] ident(f()) [[4]] f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.nframe() }; ident <- function(x) { n <- 102; x }; ident(f()) [1] 2 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.nframe() }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) [1] 4 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.parent() }; ident <- function(x) { n <- 102; x }; ident(f()) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.parent() }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.parent(2) }; ident <- function(x) { n <- 102; x }; ident(f()) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.parent(2) }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.parent(4) }; ident <- function(x) { n <- 102; x }; ident(f()) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; sys.parent(4) }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; { e <- parent.frame(); e$n} }; ident <- function(x) { n <- 102; x }; ident(f()) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; { e <- parent.frame(); e$n} }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; { e <- parent.frame(2); e$n} }; ident <- function(x) { n <- 102; x }; ident(f()) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; f <- function() { n <- 101; { e <- parent.frame(2); e$n} }; ident <- function(x) { n <- 102; x }; ident(ident(ident(f()))) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.call() }; ident <- function(x) { n <- 103; x }; ident(g()) f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.call(-2) }; ident <- function(x) { n <- 103; x }; ident(g()) ident(g()) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.call(1) }; ident <- function(x) { n <- 103; x }; ident(g()) ident(g()) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.call(4) }; ident <- function(x) { n <- 103; x }; ident(g()) Error in sys.call(4) : not that many frames on the stack ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.calls() }; ident <- function(x) { n <- 103; x }; ident(g()) [[1]] ident(g()) [[2]] g() [[3]] f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.nframe() }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 3 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.parent() }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 2 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.parent(2) }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; sys.parent(4) }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; { e <- parent.frame(); e$n} }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 101 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; f() }; f <- function() { n <- 102; { e <- parent.frame(2); e$n} }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident(sys.call()) }; ident <- function(x) { n <- 103; x }; ident(g()) f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident(sys.call(-2)) }; ident <- function(x) { n <- 103; x }; ident(g()) g() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident(sys.call(1)) }; ident <- function(x) { n <- 103; x }; ident(g()) ident(g()) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident(sys.call(4)) }; ident <- function(x) { n <- 103; x }; ident(g()) f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident(sys.calls()) }; ident <- function(x) { n <- 103; x }; ident(g()) [[1]] ident(g()) [[2]] g() [[3]] ident(f()) [[4]] f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident(sys.nframe()) }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 4 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident(sys.parent()) }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 2 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident(sys.parent(2)) }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident(sys.parent(4)) }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident({ e <- parent.frame(); e$n}) }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 101 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; ident({ e <- parent.frame(2); e$n}) }; ident <- function(x) { n <- 103; x }; ident(g()) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; sys.call() }; ident <- function(x) { n <- 103; x}; ident(g()) f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; sys.call(-2) }; ident <- function(x) { n <- 103; x}; ident(g()) g() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; sys.call(1) }; ident <- function(x) { n <- 103; x}; ident(g()) ident(g()) ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; sys.call(4) }; ident <- function(x) { n <- 103; x}; ident(g()) f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; sys.calls() }; ident <- function(x) { n <- 103; x}; ident(g()) [[1]] ident(g()) [[2]] g() [[3]] ident(f()) [[4]] f() ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; sys.nframe() }; ident <- function(x) { n <- 103; x}; ident(g()) [1] 4 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; sys.parent() }; ident <- function(x) { n <- 103; x}; ident(g()) [1] 2 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; sys.parent(2) }; ident <- function(x) { n <- 103; x}; ident(g()) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; sys.parent(4) }; ident <- function(x) { n <- 103; x}; ident(g()) [1] 0 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; { e <- parent.frame(); e$n} }; ident <- function(x) { n <- 103; x}; ident(g()) [1] 101 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = FALSE);n <- 100; g <- function() { n <- 101; ident(f()) }; f <- function() { n <- 102; { e <- parent.frame(2); e$n} }; ident <- function(x) { n <- 103; x}; ident(g()) [1] 100 ##com.oracle.truffle.r.test.builtins.TestStackBuiltins.testVariations# #options(keep.source = TRUE); ##com.oracle.truffle.r.test.builtins.TestTestBase.testTraits#Output.IgnoreErrorContext# #if (exists('.fastr.identity')) { cat('Error in .Internal(foo(44)): IgnoreErrorContext') } else { cat('Error in foo(42): IgnoreErrorContext') } Error in foo(42): IgnoreErrorContext ##com.oracle.truffle.r.test.builtins.TestTestBase.testTraits#Output.IgnoreErrorContext# #if (exists('.fastr.identity')) { cat('Error in foo(42) : IgnoreErrorContext extra spaces') } else { cat('Error in foo(42): IgnoreErrorContext extra spaces') } Error in foo(42): IgnoreErrorContext extra spaces ##com.oracle.truffle.r.test.builtins.TestTestBase.testTraits#Output.IgnoreWhitespace# #if (exists('.fastr.identity')) { cat('Error in foo(42) : IgnoreWhitespace extra spaces') } else { cat('Error in foo(42): \nIgnoreWhitespace extra spaces') } Error in foo(42): IgnoreWhitespace extra spaces ##com.oracle.truffle.r.test.builtins.TestTestBase.testTraits#Output.IgnoreErrorMessage# #if (exists('.fastr.identity')) { cat('Error in foo(42): FastR error message') } else { cat('Error in foo(42): GnuR error message is different') } Error in foo(42): GnuR error message is different ##com.oracle.truffle.r.test.builtins.TestTestBase.testTraits#Output.IgnoreErrorMessage# #if (exists('.fastr.identity')) { cat('Error in foo(42): IgnoreErrorMessage starts with newline') } else { cat('Error in foo(42):\nIgnoreErrorMessage starts with newline') } Error in foo(42): IgnoreErrorMessage starts with newline ##com.oracle.truffle.r.test.builtins.TestTestBase.testTraits#Output.IgnoreErrorMessage# #if (exists('.fastr.identity')) { cat('Error in foo(44): IgnoreErrorMessage with different ctx') } else { cat('Error in foo(42): IgnoreErrorMessage with different ctx') } Error in foo(42): IgnoreErrorMessage with different ctx ##com.oracle.truffle.r.test.builtins.TestTestBase.testTraits#Output.IgnoreWarningContext# #if (exists('.fastr.identity')) { cat('Warning message: In .Internal(foo(42)) : IgnoreWarningContext extra newline') } else { cat('Warning message: In foo(42) : \nIgnoreWarningContext extra newline') } Warning message: In foo(42) : IgnoreWarningContext extra newline ##com.oracle.truffle.r.test.builtins.TestTestBase.testTraits#Output.IgnoreWarningContext# #if (exists('.fastr.identity')) { cat('Warning message: In .Internal(foo(42)) : IgnoreWarningContext') } else { cat('Warning message: In foo(42) : IgnoreWarningContext') } Warning message: In foo(42) : IgnoreWarningContext ##com.oracle.truffle.r.test.functions.TestFunctions.testArgEvaluationOrder# #v <- 1; class(v) <- 'foo'; `-.foo` <- function(x,y,...) { cat('[-.foo]'); 1234 }; g <- function(...) { cat('[ing]'); ({cat('[-]'); `-`})(...) }; ({cat('[g]'); g})({cat('[x]'); v},{cat('[y]'); 3},{cat('[z]'); 5}) [g][ing][-][x][y][z][-.foo][1] 1234 ##com.oracle.truffle.r.test.functions.TestFunctions.testArgs# #{ f<-function(x, row.names = NULL, optional = FALSE, ...) {print(optional); for (i in list(...)) {print(i)} }; f(c(7,42), row.names=NULL, nm="x") } [1] FALSE [1] "x" ##com.oracle.truffle.r.test.functions.TestFunctions.testArgs# #{ f<-function(x, row.names = NULL, optional = FALSE, ...) {print(optional)}; f(c(7,42), row.names=NULL, nm="x") } [1] FALSE ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { func(a) && TRUE } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) } [1] FALSE ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { func(a) && TRUE } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) ; f(function(x) { x + x }, 10) } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { func(a) && TRUE } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) ; f(g, 10) ; f(is.na,5) } [1] FALSE ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { func(a) && TRUE } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) ; f(is.na, 10) } [1] FALSE ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { func(a) && TRUE } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) ; f(length, 10) } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { if (func(a)) { 1 } else { 2 } } ; f(function(x) {TRUE}, 5) ; f(is.na, 4) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { if (func(a)) { 1 } else { 2 } } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) ; f(g, 3) ; f(c, 10) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { if (func(a)) { 1 } else { 2 } } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) ; f(g, 3) ; f(function(x) { 3+4i }, 10) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { if (func(a)) { 1 } else { 2 } } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) ; f(g, 3) ; f(is.na, 10) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { if (func(a)) { 1 } else { 2 } } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) ; f(g, 3) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { if (func(a)) { 1 } else { 2 } } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) ; f(is.na, 10) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, a) { if (func(a)) { 1 } else { 2 } } ; g <- function(x) {TRUE} ; f(g, 5) ; f(is.na, 4) ; h <- function(x) { x == x } ; f(h, 3) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, arg) { func(arg) } ; f(sum, c(3,2)) ; f(length, 1:4) ; f(function(i) {3}, 1) ; f(length,1:3) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, arg) { func(arg) } ; f(sum, c(3,2)) ; f(length, 1:4) ; f(length,1:3) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(func, arg) { func(arg) } ; f(sum, c(3,2)) ; f(length, 1:4) } [1] 4 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(i) { c(1,2) } ; f(1) ; c <- sum ; f(2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(i) { if (i==2) { assign("c", sum) }; c(1,2) } ; f(1) ; f(2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ f <- function(i) { if (i==2) { c <- sum }; c(1,2) } ; f(1) ; f(2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ myapp <- function(f, x, y) { f(x,y) } ; g <- function(x,y) { x + y } ; myapp(f = g, y = 1, x = 2) ; myapp(f = sum, x = 1, y = 2) ; myapp(f = g, y = 10, x = 3) ; myapp(f = g, y = 11, x = 2) } [1] 13 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ myapp <- function(f, x, y) { f(x,y) } ; myapp(f = function(x,y) { x + y }, y = 1, x = 2) ; myapp(f = sum, x = 1, y = 2) ; myapp(f = c, y = 10, x = 3) } [1] 3 10 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ myapp <- function(f, x, y) { f(x,y) } ; myapp(f = function(x,y) { x + y }, y = 1, x = 2) ; myapp(f = sum, x = 1, y = 2) ; myapp(f = function(x,y) { x - y }, y = 10, x = 3) } [1] -7 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ myapp <- function(f, x, y) { f(x,y) } ; myapp(f = function(x,y) { x + y }, y = 1, x = 2) ; myapp(f = sum, x = 1, y = 2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testBinding# #{ myapp <- function(f, x, y) { f(x,y) } ; myapp(function(x,y) { x + y }, 1, 2) ; myapp(sum, 1, 2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testConversions# #{ x<-quote(list(...)); l<-list(); l[[2]]<-x; names(l)<-c("..."); f<-as.function(l); f(7, 42) } [[1]] [1] 7 [[2]] [1] 42 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefaultArgs# #{ array(dim=c(-2,-2)); } Error in array(dim = c(-2, -2)) : the dims contain negative values ##com.oracle.truffle.r.test.functions.TestFunctions.testDefaultArgs# #{ array(dim=c(-2,2)); } Error in array(dim = c(-2, 2)) : negative length vectors are not allowed ##com.oracle.truffle.r.test.functions.TestFunctions.testDefaultArgs# #{ dim(array(dim=c(2.1,2.9,3.1,4.7))) } [1] 2 2 3 4 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefaultArgs# #{ length(array(dim=c(1,0,2,3))) } [1] 0 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #x<-function(){1};x function(){1} ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ "%plus%" <- function(a,b) a+b ; 3 %plus% 4 } [1] 7 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ "-"(1) } [1] -1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ 'my<-' <- function(x, value) { attr(x, "myattr") <- value ; x } ; z <- 1; my(z) <- "hello" ; z } [1] 1 attr(,"myattr") [1] "hello" ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ foo <- function (x) { x } ; foo() } Error in foo() : argument "x" is missing, with no default ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ foo <- function (x) { x } ; foo(1,2,3) } Error in foo(1, 2, 3) : unused arguments (2, 3) ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ foo <- function(x, ..) x; list(foo(42), foo(21,33)); } [[1]] [1] 42 [[2]] [1] 21 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ foo <- function(x, ...=NULL) x; list(foo(42), foo(21,33)); } [[1]] [1] 42 [[2]] [1] 21 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ foo <- function(x, ..1, y) y; foo(21,33,22); } [1] 22 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ side <- function(x) { cat('side effect ', x, '\n'); x }; foo <- function(x, ...=side(42)) x; foo(3) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ side <- function(x) { cat('side effect ', x, '\n'); x }; foo <- function(x, ..1=side(42)) x; foo(3) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ x <- function(a,b) { a^b } ; dummy <- sum ; f <- function() { x <- "dummy" ; dummy <- 200 ; sapply(1, x, 2) } ; f() } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ x <- function(a,b) { a^b } ; dummy <- sum ; f <- function() { x <- "dummy" ; sapply(1, x, 2) } ; f() } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ x <- function(a,b) { a^b } ; f <- function() { x <- "sum" ; sapply(1, x, 2) } ; f() } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ x <- function(a,b) { a^b } ; f <- function() { x <- 211 ; sapply(1, x, 2) } ; f() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ x <- function(a,b) { a^b } ; g <- function() { x <- "sum" ; f <- function() { sapply(1, x, 2) } ; f() } ; g() } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitions# #{ x<-matrix(1:4, ncol=2); y<-list(x=c("a", "b"), y=c("c", "d")); dimnames(x)<-y; names(dimnames(x))<-c("m", "n"); dimnames(x) } $m [1] "a" "b" $n [1] "c" "d" ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ f <- sum ; f(1:10) } [1] 55 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ f<-function(a,b,c=2,d) {c} ; f(1,2,c=4,d=4) } [1] 4 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ f<-function(a,b,c=2,d) {c} ; f(1,2,d=8,c=1) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ f<-function(a,b,c=2,d) {c} ; f(1,d=8,2,c=1) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ f<-function(a,b,c=2,d) {c} ; f(d=8,1,2,c=1) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ f<-function(a,b,c=2,d) {c} ; f(d=8,c=1,2,3) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ f<-function(a=1,b=2,c=3) {TRUE} ; f(,,) } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ f<-function(a=10,b,c=20,d=20) {c} ; f(4,3,5,1) } [1] 5 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ f<-function(x=2) {x} ; f() } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ f<-function(z, x=if (z) 2 else 3) {x} ; f(FALSE) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ x <- function(y) { sum(y) } ; f <- function() { x <- 1 ; x(1:10) } ; f() } [1] 55 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ x<-1 ; f<-function(x=x) { x } ; f(x=x) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ x<-1 ; z<-TRUE ; f<-function(y=x,a=z,b) { if (z) {y} else {z}} ; f(2) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{ x<-1 ; z<-TRUE ; f<-function(y=x,a=z,b) { if (z) {y} else {z}} ; f(b=2) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsNamedAndDefault# #{f<-function(a,b,c=2,d) {c} ; g <- function() f(d=8,c=1,2,3) ; g() ; g() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsWorking# #{ f<-function() {z} ; z<-2 ; f() } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsWorking# #{ f<-function(x){g<-function(x) {x} ; g(x) } ; f(TRUE) } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsWorking# #{ x<-1 ; f<-function(){x} ; x<-2 ; f() } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsWorking# #{ x<-1 ; f<-function(x){a<-1; b<-2; g<-function(x) {b<-3;x} ; g(b) } ; f(TRUE) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsWorking# #{ x<-1 ; f<-function(x){a<-1;b<-2;x} ; f(TRUE) } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsWorking# #{ x<-1 ; f<-function(x){x} ; f(TRUE) } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsWorking# #{ x<-1 ; f<-function(z) { if (z) { x<-2 } ; x } ; x<-3 ; f(FALSE) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsWorking# #{ x<-1 ; g<-function() { x<-12 ; f<-function(z) { if (z) { x<-2 } ; x } ; x<-3 ; f(FALSE) } ; g() } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsWorking# #{ x<-function() { z<-211 ; function(a) { if (a) { z } else { 200 } } } ; f<-x() ; z<-1000 ; f(TRUE) } [1] 211 ##com.oracle.truffle.r.test.functions.TestFunctions.testDefinitionsWorking# #{ x<-function(z){z} ; x(TRUE) } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #bug <- function(a, ...) vapply(a, function(.) identical(a, T, ...), NA); v <- c(1,2,3); bug(v) [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #bug <- function(a, ...) { f <- function(x) identical(a, T, ...); environment(f) <- globalenv(); f(x)}; v1 <- c(1,2,3); bug(v1) Error in f(x) : '...' used in an incorrect context ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #bug <- function(a, ...) { f <- function(x) identical(a, T, ...); f(x)}; v1 <- c(1,2,3); bug(v1) [1] FALSE ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #f2 <- function(...) { f <- function() cat(...); assign("...", "asdf"); f() }; f2("a") Error in f() : '...' used in an incorrect context ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Ignored.ImplementationError# #f2 <- function(...) { f <- function() cat(...); assign("...", NULL); f() }; f2("a") ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #f2 <- function(...) { f <- function() cat(...); environment(f) <- globalenv(); f() }; f2() Error in f() : '...' used in an incorrect context ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #f2 <- function(...) { f <- function() cat(...); f() }; f2("a") a ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #f2 <- function(...) { f <- function() cat(...); f() }; f2() ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ `-.foo` <- function(...) 123; v <- 1; class(v) <- 'foo'; sapply(1,`-`,v); sapply(v,`-`,1); sapply(v,`-`,v) } [1] 123 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ asdf <- function(x,...) UseMethod("asdf",x); asdf.numeric <- function(x, ...) print(paste("num:", x, ...)); asdf(1) } [1] "num: 1" ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorContext# #{ dummy <- 2 ; dummy() } Error in dummy() : could not find function "dummy" ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorContext# #{ f <- function() { dummy <- 2 ; g <- function() { dummy() } ; g() } ; f() } Error in dummy() : could not find function "dummy" ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorContext# #{ f <- function() { dummy() } ; dummy <- 2 ; f() } Error in dummy() : could not find function "dummy" ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorContext# #{ f <- function() { dummy() } ; f() } Error in dummy() : could not find function "dummy" ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorContext# #{ f <- function() { if (FALSE) { dummy <- 2 } ; dummy() } ; f() } Error in dummy() : could not find function "dummy" ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorContext# #{ f <- function() { if (FALSE) { dummy <- 2 } ; g <- function() { dummy() } ; g() } ; f() } Error in dummy() : could not find function "dummy" ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) cat(..., "\n") ; f("Hello", "world") } Hello world ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) g(...); g <- function(a,b) { print(a); print(b) }; f(1,2); f(a=3,b=4); f(a=5,b=6) } [1] 1 [1] 2 [1] 3 [1] 4 [1] 5 [1] 6 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Ignored.ImplementationError# #{ f <- function(...) { ..1 + ..2 } ; f(1,,3) } Error in ..1 + ..2 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { ..1 ; x <<- 10 ; ..1 } ; x <- 1 ; f(x) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { ..1 ; x <<- 10 ; ..2 } ; x <- 1 ; f(100,x) } [1] 10 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { ..1 <- 2 ; ..1 } ; f(z = 1) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { ..1 <- 2 ; get("..1") } ; f(1,2,3,4) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { ..1 <- 2; eval(as.symbol("..1")) } ; f(1,2,3,4) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { ..1 } ; f() } Error in f() : the ... list contains fewer than 1 element ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { ..1 } ; f(10) } [1] 10 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorMessage# #{ f <- function(...) { ..2 + ..2 } ; f(1,,2) } Error in ..2 + ..2 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { ..2 ; x <<- 10 ; ..1 } ; x <- 1 ; f(x,100) } [1] 10 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorContext# #{ f <- function(...) { ..3 } ; f(1,2) } Error in f(1, 2) : the ... list contains fewer than 3 elements ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { eval(as.symbol("..1")) } ; f(1,2,3,4) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { g <- function() { ..1 } ; g() } ; f(a=2) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { g(...) } ; g <- function(b=2) { b } ; f() } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { get("..1") } ; f(1,2,3,4) } Error in get("..1") : object '..1' not found ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { substitute(..1) } ; f(x+y) } ..1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...) { x <<- 10 ; ..1 } ; x <- 1 ; f(x) } [1] 10 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...,d) { ..1 + ..2 } ; f(1,2,d=4) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(...,d) { ..1 + ..2 } ; f(1,d=4,2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, b) { a * b } ; g <- function(...) { f(...,...) } ; g(3) } [1] 9 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, b) { a + b } ; g <- function(...) { f(a=1, ...) } ; g(a=2) } Error in f(a = 1, ...) : formal argument "a" matched by multiple actual arguments ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, b) { a - b } ; g <- function(...) { f(1, ...) } ; g(a = 2) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, b) { a - b } ; g <- function(...) { f(1, ...) } ; g(b = 2) } [1] -1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, barg) { a + barg } ; g <- function(...) { f(a=1, ...) } ; g(b=2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, barg, ...) { a + barg } ; g <- function(...) { f(a=1, ...) } ; g(b=2,3) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, barg, bextra) { a + barg } ; g <- function(...) { f(a=1, ...) } ; g(b=2,3) } Error in f(a = 1, ...) : argument 2 matches multiple formal arguments ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, barg, bextra, dummy) { a + barg } ; g <- function(...) { f(a=1, ...) } ; g(1,2,3) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, barg, bextra, dummy) { a + barg } ; g <- function(...) { f(a=1, ...) } ; g(be=2,bex=3, 3) } Error in f(a = 1, ...) : formal argument "bextra" matched by multiple actual arguments ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, barg, bextra, dummy) { a + barg } ; g <- function(...) { f(a=1, ...) } ; g(be=2,du=3, 3) } [1] 4 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, barg, bextra, dummy) { a + barg } ; g <- function(...) { f(a=1, ..., x=2) } ; g(1) } Error in f(a = 1, ..., x = 2) : unused argument (x = 2) ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorMessage# #{ f <- function(a, barg, bextra, dummy) { a + barg } ; g <- function(...) { f(a=1, ..., x=2,z=3) } ; g(1) } Error in f(a = 1, ..., x = 2, z = 3) : unused arguments (x = 2, z = 3) ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, barg, bextra, dummy) { a + barg } ; g <- function(...) { f(a=1, ..., xxx=2) } ; g(1) } Error in f(a = 1, ..., xxx = 2) : unused argument (xxx = 2) ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, barg, bextra, dummy) { a + barg } ; g <- function(...) { f(a=1, ...,,,) } ; g(1) } Error in f(a = 1, ..., , , ) : unused argument (alist()) ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a, barg, bextra, dummy) { a + barg } ; g <- function(...) { f(a=1, xxx=2, ...) } ; g(1) } Error in f(a = 1, xxx = 2, ...) : unused argument (xxx = 2) ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f <- function(a=1,...) a ; f() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorContext# #{ f <- function(x) { ..1 } ; f(10) } Error in f(10) : ..1 used in an incorrect context, no ... to look in ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f.numeric<-function(x, row.names = NULL, optional = FALSE, ..., nm = NULL) { print(optional); print(nm) }; f<-function(x, row.names = NULL, optional = FALSE, ...) { UseMethod("f") }; f(c(1,2), row.names = "r1", nm="bar") } [1] FALSE [1] "bar" ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f1 <- function(...) { subst <- substitute(list(...))[-1L]; eval(subst[[1]]) }; f2 <- function(a, ...) TRUE; f3 <- function(a, ...) { cat("Here:"); f1(f2(a, ...)) }; f1(f3("aaa")) } Here:[1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f<-function(...) print(attributes(list(...))); f(a=7) } $names [1] "a" ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f<-function(...) print(attributes(list(...))); f(a=7, b=42) } $names [1] "a" "b" ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f<-function(x, ...) { sum(x, ...) }; f(7) } [1] 7 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ f<-function(x, y) { print(missing(y)); } ; f(42) } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ fn1 <- function (a, b) a + b; fn2 <- function (a, b, ...) fn1(a, b, ...); fn2(1, 1) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g <- function(...) { 0 } ; f <- function(...) { g(...) ; x <<- 10 ; ..1 } ; x <- 1 ; f(x) } [1] 10 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g <- function(...) { c(...,...) } ; g(3) } [1] 3 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g <- function(a,b) { a + b } ; f <- function(...) { g(...) } ; f(1,2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g <- function(a,b,aa,bb) { a ; x <<- 10 ; aa ; c(a, aa) } ; f <- function(...) { g(..., ...) } ; x <- 1; y <- 2; f(x, y) } [1] 1 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g <- function(a,b,x) { a + b * x } ; f <- function(...) { g(...,x=4) } ; f(b=1,a=2) } [1] 6 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g <- function(a,b,x) { a + b * x } ; f <- function(...) { g(x=4, ...) } ; f(b=1,a=2) } [1] 6 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g <- function(a,b,x) { a + b * x } ; f <- function(...) { g(x=4, ..., 10) } ; f(b=1) } [1] 14 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g <- function(a,b,x) { a + b * x } ; f <- function(...) { g(x=4, ..., 10) } ; f(b=1,a=2) } Error in g(x = 4, ..., 10) : unused argument (10) ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g <- function(x, ...) c(x, ...); g(1) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g <- function(x, ...) f(x,...); f <-function(x,...) c(x, ...); g(1) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ g<-function(nm, x) { print(c(nm, x)); } ; f<-function(x, ...) { g(x, ...) }; f(x=1, nm=42) } [1] 42 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ h<-function(x,...) f(x,...); f<-function(x, ...) { sum(x, ...) }; h(7) } [1] 7 ##com.oracle.truffle.r.test.functions.TestFunctions.testDots#Output.IgnoreErrorMessage# #{ lapply(1:3, "dummy") } Error in get(as.character(FUN), mode = "function", envir = envir) : object 'dummy' of mode 'function' was not found ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ x<-7; y<-42; f<-function(...) { as.list(substitute(g(...))) }; f(x,y) } [[1]] g [[2]] x [[3]] y ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ x<-7; y<-42; f<-function(...) { substitute(g(...)) }; is.language(f(x,y)) } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testDots# #{ x<-7; y<-42; f<-function(...) { substitute(g(...)) }; typeof(f(x,y)) } [1] "language" ##com.oracle.truffle.r.test.functions.TestFunctions.testEmptyParamName# #{ f <- function(a, ...) a; f(''=123) } Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.functions.TestFunctions.testEmptyParamName#Ignored.ParserError# #{ function(''=123) 4 } Error: unexpected string constant in "{ function(''" ##com.oracle.truffle.r.test.functions.TestFunctions.testErrors#Ignored.ImplementationError#Output.IgnoreErrorContext# #{ f <- function(a,a) {1} } Error: repeated formal argument 'a' on line 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testErrors# #{ f <- function(a,b,c,d) { a + b } ; f(1,x=1,2,3,4) } Error in f(1, x = 1, 2, 3, 4) : unused argument (x = 1) ##com.oracle.truffle.r.test.functions.TestFunctions.testErrors# #{ f <- function(x) { x } ; f() } Error in f() : argument "x" is missing, with no default ##com.oracle.truffle.r.test.functions.TestFunctions.testErrors# #{ x<-function(){1} ; x(1) } Error in x(1) : unused argument (1) ##com.oracle.truffle.r.test.functions.TestFunctions.testErrors# #{ x<-function(){1} ; x(y=1) } Error in x(y = 1) : unused argument (y = 1) ##com.oracle.truffle.r.test.functions.TestFunctions.testErrors# #{ x<-function(){1} ; x(y=sum(1:10)) } Error in x(y = sum(1:10)) : unused argument (y = sum(1:10)) ##com.oracle.truffle.r.test.functions.TestFunctions.testErrors# #{ x<-function(a){1} ; x(1,) } Error in x(1, ) : unused argument (alist()) ##com.oracle.truffle.r.test.functions.TestFunctions.testErrors# #{ x<-function(foo,bar){foo*bar} ; x(fo=10,f=1,2) } Error in x(fo = 10, f = 1, 2) : formal argument "foo" matched by multiple actual arguments ##com.oracle.truffle.r.test.functions.TestFunctions.testErrors#Ignored.ImplementationError# #{ x<-function(y, b){1} ; x(y=1, 2, 3, z = 5) } Error in x(y = 1, 2, 3, z = 5) : unused arguments (3, z = 5) ##com.oracle.truffle.r.test.functions.TestFunctions.testErrors# #{ x<-function(y,b){1} ; x(y=1,y=3,4) } Error in x(y = 1, y = 3, 4) : formal argument "y" matched by multiple actual arguments ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup#Output.IgnoreErrorContext# #{ 'foo'() } Error in foo() : could not find function "foo" ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ ('foo')() } Error: attempt to apply non-function ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ (foo)() } Error: object 'foo' not found ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ abs } function (x) .Primitive("abs") ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup#Output.IgnoreErrorContext# #{ f<-1; f() } Error in f() : could not find function "f" ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ foo <- function() 1; 'foo'() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ foo <- function() 1; ('foo')() } Error: attempt to apply non-function ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ foo <- function() 1; (`foo`)() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ foo <- function() 1; (foo)() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ foo <- function() 1; `foo`() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ foo <- function() 1; foo() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup#Output.IgnoreErrorContext# #{ foo() } Error in foo() : could not find function "foo" ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ sum <- 1; 'sum'(1,2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ sum <- 1; ('sum')(1,2) } Error: attempt to apply non-function ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ sum <- 1; (`sum`)(1,2) } Error: attempt to apply non-function ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ sum <- 1; (sum)(1,2) } Error: attempt to apply non-function ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ sum <- 1; `sum`(1,2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionLookup# #{ sum <- 1; sum(1,2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionPrinting#Ignored.Unstable# #{ exists } function (x, where = -1, envir = if (missing(frame)) as.environment(where) else sys.frame(frame), frame, mode = "any", inherits = TRUE) .Internal(exists(x, envir, mode, inherits)) ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionPrinting# #{ foo <- function(x) x; foo } function(x) x ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionPrinting# #{ sum } function (..., na.rm = FALSE) .Primitive("sum") ##com.oracle.truffle.r.test.functions.TestFunctions.testFunctionResultPrinting# #{ foo <- function() { x <- 1; return(x) }; foo() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ f <- function(...) { args <- list(...) ; args$name } ; f(name = 42) } [1] 42 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ f <- function(...) { g <- function() { list(...)$a } ; g() } ; f(a=1) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ f <- function(...) { l <- list(...) ; l[[1]] <- 10; ..1 } ; f(11,12,13) } [1] 11 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ f <- function(...) { list(a=1,...) } ; f(b=2,3) } $a [1] 1 $b [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ f <- function(...) { substitute(...) } ; f(x + z) } x + z ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ f <- function(a) a; f(cat('Hello\n')) } Hello ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ f <- function(a, ...) { list(...) } ; f(1) } list() ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ g <- function(...) { `-`(...) } ; g(1,2) } [1] -1 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ g <- function(...) { length(list(...)) } ; f <- function(...) { g(..., ...) } ; f(z = 1, g = 31) } [1] 4 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ g <- function(...) { max(...) } ; g(1,2) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ matrix(1:4, n = 2) } Error in matrix(1:4, n = 2) : argument 2 matches multiple formal arguments ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ matrix(da=1:3,1) } [,1] [,2] [,3] [1,] 1 2 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ matrix(x=1) } Error in matrix(x = 1) : unused argument (x = 1) ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation#Ignored.ImplementationError# #{ max(1,2,) } Error in max(1, 2, ) : argument 3 is empty ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ p <- function(prefix, ...) { cat(prefix, ..., "\n") } ; p("INFO", "msg:", "Hello", 42) } INFO msg: Hello 42 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ rnorm(n = 1, n = 2) } Error in rnorm(n = 1, n = 2) : formal argument "n" matched by multiple actual arguments ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ rnorm(s = 1, s = 1) } Error in rnorm(s = 1, s = 1) : formal argument "sd" matched by multiple actual arguments ##com.oracle.truffle.r.test.functions.TestFunctions.testInvocation# #{ set.seed(4357); round( rnorm(1,), digits = 5 ) } [1] -0.13102 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvokeIndirectly# #{ f <- function(x) x+1 ; g <- function(x) x+2 ; funs <- list(f,g) ; funs[[1]](1) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvokeIndirectly# #{ f <- function(x) x+1 ; g <- function(x) x+2 ; funs <- list(f,g) ; funs[[2]](1) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvokeIndirectly# #{ f <- function(x) x+1 ; g <- function(x) x+2 ; h <- function(v) if (v==1) f else g ; h(1)(1) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvokeIndirectly# #{ f <- function(x) x+1 ; g <- function(x) x+2 ; h <- function(v) if (v==1) f else g ; h(2)(1) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvokeIndirectly# #{ f <- function(x) x+1 ; g <- function(x) x+2 ; v <- 1 ; (if (v==1) f else g)(1) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testInvokeIndirectly# #{ f <- function(x) x+1 ; g <- function(x) x+2 ; v <- 2 ; (if (v==1) f else g)(1) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testIsPrimitive# #{ is.primitive(is.function) } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testIsPrimitive# #{ is.primitive(is.primitive) } [1] FALSE ##com.oracle.truffle.r.test.functions.TestFunctions.testMatchFun# #{ f <- function(x) { y <- match.fun(x) ; y(3,4) } ; c(f("+"),f("*")) } [1] 7 12 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatchFun# #{ f <- function(x) { y <- match.fun(x) ; y(c(1,2,3)) } ; c(f("sum"),f("cumsum")) } [1] 6 1 3 6 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatchFun# #{ f <- match.fun("length") ; f(c(1,2,3)) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatchFun# #{ f <- match.fun(length) ; f(c(1,2,3)) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #.subset(c(1,2,3), 2, drop = T) [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #.subset(c(1,2,3), drop = T, 2) [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #.subset2(c(1,2,3), 2, exact = T) [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #.subset2(c(1,2,3), exact = T, 2) [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #.subset2(c(1,2,3), exact = T, 2, drop=T) [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #.subset2(exact = T, c(1,2,3), 2) Error in .subset2(exact = T, c(1, 2, 3), 2) : incorrect number of subscripts ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #`$<-`(someNonesense = list(), anotherNonesense = 'foo', 42) $foo [1] 42 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #`[`(drop=matrix(1:6, nrow = 2, dimnames = list(c('a', 'b'), LETTERS[1:3])), 1,) A B C 1 3 5 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #`[`(drop=matrix(1:6, nrow = 2, dimnames = list(c('a', 'b'), LETTERS[1:3])), 1,, drop=F) A B C a 1 3 5 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #apply(array(1,dim=c(2,3)), 2, function(x,n) x, n = 1) [,1] [,2] [,3] [1,] 1 1 1 [2,] 1 1 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #as.character(3, x=42) [1] "3" ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #c(1,2,3)[[drop=T,3,drop=T]] Error in c(1, 2, 3)[[drop = T, 3, drop = T]] : incorrect number of subscripts ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #c(1,2,3)[[extract=T,3,drop=T]] Error in c(1, 2, 3)[[extract = T, 3, drop = T]] : incorrect number of subscripts ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #c(1,2,3)[extract=T,3,drop=T] Error in c(1, 2, 3)[extract = T, 3, drop = T] : incorrect number of dimensions ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching#Output.IgnoreErrorMessage# #foo <- function(...) bar(...); bar <- function(a,b) list(a,b); foo(a=1,b=2,c=3); Error in bar(...) : unused argument (c = 3) ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #list(`...`=NULL); $... NULL ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #list(abc=3)[['ab',exact=F]] [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #list(abc=3)[[drop=T,exact=F,'ab']] [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #list(abc=3)[[exact=F,'ab',drop=T]] [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #list(abc=3)[[exact=F,'ab']] [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #matrix(1:6, nrow = 2, dimnames = list(c('a', 'b'), LETTERS[1:3]))[1,,drop=FALSE] A B C a 1 3 5 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #matrix(1:6, nrow = 2, dimnames = list(c('a', 'b'), LETTERS[1:3]))[1,drop=FALSE,] A B C a 1 3 5 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #matrix(1:6, nrow = 2, dimnames = list(c('a', 'b'), LETTERS[1:3]))[drop=FALSE,1,] A B C a 1 3 5 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #matrix(1:6, nrow = 2, dimnames = list(c('a', 'b'), LETTERS[1:3]))[drop=FALSE,j=1,] A B C a 1 3 5 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #{ f <- function(a) { a } ; f(1,2) } Error in f(1, 2) : unused argument (2) ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #{ f <- function(hello, hi) { hello + hi } ; f(h = 1) } Error in f(h = 1) : argument 1 matches multiple formal arguments ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #{ f <- function(hello, hi) { hello + hi } ; f(hello = 1, bye = 3) } Error in f(hello = 1, bye = 3) : unused argument (bye = 3) ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #{ f <- function(xy, x) xy + x; f(xy=1,x=2) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #{ f<-function(..., val=1) { c(list(...), val) }; f(v=7, 2) } $v [1] 7 [[2]] [1] 2 [[3]] [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #{ f<-function(er=1, ..., val=1) { c(list(...), val, er) }; f(v=7, 2, e=8) } $v [1] 7 [[2]] [1] 2 [[3]] [1] 1 [[4]] [1] 8 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #{ foo <- function(xa, ...) list(xa=xa, ...); foo(x=4,xa=5); } $xa [1] 5 $x [1] 4 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #{ foo <- function(xaaa, ...) list(xaa=xaaa, ...); foo(xa=4,xaa=5); } Error in foo(xa = 4, xaa = 5) : formal argument "xaaa" matched by multiple actual arguments ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #{ x<-function(foo,bar){foo*bar} ; x(f=10,2) } [1] 20 ##com.oracle.truffle.r.test.functions.TestFunctions.testMatching# #{ x<-function(foo,bar){foo*bar} ; x(fo=10, bar=2) } [1] 20 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises#Ignored.ImplementationError# #{ bar <- function(x, y) { y; x; 42 }; foo <- function(a) bar(a, cat('side2')); foo(cat('side1')) } side2side1[1] 42 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ f <- function(a) { g <- function(b) { a <<- 3; b } ; g(a) } ; x <- 1 ; f(x) } [1] 3 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ f <- function(a) { g <- function(b) { x <<- 2; b } ; g(a) } ; x <- 1 ; f(x) } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ f <- function(x = y, y = x) { y } ; f() } Error in f() : promise already under evaluation: recursive default argument reference or earlier problems? ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ f <- function(x = z) { z = 1 ; x } ; f() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ f <- function(x) { for (i in 1:10) { x <- g(x,i) }; x }; g <- function(x,i) { x + i }; f(2) } [1] 57 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ f <- function(x) { function() {x} } ; a <- 1 ; b <- f(a) ; a <- 10 ; b() } [1] 10 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ foo <- function(a,b) { x<<-4; b; }; x <- 0; foo(2, x > 2); } [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises#Ignored.ImplementationError# #{ foo <- function(x,z) list(x,z); x <- 4; bar <- function() { x <<- 10; 1; }; foo(bar(), x > 5); } [[1]] [1] 1 [[2]] [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises#Ignored.ImplementationError# #{ foo <- function(x,z) x + z; x <- 4; bar <- function() { x <<- 10; 1; }; foo(bar(), x); } [1] 11 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ options(list(width=80)); f <- function(arg, defArg = getOption('width')) { print(arg + defArg); print(defArg) }; f(80L); f(80L); f(80L) } [1] 160 [1] 80 [1] 160 [1] 80 [1] 160 [1] 80 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ x <- rep(80, 1); f <- function(arg, defArg = x) {print(arg + defArg); print(defArg)}; f(80L); f(80L); f(80L) } [1] 160 [1] 80 [1] 160 [1] 80 [1] 160 [1] 80 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ z <- 1 ; f <- function(c = z) { z <- z + 1 ; c } ; f() } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testPromises# #{ z <- 1 ; f <- function(c = z) { c(1,2) ; z <- z + 1 ; c } ; f() } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testRecursion# #{ f<-function(i) { if (i==1) { 1 } else if (i==2) { 1 } else { f(i-1) + f(i-2) } } ; f(10) } [1] 55 ##com.oracle.truffle.r.test.functions.TestFunctions.testRecursion# #{ f<-function(i) { if (i==1L) { 1L } else if (i==2L) { 1L } else { f(i-1L) + f(i-2L) } } ; f(10L) } [1] 55 ##com.oracle.truffle.r.test.functions.TestFunctions.testRecursion# #{ f<-function(i) { if(i<=1) 1 else i*f(i-1) } ; f(10) } [1] 3628800 ##com.oracle.truffle.r.test.functions.TestFunctions.testRecursion# #{ f<-function(i) { if(i<=1) 1 else i*f(i-1) } ; g<-function(n, f, a) { if (n==1) { f(a) } else { f(a) ; g(n-1, f, a) } } ; g(100,f,100) } [1] 9.332622e+157 ##com.oracle.truffle.r.test.functions.TestFunctions.testRecursion# #{ f<-function(i) { if(i<=1L) 1L else i*f(i-1L) } ; f(10L) } [1] 3628800 ##com.oracle.truffle.r.test.functions.TestFunctions.testRecursion# #{ f<-function(i) { if(i==1) { 1 } else { f(i-1) } } ; f(10) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testRecursion# #{ f<-function(i) { if(i==1) { 1 } else { j<-i-1 ; f(j) } } ; f(10) } [1] 1 ##com.oracle.truffle.r.test.functions.TestFunctions.testReturn# #{ f<-function() { return() } ; f() } NULL ##com.oracle.truffle.r.test.functions.TestFunctions.testReturn# #{ f<-function() { return(2) ; 3 } ; f() } [1] 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testReturn# #{ f<-function() { return(invisible(2)) } ; f() } ##com.oracle.truffle.r.test.functions.TestFunctions.testSrcref# #1<<>>f <- quote(function(x, y) <<>> a + <<>> foooo); as.list(f); as.list(f)[[4]]; unclass(as.list(f)[[4]]); class(as.list(f)[[4]]) [1] 1 [[1]] `function` [[2]] [[2]]$x [[2]]$y [[3]] a + foooo [[4]] function(x, y) a + foooo function(x, y) a + foooo [1] 1 12 3 6 12 6 1 3 [1] "srcref" ##com.oracle.truffle.r.test.functions.TestFunctions.testStateTransitions# #{ f<-function(x) { l<-length(x); x[1]<-1 }; y<-c(42,7); f(y); y } [1] 42 7 ##com.oracle.truffle.r.test.functions.TestFunctions.testUnusedArgumentErrors# #{ foo <- function(x) x; foo() } Error in foo() : argument "x" is missing, with no default ##com.oracle.truffle.r.test.functions.TestFunctions.testUnusedArgumentErrors# #{ foo <- function(x) x; foo(1, 2, 3) } Error in foo(1, 2, 3) : unused arguments (2, 3) ##com.oracle.truffle.r.test.functions.TestFunctions.testVarArgPromises# #g <- function(e) get("ex", e);f <- function(e, en) { exports <- g(e); unlist(lapply(en, get, envir = exports, inherits = FALSE))}; e1 <- new.env(); e1n <- new.env(); assign("a", "isa", e1n); assign("ex", e1n, e1); e2 <- new.env(); e2n <- new.env(); assign("b", "isb", e2n); assign("ex", e2n, e2); ex1 <- c("a"); ex2 <- c("b"); f(e1, ex1); f(e2, ex2) == "isb" [1] "isa" [1] TRUE ##com.oracle.truffle.r.test.functions.TestFunctions.testVarArgPromises# #rule <- 1; stopifnot((lenR <- length(rule)) >= 1L, lenR <= 2L) ##com.oracle.truffle.r.test.functions.TestFunctions.testVarArgPromises# #{ seq((abc <- 1), abc + 10) } [1] 1 2 3 4 5 6 7 8 9 10 11 ##com.oracle.truffle.r.test.functions.TestFunctions.testVarArgPromises# #{ seq((abc <- 1), length.out = abc + 1) } [1] 1 2 ##com.oracle.truffle.r.test.functions.TestFunctions.testVarArgPromises# #{ x <- 3; stopifnot((x <- 5) < 10, x == 5); } ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/argMatching.R") } dispatch g.c args: [[1]] NULL $y [1] 42 attr(,"class") [1] "c" dispatch g.c args: [[1]] [1] 42 attr(,"class") [1] "c" dispatch g.default args: [[1]] [1] 42 attr(,"class") [1] "c" $x [1] 42 dispatch g.c args: [[1]] [1] 42 attr(,"class") [1] "c" $y [1] 42 dispatch g.c args: [[1]] NULL $y [1] 42 attr(,"class") [1] "c" $z [1] 42 dispatch side effect y g.c args: side effect z [[1]] NULL $y [1] 42 attr(,"class") [1] "c" $z [1] 42 dispatch side effect z g.default args: side effect y [[1]] [1] 42 attr(,"class") [1] "c" $z [1] 42 dispatch g.default args: [[1]] NULL ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/changeCallerEnclosingEnv.R") } foo.c1 foo.c1 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/missingAsNULL1.R") } [[1]] [[1]]$overload [1] "NULL" [[1]]$x_missing [1] TRUE [[1]]$args list() [[2]] [[2]]$overload [1] "NULL" [[2]]$x_missing [1] FALSE [[2]]$args list() ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/missingAsNULL2.R") } $first_missing $first_missing$overload [1] "bar" $first_missing$x_missing [1] TRUE $first_missing$y_missing [1] FALSE $all_missing $all_missing$overload [1] "bar" $all_missing$x_missing [1] TRUE $all_missing$y_missing [1] TRUE ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/nextMethod.R") } called foo.default with 42 with '' as class called foo.default with 42 with classes baz and bar: called foo.baz with 42 called foo.bar with 42 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/nextMethodAdditionalArgs1.R") } called foo.baz with 42 list() called foo.bar with 42 [[1]] [1] 3 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/nextMethodAdditionalArgs2.R") } foo.bar with: $x [1] 42 attr(,"class") [1] "baz" "bar" $a [1] "caller-a" $b [1] "caller-b" $c [1] "explicit-from-baz" $cc [1] "caller-d" $named $named$e [1] "caller-e" $named$f [1] "named-from-baz" foo.bar with: $x [1] 42 attr(,"class") [1] "bazz" "bar" $a [1] "caller-a" $b [1] "caller-b" $c [1] "explicit-from-baz" $cc [1] "caller-d" $named $named$e [1] "caller-e" $named$f [1] "named-from-baz" foo.bar with: $x [1] 42 attr(,"class") [1] "bazzz" "bar" $a [1] "caller-a" $b [1] "caller-b" $c [1] "explicit-from-baz" $cc [1] "caller-d" $named $named$e [1] "caller-e" $named[[2]] [1] "matched-positionally?" $named$f [1] "named-from-baz" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/nextMethodAdditionalArgs3.R") } foo.baz foo.bar with: evaluated b-from-caller $x [1] 42 attr(,"class") [1] "baz" "bar" $a [1] "a-from-baz" $b [1] "b-from-caller" $named list() foo.bar with: evaluated b-from-caller $x [1] 42 attr(,"class") [1] "bazz" "bar" $a [1] "a-from-bazz" $b [1] "b-from-caller" $named list() foo.bar with: $x [1] 42 attr(,"class") [1] "bazzz" "bar" $a [1] "a-from-bazz" $b [1] "b-from-caller" $named list() ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/nextMethodAdditionalArgs4.R") } foo.baz foo.bar with: $x [1] 42 attr(,"class") [1] "baz" "bar" $a [1] "positional-from-caller" $b [1] "positional-explicit" $mynamed [1] "named-explicit" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests#Ignored.Unknown# #{ source("tmptest/S3/nextMethodAdditionalArgsPromises1.R") } foo.bar with: $x [1] 42 attr(,"class") [1] "baz" "bar" $a [1] "caller-a" $b [1] "caller-b" $c [1] "explicit-from-baz" $cc [1] "caller-d" $named $named$e [1] "caller-e" $named$f [1] "named-from-baz" foo.bar with: $x [1] 42 attr(,"class") [1] "bazz" "bar" $a [1] "caller-a" $b [1] "caller-b" $c [1] "explicit-from-baz" $cc [1] "caller-d" $named $named$e [1] "caller-e" $named$f [1] "named-from-baz" foo.bar with: evaluated matched-positionally? $x [1] 42 attr(,"class") [1] "bazzz" "bar" $a [1] "caller-a" $b [1] "caller-b" $c [1] "explicit-from-baz" $cc [1] "caller-d" $named $named$e [1] "caller-e" $named[[2]] [1] "matched-positionally?" $named$f [1] "named-from-baz" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/nextMethodArgsMatching.R") } foo.bar with: $x [1] 42 attr(,"class") [1] "baz" "bar" $a [1] "caller-a" $b [1] "caller-b" $c [1] "def-bar" $cc [1] "caller-d" $named $named$e [1] "caller-e" foo.bar with: $x [1] 42 attr(,"class") [1] "bazz" "bar" $a [1] "caller-a" $b [1] "caller-b" $c [1] "def-bar" $cc [1] "caller-d" $named $named$e [1] "caller-e" foo.bar with: $x [1] 42 attr(,"class") [1] "bazzz" "bar" $a [1] "caller-a" $b [1] "caller-b" $c [1] "def-bar" $cc [1] "caller-d" $named $named$e [1] "caller-e" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.runRSourceTests# #{ source("tmptest/S3/numericTypes.R") } integer double logical default ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testComplexGroupDispatch# #{x<--7+2i;class(x)<-"foo";Complex.foo<-function(z){1;};Im(x);} [1] 1 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testDefaultArguments# #foo<-function(x,def1=TRUE)UseMethod('foo'); foo.default<-function(x,...)list(...); foo(42); list() ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testDefaultArguments# #foo<-function(x,def1=TRUE)UseMethod('foo'); foo.default<-function(x,def1)def1; foo(42); Error in foo.default(42) : argument "def1" is missing, with no default ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testDispatchOnMatrix# #{ glob_flag <- FALSE; my_generic <- function(x) UseMethod('my_generic', x); my_generic.array <- function(x) glob_flag <<- TRUE; m <- 1:9; dim(m) <- c(3,3); my_generic(x); glob_flag } Error in my_generic(x) : object 'x' not found ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testDispatchOnMatrix# #{ glob_flag <- FALSE; my_generic <- function(x) UseMethod('my_generic', x); my_generic.array <- function(x) glob_flag <<- TRUE; m <- matrix(1:9, ncol=3); my_generic(x); glob_flag } Error in my_generic(x) : object 'x' not found ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testDispatchWithNULL# #{ fun <- function(x = 42L) UseMethod('fun'); fun.integer <- function(x) 'integer'; fun.NULL <- function(x) 'NULL'; fun(); } [1] "NULL" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testDispatchWithNULL# #{ fun <- function(x) UseMethod('fun'); fun.NULL <- function(x) 'integer'; fun(); } [1] "integer" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testDispatchWithNULL# #{ fun <- function(x) UseMethod('fun'); fun.NULL <- function(x) 'integer'; fun(NULL); } [1] "integer" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testDispatchWithPartialNameMatching# #f.default<-function(abc, bbb, ...)list(abc, bbb, ...); f<-function(x,...)UseMethod('f'); f(13, ab=42, b=1, c=5); [[1]] [1] 42 [[2]] [1] 1 [[3]] [1] 13 $c [1] 5 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testGenericDispatchThroughMethodsTable# #terms(x~z)[1]; x ~ z attr(,"variables") list(x, z) attr(,"factors") z x 0 z 1 attr(,"term.labels") [1] "z" attr(,"order") [1] 1 attr(,"intercept") [1] 1 attr(,"response") [1] 1 attr(,".Environment") ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testGenericDispatchThroughMethodsTable# #{ assign('Ops.myclass', function(a,b) 42, envir=.__S3MethodsTable__.); x<-1; class(x)<-'myclass'; res <- x+x; rm('Ops.myclass', envir=.__S3MethodsTable__.); res; } [1] 42 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testGenericDispatchThroughMethodsTable# #{ assign('[[.myclass', function(a,b) 42, envir=.__S3MethodsTable__.); x<-1; class(x)<-'myclass'; res <- x[[99]]; rm('[[.myclass', envir=.__S3MethodsTable__.); res; } [1] 42 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testMathGroupDispatch# #{x<--7;class(x)<-"foo";Math.foo<-function(z){-z;};log(x);} [1] 7 attr(,"class") [1] "foo" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testMathGroupDispatch# #{x<--7;class(x)<-"foo";Math.foo<-function(z){x};abs(x);} [1] -7 attr(,"class") [1] "foo" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testMethodTableDispatch# #t <- ts(1:3); class(t) <- c('ts', 'foo'); print.foo <- function(x, ...) 'foo'; print(t) Time Series: Start = 1 End = 3 Frequency = 1 [1] 1 2 3 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testNextMethod# #{ f.default<-function(x, a=7) a; f.foo<-function(x, a=v) { b<-NextMethod("f"); v=42; c(a,b) }; x<-1; class(x)<-"foo"; f<-function(x) UseMethod("f"); f(x) } [1] 42 7 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testNextMethod# #{ foo <- function(x,y) UseMethod('foo'); foo.bar <- function(x, y) { y <- 10; NextMethod() }; foo.default <- function(x,y) cat(x,y); v <- c(1,2,3); class(v) <- 'bar'; foo(v,5) } 1 2 3 10 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testNextMethod# #{ g<-function(){ x<-1; class(x)<-c("a","b","c"); f<-function(x){UseMethod("f")}; f.a<-function(x){cat("a");NextMethod("f",x)}; f.b<-function(x){cat("b")}; f(x); }; g() } ab ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testNextMethod# #{ g<-function(){ x<-1; class(x)<-c("a","b","c"); f<-function(x){UseMethod("f")}; f.a<-function(x){cat("a");NextMethod("f",x, 42)}; f.b<-function(x, y=7){cat("b", y)}; f(x); }; g(); } ab 42 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testNextMethod# #{ g<-function(){ x<-1; class(x)<-c("a","b","c"); f<-function(x){UseMethod("f")}; f.a<-function(x){cat("a");NextMethod("f",x,"m","n")}; f.b<-function(x, y="h", z="i"){cat("b", y, z)}; f(x); }; g() } ab m n ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testNextMethod# #{ g<-function(){ x<-1; class(x)<-c("a","b","c"); f<-function(x){UseMethod("f")}; f.a<-function(x){cat("a");NextMethod("f",x,z="m",y="n")}; f.b<-function(x, y="h", z="i"){cat("b", y, z)}; f(x); }; g() } ab n m ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatch# #{ Ops.c1 <- function(a,b) list(c1 = .Method, c2 = NextMethod()); Ops.c2 <- function(a,b) .Method;44 == structure(42, class = c('c1', 'c2')); } $c1 [1] "" "Ops.c1" $c2 [1] "" "Ops.c2" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatch# #{ Ops.c1 <- function(a,b) list(c1 = .Method, c2 = NextMethod()); Ops.c2 <- function(a,b) .Method;structure(42, class = c('c1', 'c2')) == 44; } $c1 [1] "Ops.c1" "" $c2 [1] "Ops.c2" "" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatch# #{ Ops.c1 <- function(a,b) list(c1 = .Method, c2 = NextMethod()); Ops.c2 <- function(a,b) .Method;structure(42, class = c('c1', 'c2')) == structure(42, class = c('c1')); } $c1 [1] "Ops.c1" "Ops.c1" $c2 [1] "Ops.c2" "Ops.c2" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatch# #{ Ops.c1 <- function(a,b) list(c1 = .Method, c2 = NextMethod()); Ops.c2 <- function(a,b) .Method;structure(42, class = c('c1', 'c2')) == structure(42, class = c('c1', 'c2')); } $c1 [1] "Ops.c1" "Ops.c1" $c2 [1] "Ops.c2" "Ops.c2" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatch# #{x<-1;class(x)<-"foo";"!.foo"<-function(e1,e2){x};!x} [1] 1 attr(,"class") [1] "foo" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatch# #{x<-1;y<-7;class(x)<-"foo";class(y)<-"foo";"*.foo"<-function(e1,e2){min(e1,e2)};x*y} [1] 1 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatch# #{x<-1;y<-7;class(x)<-"foo";class(y)<-"foo";"^.foo"<-function(e1,e2){e1+e2};x^y} [1] 8 attr(,"class") [1] "foo" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatch# #{x<-1;y<-7;class(x)<-"foo";class(y)<-"fooX";"*.foo"<-function(e1,e2){min(e1,e2)};x*y} [1] 1 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatch# #{x<-1;y<-7;class(x)<-"fooX";class(y)<-"foo";"*.foo"<-function(e1,e2){min(e1,e2)};x*y} [1] 1 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatch# #{x<-1;y<-7;class(x)<-"fooX";class(y)<-"fooX";"*.foo"<-function(e1,e2){min(e1,e2)};x*y} [1] 7 attr(,"class") [1] "fooX" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testOpsGroupDispatchLs# #{x<-1;y<-7;class(x)<-"foo";class(y)<-"foo";"*.foo"<-function(e1,e2){min(e1,e2)}; ls()} [1] "*.foo" "x" "y" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testSummaryGroupDispatch# #{Summary.myclass <- function(...,na.rm)c(list(...),na.rm); max(na.rm=TRUE,structure(42,class='myclass'));} [[1]] [1] 42 attr(,"class") [1] "myclass" [[2]] [1] TRUE ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testSummaryGroupDispatch# #{Summary.myclass <- function(...,na.rm)c(list(...),na.rm); max(structure(42,class='myclass'));} [[1]] [1] 42 attr(,"class") [1] "myclass" [[2]] [1] FALSE ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testSummaryGroupDispatch# #{x<-c(1,2,3);class(x)<-"foo";Summary.foo<-function(x,...){"summary"};max(x)} [1] "summary" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testSummaryGroupDispatch# #{x<-c(1,2,3);class(x)<-"foo";Summary.foo<-function(x,...){"summary"};min(x)} [1] "summary" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testSummaryGroupDispatch# #{x<-c(1,2,3);class(x)<-"foo";min.foo<-function(x,...){"summary"};min(x)} [1] "summary" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testUseMethodArgsMatchingAfterDispatch# #{ foo.default <- function(a,b,c) { print(list(a=a,b=b,c=c)) }; foo <- function(c,a,b) { UseMethod('foo') }; foo('a','b','c'); } $a [1] "a" $b [1] "b" $c [1] "c" ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testUseMethodArgsMatchingAfterDispatch# #{ foo.default <- function(y, ...) { y }; foo <- function(x, ...) { UseMethod('foo') }; foo(1,2,y=3); } [1] 3 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testUseMethodArgsMatchingAfterDispatch# #{ foo.default <- function(y, ...) { y }; foo <- function(x, ...) { UseMethod('foo') }; foo(42); } [1] 42 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testUseMethodEnclFuncArgs# #{f <- function(x,y,z){ UseMethod("f"); }; f.second <- function(x,y,z){cat("f second",x,y,z)}; obj <-1; attr(obj,"class") <- "second"; arg2=2; arg3=3; f(obj,arg2,arg3);} f second 1 2 3 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testUseMethodLocalVars#Ignored.ImplementationError# #{f <- function(x){ y<-2;locFun <- function(){cat("local")}; UseMethod("f"); }; f.second <- function(x){cat("f second",x);locFun();}; obj <-1; attr(obj,"class") <- "second"; f(obj);} f second 1local ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testUseMethodNested# #{f <- function(x){g<- function(x){ h<- function(x){ UseMethod("f");}; h(x)}; g(x) }; f.second <- function(x){cat("f second",x);}; obj <-1; attr(obj,"class") <- "second"; f(obj);} f second 1 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testUseMethodOneArg# #{f <- function(x){ UseMethod("f"); };f.first <- function(x){cat("f first",x)}; f.second <- function(x){cat("f second",x)}; obj <-1; attr(obj,"class") <- "first"; f(obj); attr(obj,"class") <- "second";} f first 1 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testUseMethodReturn# #{f <- function(x){ UseMethod("f");cat("This should not be executed"); }; f.second <- function(x){cat("f second",x);}; obj <-1; attr(obj,"class") <- "second"; f(obj);} f second 1 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testUseMethodSimple# #{f <- function(x){ UseMethod("f",x); };f.first <- function(x){cat("f first",x)};f.second <- function(x){cat("f second",x)};obj <-1;attr(obj,"class") <- "first";f(obj);attr(obj,"class") <- "second";} f first 1 ##com.oracle.truffle.r.test.functions.TestS3Dispatch.testUseMethodSimple# #{f<-function(x){UseMethod("f")};f.logical<-function(x){print("logical")};f(TRUE)} [1] "logical" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.runRSourceTests# #{ source("tmptest/condition/withCallingHandlers0.R") } { fun1("first") fun1("second") } [1] "enter fun1 first" [1] "enter handle_myCondition myCondition: signalfirst\n" [1] "continue" [1] "exit fun1 first" [1] "enter fun1 second" [1] "enter handle_myCondition myCondition: signalsecond\n" [1] "continue" [1] "exit fun1 second" [1] "exit fun0" [1] "enter fun1 first" [1] "enter handle_myCondition myCondition: signalfirst\n" [1] "continue" [1] "exit fun1 first" [1] "enter fun1 second" [1] "enter handle_myCondition myCondition: signalsecond\n" [1] "continue" [1] "exit fun1 second" NULL [1] "exit fun0" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.runRSourceTests# #{ source("tmptest/condition/withCallingHandlers1.R") } { fun1("first") fun1("second") } [1] "enter fun1 first" [1] "enter handle_cond1 cond1: signalfirst\n" [1] "after cond1 restart" [1] "enter handle_cond0 cond0: signalfirst\n" [1] "continue" [1] "exit fun1 first" [1] "enter fun1 second" [1] "enter handle_cond1 cond1: signalsecond\n" [1] "after cond1 restart" [1] "enter handle_cond0 cond0: signalsecond\n" [1] "continue" [1] "exit fun1 second" [1] "exit fun0" [1] "enter fun1 first" [1] "enter handle_cond1 cond1: signalfirst\n" [1] "after cond1 restart" [1] "enter handle_cond0 cond0: signalfirst\n" [1] "continue" [1] "exit fun1 first" [1] "enter fun1 second" [1] "enter handle_cond1 cond1: signalsecond\n" [1] "after cond1 restart" [1] "enter handle_cond0 cond0: signalsecond\n" [1] "continue" [1] "exit fun1 second" NULL [1] "exit fun0" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch# #my.error <- function(war) cat('my.error:', war$message, '\n'); f <- function() print(g); tryCatch({f()}, error=my.error) my.error: object 'g' not found ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch# #x <- { tryCatch(stop('fred'), error = function(e) e, finally = print('Hello'))}; x$call <- NULL; x [1] "Hello" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch# #{ e <- simpleError("test error"); f <- function() { tryCatch(1, finally = print("Hello")); stop(e)}; f() } [1] "Hello" Error: test error ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch# #{ e <- simpleError("test error"); tryCatch(stop(e), error = function(e) e, finally = print("Hello"))} [1] "Hello" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch# #{ e <- simpleError("test error"); tryCatch(stop(e), finally = print("Hello")) } Error: test error [1] "Hello" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch# #{ f <- function() { tryCatch(1, error = function(e) print("Hello")); stop("fred")}; f() } Error in f() : fred ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch# #{ f <- function() { tryCatch(stop("fred"), error = function(e) print("Hello"))}; f() } [1] "Hello" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch# #{ tryCatch(1, finally = print("Hello")) } [1] "Hello" [1] 1 ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch#Output.IgnoreErrorContext# #{ tryCatch(stop("fred"), finally = print("Hello")) } Error in tryCatchList(expr, classes, parentenv, handlers) : fred [1] "Hello" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch# #{ tryCatch(stop("xyz"), error=function(e) { cat("");123L }, finally=function() { cat("")}) } [1] 123 ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testTryCatch#Ignored.ImplementationError# #{ tryCatch(stop('fred'), error = function(e) e, finally = print('Hello'))} [1] "Hello" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWarning# #my.warning <- function(war) cat('my.warning:', war$message, '\n'); f <- function() warning('from f'); tryCatch({f()}, warning=my.warning) my.warning: from f ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWarning# #tryCatch(warning('some warning text'), warning = function(w) {print('WARNING')}) [1] "WARNING" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithCallingHandlers#Output.IgnoreErrorContext# #withCallingHandlers(stop('error message'), error=function(e) {}) Error in withCallingHandlers(stop("error message"), error = function(e) { : error message ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithCallingHandlers#Output.IgnoreErrorMessage# #withCallingHandlers(unknownSymbol(), condition = function(e) {}) Error in unknownSymbol() : could not find function "unknownSymbol" ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithCallingHandlers# #withCallingHandlers({message("foo");123L},<<>> message=function(e) {<<>> cat("")<<>> invokeRestart("muffleMessage")<<>> }) [1] 123 ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithCallingHandlers# #withCallingHandlers({message("foo");123L},<<>> message=function(e) {cat("")}) foo [1] 123 ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithCallingHandlers# #withCallingHandlers({message("foo");packageStartupMessage("bar");123L},<<>> packageStartupMessage=function(e) {<<>> cat("")<<>> invokeRestart("muffleMessage")<<>> }) foo [1] 123 ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithCallingHandlers# #withCallingHandlers({warning("foo");123L},<<>> warning=function(e) {<<>> cat("")<<>> invokeRestart("muffleWarning")<<>> }) [1] 123 ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithCallingHandlers#Output.IgnoreWarningContext# #withCallingHandlers({warning("foo");123L},<<>> warning=function(e) {cat("")}) [1] 123 Warning message: In withCallingHandlers({ : foo ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithRestarts# #invisible(withCallingHandlers(warning('warn'), warning=function(...) { print(sys.call()[[1]]); invokeRestart('muffleWarning'); })) function(...) { print(sys.call()[[1]]); invokeRestart('muffleWarning'); } ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithRestarts#Ignored.ImplementationError# #invisible(withCallingHandlers(warning('warn'), warning=function(arg) { print(unclass(arg)); invokeRestart('muffleWarning'); })) $message [1] "warn" $call withCallingHandlers(warning("warn"), warning = function(arg) { print(unclass(arg)) invokeRestart("muffleWarning") }) ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithRestarts# #withRestarts(computeRestarts(),<<>> foo=function(a,b) c(a,b)) [[1]] [[2]] ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithRestarts# #withRestarts(findRestart("foo"),<<>> foo=function(a,b) c(a,b)) ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithRestarts# #withRestarts(findRestart("noSuchRestart"),<<>> foo=function(a,b) c(a,b)) NULL ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithRestarts# #withRestarts({cat("");invokeRestart("foo", 123L, 456L);789L},<<>> foo=function(a,b) c(a,b)) [1] 123 456 ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithRestarts# #withRestarts({cat("");invokeRestart("foo", 123L, 456L);789L},<<>> foo=function(a,b) {cat("");invokeRestart("foo", a+1, b+1)},<<>> foo=function(a,b) {cat("");c(a,b)}) [1] 124 457 ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithRestarts# #withRestarts({cat("");invokeRestart("foo", 123L, 456L);789L},<<>> foo=list(description="my handler", handler=function(a,b) c(a,b))) [1] 123 456 ##com.oracle.truffle.r.test.library.base.TestConditionHandling.testWithRestarts#Ignored.ImplementationError# #{ boo <- function() invisible("hello world"); foo <- function(expr) expr; foo(boo()); } ##com.oracle.truffle.r.test.library.base.TestConnections.runRSourceTests#Ignored.Unknown# #{ source("tmptest/connections/fifo_GnuR_example.R") } [1] "abc" ##com.oracle.truffle.r.test.library.base.TestConnections.runRSourceTests# #{ source("tmptest/connections/gzcon.R") } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestConnections.runRSourceTests# #{ source("tmptest/connections/rawConnection_readBin.R") } ##com.oracle.truffle.r.test.library.base.TestConnections.runRSourceTests# #{ source("tmptest/connections/rawConnection_readWriteBin.R") } ##com.oracle.truffle.r.test.library.base.TestConnections.runRSourceTests# #{ source("tmptest/connections/rawConnection_seek.R") } ##com.oracle.truffle.r.test.library.base.TestConnections.runRSourceTests# #{ source("tmptest/connections/rawConnection_writeBin.R") } ##com.oracle.truffle.r.test.library.base.TestConnections.runRSourceTests# #{ source("tmptest/connections/readLines_GnuR_example.R") } [1] "TITLE extra line" "2 3 5 7" "" "11 13 17" [5] "123" "abc" "123" "abc def" Warning message: In readLines("test1") : incomplete final line found on 'test1' ##com.oracle.truffle.r.test.library.base.TestConnections.runRSourceTests# #{ source("tmptest/connections/textConnection.R") } Read 4 items Read 4 items Summary of Residuals: ##com.oracle.truffle.r.test.library.base.TestConnections.testEncoding# #fin <- file('', "w+", encoding = "___inexistingCharSet___") Error in file("", "w+", encoding = "___inexistingCharSet___") : unsupported conversion from '___inexistingCharSet___' to '' ##com.oracle.truffle.r.test.library.base.TestConnections.testEncoding# #{ wline <- 'Hellö'; fin <- file('', 'w+', encoding = 'UTF-8'); writeLines(wline, fin); seek(fin, 0); rline <- readLines(fin, 1); close(fin); c(wline, rline, wline == rline) } [1] "Hellö" "Hellö" "TRUE" ##com.oracle.truffle.r.test.library.base.TestConnections.testFifoOpenInexisting# #capabilities("fifo") fifo TRUE ##com.oracle.truffle.r.test.library.base.TestConnections.testFifoOpenInexisting# #{ fn <- '___fifo_2367253765'; zz <- fifo(fn, 'r', blocking = TRUE); close(zz); unlink(fn) } Error in fifo(fn, "r", blocking = TRUE) : cannot open the connection In addition: Warning message: In fifo(fn, "r", blocking = TRUE) : cannot open fifo '___fifo_2367253765' ##com.oracle.truffle.r.test.library.base.TestConnections.testFileOpenRaw# #{ zz <- file("gzipped_____5137528280012599068___.gz", "r", raw=T); res <- readBin(zz, raw(), 4); close(zz); res } Error in readBin(zz, raw(), 4) : can only read from a binary connection ##com.oracle.truffle.r.test.library.base.TestConnections.testFileOpenRaw# #{ zz <- rawConnection(as.raw(c(65, 0))); readChar(zz, 1) } [1] "A" ##com.oracle.truffle.r.test.library.base.TestConnections.testFileOpenRaw#Output.IgnoreWarningMessage# #{ zz <- rawConnection(as.raw(c(65, 0))); readChar(zz, 2) } [1] "A" Warning message: In readChar(zz, 2) : truncating string with embedded nuls ##com.oracle.truffle.r.test.library.base.TestConnections.testFileOpenRaw#Output.IgnoreWarningMessage# #{ zz <- rawConnection(as.raw(c(65, 0))); readChar(zz, 3) } [1] "A" Warning message: In readChar(zz, 3) : truncating string with embedded nuls ##com.oracle.truffle.r.test.library.base.TestConnections.testFileOpenRaw#Output.IgnoreWarningMessage# #{ zz <- rawConnection(as.raw(c(65, 0, 65))); readChar(zz, 3) } [1] "A" Warning message: In readChar(zz, 3) : truncating string with embedded nuls ##com.oracle.truffle.r.test.library.base.TestConnections.testFileOpenRaw#Output.IgnoreWarningMessage# #{ zz <- rawConnection(as.raw(c(65, 66, 67, 0, 97, 98, 99))); readChar(zz, 6) } [1] "ABC" Warning message: In readChar(zz, 6) : truncating string with embedded nuls ##com.oracle.truffle.r.test.library.base.TestConnections.testFileSummary# #zz <- file('', 'w+'); summary(zz); close(zz) $description [1] "" $class [1] "file" $mode [1] "w+" $text [1] "text" $opened [1] "opened" $`can read` [1] "yes" $`can write` [1] "yes" ##com.oracle.truffle.r.test.library.base.TestConnections.testFileSummary# #{ zz <- file("gzipped_____5137528280012599068___.gz", "r"); res <- summary(zz); close(zz); res } $description [1] "gzipped_____5137528280012599068___.gz" $class [1] "gzfile" $mode [1] "r" $text [1] "text" $opened [1] "opened" $`can read` [1] "yes" $`can write` [1] "no" ##com.oracle.truffle.r.test.library.base.TestConnections.testFileWriteReadBin# #{ cat('abc', file = 'tmptest/com.oracle.truffle.r.test.library.base.conn/wb3'); readBin(file('tmptest/com.oracle.truffle.r.test.library.base.conn/wb3', 'rb'), character(), 2) } character(0) Warning message: In readBin(file("tmptest/com.oracle.truffle.r.test.library.base.conn/wb3", : incomplete string at end of file has been discarded ##com.oracle.truffle.r.test.library.base.TestConnections.testFileWriteReadBin# #{ readBin(file("tmptest/com.oracle.truffle.r.test.library.base.conn/wb1", "rb"), 3) } numeric(0) ##com.oracle.truffle.r.test.library.base.TestConnections.testFileWriteReadBin# #{ writeBin("abc", file("tmptest/com.oracle.truffle.r.test.library.base.conn/wb1", open="wb")) } ##com.oracle.truffle.r.test.library.base.TestConnections.testFileWriteReadBin# #{ zz <- file("tmptest/com.oracle.truffle.r.test.library.base.conn/wb2", open="wb"); writeChar("abc", zz); close(zz); readBin(file("tmptest/com.oracle.truffle.r.test.library.base.conn/wb2", "rb"), character(), 4) } [1] "abc" ##com.oracle.truffle.r.test.library.base.TestConnections.testFileWriteReadChar# #{ readChar(file("tmptest/com.oracle.truffle.r.test.library.base.conn/wc1"), 3) } [1] "abc" ##com.oracle.truffle.r.test.library.base.TestConnections.testFileWriteReadChar# #{ writeChar("abc", file("tmptest/com.oracle.truffle.r.test.library.base.conn/wc1")) } ##com.oracle.truffle.r.test.library.base.TestConnections.testFileWriteReadLines# #{ con <- file("tmptest/com.oracle.truffle.r.test.library.base.conn/wl2"); readLines(con, 2) } [1] "line1" "line2" ##com.oracle.truffle.r.test.library.base.TestConnections.testFileWriteReadLines# #{ con <- file("tmptest/com.oracle.truffle.r.test.library.base.conn/wl2"); writeLines(c("line1", "line2"), con) } ##com.oracle.truffle.r.test.library.base.TestConnections.testFileWriteReadLines# #{ readLines(file("tmptest/com.oracle.truffle.r.test.library.base.conn/wl1"), 2) } [1] "line1" "line2" ##com.oracle.truffle.r.test.library.base.TestConnections.testFileWriteReadLines# #{ writeLines(c("line1", "line2"), file("tmptest/com.oracle.truffle.r.test.library.base.conn/wl1")) } ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack("G", con); clearPushBack(con); pushBackLength(con) } [1] 0 ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack("G", con); pushBackLength(con) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack("G", con); readLines(con, 1) } [1] "G" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack("G", con); readLines(con, 2) } [1] "G" "a" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack("G", con, newLine=FALSE); readLines(con, 1) } [1] "Ga" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack("G", con, newLine=FALSE); readLines(con, 2) } [1] "Ga" "b" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G", "H"), con); pushBackLength(con) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G", "H"), con); readLines(con, 1) } [1] "G" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G", "H"), con); readLines(con, 2) } [1] "G" "H" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G", "H"), con, newLine=FALSE); pushBackLength(con) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G", "H"), con, newLine=FALSE); readLines(con, 1) } [1] "GHa" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G", "H"), con, newLine=FALSE); readLines(con, 2) } [1] "GHa" "b" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G\nH"), con); pushBackLength(con) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G\nH"), con); readLines(con, 1) } [1] "G" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G\nH"), con); readLines(con, 2) } [1] "G" "H" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G\nH"), con, newLine=FALSE); pushBackLength(con) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G\nH"), con, newLine=FALSE); readLines(con, 1) } [1] "G" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBack(c("G\nH"), con, newLine=FALSE); readLines(con, 2) } [1] "G" "Ha" ##com.oracle.truffle.r.test.library.base.TestConnections.testPushBackTextConnection# #{ con<-textConnection(c("a","b","c","d")); pushBackLength(con) } [1] 0 ##com.oracle.truffle.r.test.library.base.TestConnections.testRawReadAppendText# #{ rc <- rawConnection(raw(0), "a+"); close(rc); write(charToRaw("A"), rc) } Error in cat(x, file = file, sep = c(rep.int(sep, ncolumns - 1), "\n"), : invalid connection ##com.oracle.truffle.r.test.library.base.TestConnections.testRawReadAppendText# #{ rv <- charToRaw("Hello"); rc <- rawConnection(rv, "a+"); write(charToRaw(", World"), rc); res <- rawConnectionValue(rc); close(rc); res } [1] 48 65 6c 6c 6f 32 63 20 32 30 20 35 37 20 36 66 20 37 32 0a 36 63 20 36 34 [26] 0a ##com.oracle.truffle.r.test.library.base.TestConnections.testRawReadAppendText# #{ rv <- charToRaw("Hello"); rc <- rawConnection(rv, "a+"); write(charToRaw(", World"), rc); res <- rawToChar(rawConnectionValue(rc)); close(rc); res } [1] "Hello2c 20 57 6f 72\n6c 64\n" ##com.oracle.truffle.r.test.library.base.TestConnections.testRawReadAppendText# #{ rv <- charToRaw("Hello"); rc <- rawConnection(rv, "a+"); writeChar(", World", rc); res <- rawConnectionValue(rc); close(rc); res } [1] 48 65 6c 6c 6f 2c 20 57 6f 72 6c 64 00 ##com.oracle.truffle.r.test.library.base.TestConnections.testRawReadAppendText# #{ rv <- charToRaw("Hello"); rc <- rawConnection(rv, "a+"); writeChar(", World", rc); res <- rawToChar(rawConnectionValue(rc)); close(rc); res } [1] "Hello, World" ##com.oracle.truffle.r.test.library.base.TestConnections.testRawReadWriteText# #{ rc <- rawConnection(raw(0), "r+"); close(rc); write(charToRaw("A"), rc) } Error in cat(x, file = file, sep = c(rep.int(sep, ncolumns - 1), "\n"), : invalid connection ##com.oracle.truffle.r.test.library.base.TestConnections.testRawReadWriteText# #{ rv <- charToRaw("Hello"); rc <- rawConnection(rv, "r+"); write(charToRaw(", World"), rc); res <- rawConnectionValue(rc); close(rc); res } [1] 32 63 20 32 30 20 35 37 20 36 66 20 37 32 0a 36 63 20 36 34 0a ##com.oracle.truffle.r.test.library.base.TestConnections.testRawReadWriteText# #{ rv <- charToRaw("Hello"); rc <- rawConnection(rv, "r+"); write(charToRaw(", World"), rc); res <- rawToChar(rawConnectionValue(rc)); close(rc); res } [1] "2c 20 57 6f 72\n6c 64\n" ##com.oracle.truffle.r.test.library.base.TestConnections.testRawReadWriteText# #{ rv <- charToRaw("Hello"); rc <- rawConnection(rv, "r+"); writeChar(", World", rc); res <- rawConnectionValue(rc); close(rc); res } [1] 2c 20 57 6f 72 6c 64 00 ##com.oracle.truffle.r.test.library.base.TestConnections.testRawReadWriteText# #{ rv <- charToRaw("Hello"); rc <- rawConnection(rv, "r+"); writeChar(", World", rc); res <- rawToChar(rawConnectionValue(rc)); close(rc); res } [1] ", World" ##com.oracle.truffle.r.test.library.base.TestConnections.testRawWriteBinary# #conn <- rawConnection(raw(0), 'w'); value <- c(1,2,3); save(value, file=conn, version=2); rawConnectionValue(conn) [1] 52 44 58 32 0a 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 04 02 00 00 [26] 00 01 00 04 00 09 00 00 00 05 76 61 6c 75 65 00 00 00 0e 00 00 00 03 3f f0 [51] 00 00 00 00 00 00 40 00 00 00 00 00 00 00 40 08 00 00 00 00 00 00 00 00 00 [76] fe ##com.oracle.truffle.r.test.library.base.TestConnections.testRawWriteBinary# #conn <- rawConnection(raw(0), 'w'); value <- c(1,2,3); save(value, file=conn, version=3); rawConnectionValue(conn) [1] 52 44 58 33 0a 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 [26] 46 2d 38 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 05 76 61 6c 75 65 00 [51] 00 00 0e 00 00 00 03 3f f0 00 00 00 00 00 00 40 00 00 00 00 00 00 00 40 08 [76] 00 00 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.library.base.TestConnections.testRawWriteBinary# #conn <- rawConnection(raw(0), 'wb'); value <- list(a=c(1,2,3), b='foo'); save(value, file=conn, version=2); rawConnectionValue(conn) [1] 52 44 58 32 0a 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 04 02 00 00 [26] 00 01 00 04 00 09 00 00 00 05 76 61 6c 75 65 00 00 02 13 00 00 00 02 00 00 [51] 00 0e 00 00 00 03 3f f0 00 00 00 00 00 00 40 00 00 00 00 00 00 00 40 08 00 [76] 00 00 00 00 00 00 00 00 10 00 00 00 01 00 04 00 09 00 00 00 03 66 6f 6f 00 [101] 00 04 02 00 00 00 01 00 04 00 09 00 00 00 05 6e 61 6d 65 73 00 00 00 10 00 [126] 00 00 02 00 04 00 09 00 00 00 01 61 00 04 00 09 00 00 00 01 62 00 00 00 fe [151] 00 00 00 fe ##com.oracle.truffle.r.test.library.base.TestConnections.testRawWriteBinary# #conn <- rawConnection(raw(0), 'wb'); value <- list(a=c(1,2,3), b='foo'); save(value, file=conn, version=3); rawConnectionValue(conn) [1] 52 44 58 33 0a 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 [26] 46 2d 38 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 05 76 61 6c 75 65 00 [51] 00 02 13 00 00 00 02 00 00 00 0e 00 00 00 03 3f f0 00 00 00 00 00 00 40 00 [76] 00 00 00 00 00 00 40 08 00 00 00 00 00 00 00 00 00 10 00 00 00 01 00 04 00 [101] 09 00 00 00 03 66 6f 6f 00 00 04 02 00 00 00 01 00 04 00 09 00 00 00 05 6e [126] 61 6d 65 73 00 00 00 10 00 00 00 02 00 04 00 09 00 00 00 01 61 00 04 00 09 [151] 00 00 00 01 62 00 00 00 fe 00 00 00 fe ##com.oracle.truffle.r.test.library.base.TestConnections.testRawWriteBinary# #f <- tempfile(); unlink(f); x <- 1:10; save(x, file=f, version=2); con <- file(f, 'rb'); dput(class(con)) c("file", "connection") ##com.oracle.truffle.r.test.library.base.TestConnections.testRawWriteBinary# #f <- tempfile(); unlink(f); x <- 1:10; save(x, file=f, version=3); con <- file(f, 'rb'); dput(class(con)) c("file", "connection") ##com.oracle.truffle.r.test.library.base.TestConnections.testRawWriteBinary#Ignored.ImplementationError# #{ s <- "äöüß"; rc <- rawConnection(raw(0), "wb"); write(charToRaw(s), rc); res <- rawConnectionValue(rc); close(rc); res } [1] 63 33 20 61 34 20 63 33 20 62 36 20 63 33 0a 62 63 20 63 33 20 39 66 0a ##com.oracle.truffle.r.test.library.base.TestConnections.testRawWriteBinary# #{ zz <- rawConnection(raw(0), "wb"); x <- c("a", "this will be truncated", "abc"); nc <- c(3, 10, 3); writeChar(x, zz, nc, eos = NULL); writeChar(x, zz, eos = "\r\n"); res <- rawConnectionValue(zz); close(zz); res } [1] 61 00 00 74 68 69 73 20 77 69 6c 6c 20 61 62 63 61 0d 0a 00 74 68 69 73 20 [26] 77 69 6c 6c 20 62 65 20 74 72 75 6e 63 61 74 65 64 0d 0a 00 61 62 63 0d 0a [51] 00 Warning message: In writeChar(x, zz, nc, eos = NULL) : writeChar: more characters requested than are in the string - will zero-pad ##com.oracle.truffle.r.test.library.base.TestConnections.testRawWriteText# #{ rc <- rawConnection(raw(0), "w"); writeChar("Hello", rc); writeChar(", World", rc); res <- rawConnectionValue(rc); close(rc); res } [1] 48 65 6c 6c 6f 00 2c 20 57 6f 72 6c 64 00 ##com.oracle.truffle.r.test.library.base.TestConnections.testRawWriteText# #{ s <- "äöüß"; rc <- rawConnection(raw(0), "w"); writeChar(s, rc); rawConnectionValue(rc) } [1] c3 a4 c3 b6 c3 bc c3 9f 00 ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo")) [1] "foo" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\n")) [1] "foo" "" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\n\n\r")) [1] "foo" "" "" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\n\n\rfoo")) [1] "foo" "" "" "foo" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\n\r")) [1] "foo" "" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\n\rfoo")) [1] "foo" "" "foo" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\nfoo")) [1] "foo" "foo" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\r")) [1] "foo" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\r\n")) [1] "foo" "" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\r\nfoo")) [1] "foo" "foo" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\r\r\n")) [1] "foo" "" "" "" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\r\r\nfoo")) [1] "foo" "" "" "foo" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foo\rfoo")) [1] "foo" "foo" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines# #readLines(textConnection("foofoo")) [1] "foofoo" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=F); close(zz); res } [1] "abcd" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=T); close(zz); res } [1] "abcde" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=F); close(zz); res } [1] "abcd" Warning messages: 1: In readLines(zz, 2, warn = T, skipNul = F) : line 1 appears to contain an embedded nul 2: In readLines(zz, 2, warn = T, skipNul = F) : incomplete final line found on '' ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=T); close(zz); res } [1] "abcde" Warning message: In readLines(zz, 2, warn = T, skipNul = T) : incomplete final line found on '' ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=F); close(zz); res } [1] "abcd" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=T); close(zz); res } [1] "abcde" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=F); close(zz); res } [1] "abcd" Warning message: In readLines(zz, 2, warn = T, skipNul = F) : line 1 appears to contain an embedded nul ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=T); close(zz); res } [1] "abcde" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=F); close(zz); res } [1] "abcd" "ABC" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=T); close(zz); res } [1] "abcde" "ABC" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=F); close(zz); res } [1] "abcd" "ABC" Warning messages: 1: In readLines(zz, 2, warn = T, skipNul = F) : line 1 appears to contain an embedded nul 2: In readLines(zz, 2, warn = T, skipNul = F) : incomplete final line found on '' ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=T); close(zz); res } [1] "abcde" "ABC" Warning message: In readLines(zz, 2, warn = T, skipNul = T) : incomplete final line found on '' ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=F); close(zz); res } [1] "abcd" "ABC" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=T); close(zz); res } [1] "abcde" "ABC" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=F); close(zz); res } [1] "abcd" "ABC" Warning message: In readLines(zz, 2, warn = T, skipNul = F) : line 1 appears to contain an embedded nul ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=F); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=T); close(zz); res } [1] "abcde" "ABC" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=F); close(zz); res } [1] "abcd" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=T); close(zz); res } [1] "abcde" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=F); close(zz); res } [1] "abcd" Warning messages: 1: In readLines(zz, 2, warn = T, skipNul = F) : line 1 appears to contain an embedded nul 2: In readLines(zz, 2, warn = T, skipNul = F) : incomplete final line found on '' ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=T); close(zz); res } [1] "abcde" Warning message: In readLines(zz, 2, warn = T, skipNul = T) : incomplete final line found on '' ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=F); close(zz); res } [1] "abcd" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=T); close(zz); res } [1] "abcde" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=F); close(zz); res } [1] "abcd" Warning message: In readLines(zz, 2, warn = T, skipNul = F) : line 1 appears to contain an embedded nul ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=T); close(zz); res } [1] "abcde" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=F); close(zz); res } [1] "abcd" "ABC" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=T); close(zz); res } [1] "abcde" "ABC" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=F); close(zz); res } [1] "abcd" "ABC" Warning messages: 1: In readLines(zz, 2, warn = T, skipNul = F) : line 1 appears to contain an embedded nul 2: In readLines(zz, 2, warn = T, skipNul = F) : incomplete final line found on '' ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=T); close(zz); res } [1] "abcde" "ABC" Warning message: In readLines(zz, 2, warn = T, skipNul = T) : incomplete final line found on '' ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=F); close(zz); res } [1] "abcd" "ABC" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=F, skipNul=T); close(zz); res } [1] "abcde" "ABC" ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=F); close(zz); res } [1] "abcd" "ABC" Warning message: In readLines(zz, 2, warn = T, skipNul = F) : line 1 appears to contain an embedded nul ##com.oracle.truffle.r.test.library.base.TestConnections.testReadLines#Output.MayIgnoreWarningContext# #{ zz <- file('',"w+b", blocking=T); writeBin(as.raw(c(97,98,99,100,0,101,10,65,66,67,10)), zz, useBytes=T); seek(zz, 0); res <- readLines(zz, 2, warn=T, skipNul=T); close(zz); res } [1] "abcde" "ABC" ##com.oracle.truffle.r.test.library.base.TestConnections.testReopen# #{ con <- rawConnection(charToRaw('hello\nworld\n')); readLines(con, 1); open(con, 'rb'); bin <- readBin(con, raw(), 999); close(con); rawToChar(bin) } [1] "world\n" Warning message: In open.connection(con, "rb") : connection is already open ##com.oracle.truffle.r.test.library.base.TestConnections.testSeek# #f1 <- file(open='w+b', encoding='UTF-8'); writeBin(charToRaw("abcd"), f1); seek(f1); seek(f1,0); seek(f1) [1] 4 [1] 4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestConnections.testSeekTextConnection# #{ zz <- textConnection("Hello, World!"); res <- isSeekable(zz); close(zz); res } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestConnections.testSeekTextConnection#Output.IgnoreErrorMessage# #{ zz <- textConnection("Hello, World!"); res <- seek(zz, 5); close(zz); res } Error in seek.connection(zz, 5) : seek is not relevant for text connection ##com.oracle.truffle.r.test.library.base.TestConnections.testTextReadConnection#Output.IgnoreErrorContext# #textConnection(NULL, 'r') Error in textConnection(NULL, "r") : invalid 'text' argument ##com.oracle.truffle.r.test.library.base.TestConnections.testTextReadConnection# #{ con <- textConnection(c("1", "2", "3","4")); readLines(con) } [1] "1" "2" "3" "4" ##com.oracle.truffle.r.test.library.base.TestConnections.testTextReadConnection# #{ con <- textConnection(c("1", "2", "3","4")); readLines(con, 2) } [1] "1" "2" ##com.oracle.truffle.r.test.library.base.TestConnections.testTextReadConnection# #{ con <- textConnection(c("1", "2", "3","4")); readLines(con, 2); readLines(con, 2) } [1] "3" "4" ##com.oracle.truffle.r.test.library.base.TestConnections.testTextReadConnection# #{ con <- textConnection(c("1", "2", "3","4")); readLines(con, 2); readLines(con, 2); readLines(con, 2) } character(0) ##com.oracle.truffle.r.test.library.base.TestConnections.testWriteTextConnection# #c <- textConnection('out', 'w'); cat('testtext', file=c); isIncomplete(c); cat('testtext2\n', file=c); isIncomplete(c); close(c); out [1] TRUE [1] FALSE [1] "testtexttesttext2" ##com.oracle.truffle.r.test.library.base.TestConnections.testWriteTextConnection# #{ c <- textConnection(NULL, 'w'); cat('testtext\n', file=c); textConnectionValue(c) } [1] "testtext" ##com.oracle.truffle.r.test.library.base.TestConnections.testWriteTextConnection# #{ con <- textConnection("tcval", open="w"); writeLines("a", con); tcval; close(con) } ##com.oracle.truffle.r.test.library.base.TestConnections.testWriteTextConnection# #{ con <- textConnection("tcval", open="w"); writeLines("a", con); writeLines(c("a", "b"), con, sep="."); tcval; close(con) } ##com.oracle.truffle.r.test.library.base.TestConnections.testWriteTextConnection# #{ con <- textConnection("tcval", open="w"); writeLines("a", con); writeLines(c("a", "b"), con, sep="."); writeLines("", con); tcval; close(con) } ##com.oracle.truffle.r.test.library.base.TestConnections.testWriteTextConnection# #{ con <- textConnection("tcval", open="w"); writeLines("a\nb", con); tcval; close(con) } ##com.oracle.truffle.r.test.library.base.TestConnections.testWriteTextConnection# #{ d<-data.frame(c(1,2), c(10, 20)); buf<-character(); c<-textConnection("buf", open="w", local=T); write.table(d, c); buf } [1] "\"c.1..2.\" \"c.10..20.\"" "\"1\" 1 10" [3] "\"2\" 2 20" ##com.oracle.truffle.r.test.library.base.TestConnections.testWriteTextReadConnection#Output.IgnoreErrorContext# #{ writeChar("x", textConnection("abc")) } Error in writeChar("x", textConnection("abc")) : cannot write to this connection ##com.oracle.truffle.r.test.library.base.TestEnvironments.testAttach# #{ attach(.Platform, 2); r <- file.sep; detach(2); r } [1] "/" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testAttach# #{ detach("missing"); x } Error in detach("missing") : invalid 'name' argument ##com.oracle.truffle.r.test.library.base.TestEnvironments.testAttach# #{ e <- new.env(); assign("x", "abc", e); attach(e, 2); r <- x; detach(2); r } [1] "abc" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testAttach# #{ e <- new.env(); assign("x", 1, e); attach(e, 2); r <- x; detach(2); r } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testAttach# #{ e <- new.env(); assign("x", 1, e); attach(e, 2); x; detach(2); x } Error: object 'x' not found ##com.oracle.truffle.r.test.library.base.TestEnvironments.testAttach# #{ e <- new.env(); assign("x", 1, e); attach(e, name = "mine"); r <- x; detach("mine"); r } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ as.environment(".GlobalEnv") } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ as.environment("package:base") } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ as.environment(-1) } Error in as.environment(-1) : no enclosing environment ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ as.environment(0) } Error in as.environment(0) : invalid 'pos' argument ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ as.environment(1) } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ as.environment(as.environment) } Error in as.environment(as.environment) : invalid object for 'as.environment' ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ as.environment(length(search()) + 1) } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ as.environment(length(search()) + 2) } Error in as.environment(length(search()) + 2) : invalid 'pos' argument ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ as.environment(length(search())) } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ baseenv() } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e <- new.env(); `parent.env<-`(e, emptyenv()); identical(parent.env(e), emptyenv()) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env() ; assign("x",1,e) ; get("x",e) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env() ; assign("x",1,e) ; ls(e) } [1] "x" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env() ; ls(e) } character(0) ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); assign("a", 1, e) ; lockBinding("a", e); rm("a",envir = e); ls() } [1] "e" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); assign("a", 1, e) ; lockEnvironment(e); assign("a", 2, e) } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); assign("a", 1, e) ; lockEnvironment(e); rm("a",envir = e); } Error in rm("a", envir = e) : cannot remove bindings from a locked environment ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment#Ignored.Unimplemented# #{ e<-new.env(); assign("a", 1, e) ; lockEnvironment(e, TRUE); assign("a", 2, e) } Error in assign("a", 2, e) : cannot change value of locked binding for 'a' ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); assign("a", 1, e) ; lockEnvironment(e, TRUE); unlockBinding("a", e); assign("a", 2, e) } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); assign("a", 1, e) ; rm("a",envir = e); ls() } [1] "e" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); assign("a", 1, e); bindingIsLocked("a", e) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment#Ignored.Unimplemented# #{ e<-new.env(); assign("a", 1, e); lockBinding("a", e); assign("a", 2, e) } Error in assign("a", 2, e) : cannot change value of locked binding for 'a' ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); assign("a", 1, e); lockBinding("a", e); bindingIsLocked("a", e) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); assign("x", 1, e); get("x", e) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); environmentIsLocked(e) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); get("x", e) } Error in get("x", e) : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment#Ignored.Unimplemented# #{ e<-new.env(); lockEnvironment(e); assign("a", 1, e) } Error in assign("a", 1, e) : cannot add bindings to a locked environment ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); lockEnvironment(e); environmentIsLocked(e) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); x<-1; get("x", e) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(); x<-1; get("x", e, inherits=FALSE) } Error in get("x", e, inherits = FALSE) : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ e<-new.env(parent=emptyenv()); x<-1; get("x", e) } Error in get("x", e) : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ emptyenv() } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ environment() } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ environment(environment) } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ environmentName(1) } [1] "" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ environmentName(baseenv()) } [1] "base" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ environmentName(emptyenv()) } [1] "R_EmptyEnv" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ environmentName(globalenv()) } [1] "R_GlobalEnv" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ f <- function() { as.environment(-1) } ; f() } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ f <- function(x, y) { ls() }; f(1, 2) } [1] "x" "y" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ globalenv() } ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env() ; assign("abc", "yes", h) ; exists(c("abc", "def"), h) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env() ; assign("abc", "yes", h) ; exists(c("def", "abc"), h) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env() ; assign("x", 1, h) ; assign("x", 1, h) ; get("x", h) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env() ; assign("x", 1, h) ; assign("x", 2, h) ; get("x", h) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env() ; assign(c("a"), 1, h) ; ls(h) } [1] "a" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env() ; assign(c("a"), 1L, h) ; ls(h) } [1] "a" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env() ; u <- 1 ; assign("x", u, h) ; assign("x", u, h) ; get("x", h) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env(parent=emptyenv()) ; assign("x", 1, h) ; assign("y", 2, h) ; ls(h) } [1] "x" "y" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env(parent=emptyenv()) ; assign("x", 1, h) ; exists("x", h) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env(parent=emptyenv()) ; assign("x", 1, h) ; exists("xx", h) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env(parent=emptyenv()) ; assign("y", 1, h) ; assign("x", 2, h) ; sort(ls(h)) } [1] "x" "y" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env(parent=emptyenv()) ; assign("y", 2, h) ; get("z", h) } Error in get("z", h) : object 'z' not found ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ h <- new.env(parent=globalenv()) ; assign("x", 10, h, inherits=TRUE) ; x } [1] 10 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ hh <- new.env() ; assign("z", 3, hh) ; h <- new.env(parent=hh) ; assign("y", 2, h) ; exists("z", h) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ hh <- new.env() ; assign("z", 3, hh) ; h <- new.env(parent=hh) ; assign("y", 2, h) ; get("z", h) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ identical(parent.env(baseenv()), emptyenv()) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ is.environment(1) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ is.environment(globalenv()) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ ls() } character(0) ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ ls(.GlobalEnv) } character(0) ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ ph <- new.env() ; h <- new.env(parent=ph) ; assign("x", 10, h, inherits=TRUE) ; x } [1] 10 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ ph <- new.env() ; h <- new.env(parent=ph) ; assign("x", 2, h) ; assign("x", 10, h, inherits=TRUE) ; get("x", ph)} Error in get("x", ph) : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ ph <- new.env() ; h <- new.env(parent=ph) ; assign("x", 2, ph) ; assign("x", 10, h, inherits=TRUE) ; get("x", ph)} [1] 10 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ ph <- new.env(parent=emptyenv()) ; h <- new.env(parent=ph) ; assign("x", 10, h, inherits=TRUE) ; get("x", ph)} Error in get("x", ph) : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ plus <- function(x) { function(y) x + y } ; plus_one <- plus(1) ; ls(environment(plus_one)) } [1] "x" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ rm("foo", envir = baseenv()) } Error in rm("foo", envir = baseenv()) : cannot remove variables from the base environment ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ x <- 1 ; ls(.GlobalEnv) } [1] "x" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ x <- 1; .y <- 2; ls(globalenv()) } [1] "x" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironment# #{ x <- 1; ls(globalenv()) } [1] "x" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testEnvironmentAssignLocked#Ignored.Unimplemented#Output.IgnoreErrorContext# #{ x <- 1; lockBinding("x", globalenv()); x <- 1 } Error: cannot change value of locked binding for 'x' ##com.oracle.truffle.r.test.library.base.TestEnvironments.testFrameToEnv# #{ makefun <- function(f) function(a) f(a); .Internal(islistfactor(environment(makefun(function(b) 2*b))$f, F)); } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testFrameToEnv# #{ makefun <- function(f,s) function(a) f(a); s <- function() cat('side effect'); .Internal(islistfactor(environment(makefun(function(b) 2*b, s()))$f, F)); } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testFrames# #{ t1 <- function() { aa <- 1; t2 <- function() { cat("current frame is", sys.nframe(), "; "); cat("parents are frame numbers", sys.parents(), "; "); print(ls(envir = sys.frame(-1))) }; t2() }; t1() } current frame is 2 ; parents are frame numbers 0 1 ; [1] "aa" "t2" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ assign("z", 10, inherits=TRUE) ; z } [1] 10 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ exists("sum") } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ exists("sum", inherits = FALSE) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { g <- function() { assign("x", 1, inherits=TRUE) } ; g() } ; f() ; x } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { 4 } ; h <- function() { assign("f", 5) ; f() } ; h() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { 4 } ; h <- function() { assign("z", 5) ; f() } ; h() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("x", 1) ; g <- function() { assign("z", 2) ; x } ; g() } ; f() } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("x", 1) ; x } ; f() } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("x", 1) ; y <- 2 ; if (FALSE) { z <- 3 } ; ls() } ; sort(f()) } [1] "x" "y" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("x", 1) ; y <- 2 ; ls() } ; sort(f()) } [1] "x" "y" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("x", 2) ; exists("x", inherits=FALSE) } ; f() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("x", 2, inherits=TRUE) ; assign("x", 1) ; h <- function() { x } ; h() } ; f() } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("x", 3) ; g <- function() { x } ; g() } ; x <- 10 ; f() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("x", 3) ; h <- function() { assign("z", 4) ; g <- function() { x } ; g() } ; h() } ; x <- 10 ; f() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("x", 3) ; h <- function() { g <- function() { x } ; g() } ; h() } ; x <- 10 ; f() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("x", function(){2}, inherits=TRUE) ; assign("x", function(){1}) ; h <- function() { x() } ; h() } ; f() } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { assign("z", 2) ; g <- function() { get("x", inherits=TRUE) } ; g() } ; x <- 3 ; f() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { for (i in rev(1:10)) { assign(as.character(i), i) } ; ls() } ; length(f()) } [1] 11 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { g <- function() { get("x", inherits=TRUE) } ; g() } ; x <- 3 ; f() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { if (FALSE) { x <- 1 } ; y <- 2 ; ls() } ; f() } [1] "y" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { if (FALSE) { x <- 3 } ; exists("x", inherits=FALSE) } ; f() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { x <- 1 ; g <- function() { h <- function() { x <<- 2 } ; h() } ; g() ; x } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { x <- 1 ; y <- 2 ; ls() } ; sort(f()) } [1] "x" "y" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { x <- 2 ; g <- function() { assign("x", 1, inherits=FALSE) } ; g() ; x } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { x <- 2 ; g <- function() { assign("x", 1, inherits=TRUE) } ; g() ; x } ; f() } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { x <- 2 ; g <- function() { if (FALSE) { x <- 2 } ; assign("x", 1, inherits=TRUE) } ; g() ; x } ; f() } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { x <- 2 ; g <- function() { x <- 3 ; assign("x", 1, inherits=FALSE) ; x } ; g() } ; f() } [1] 1 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { x <- 2 ; get("x") } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { x <- 22 ; get("x", inherits=FALSE) } ; f() } [1] 22 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { x <- 3 ; exists("x", inherits=FALSE) } ; f() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function() { z <- 3 ; exists("x", inherits=FALSE) } ; f() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function(x) { assign(x, 23) ; exists(x) } ; c(f("a"),f("b")) } [1] TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function(z) { exists("z") } ; f() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ f <- function(z) { exists("z") } ; f(a) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ fu <- function() { uu <<- 23 } ; fu() ; sort(ls(globalenv())) } [1] "fu" "uu" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { assign("myfunc", function(i) { sum(i) }); f <- function() { lapply(2, "myfunc") } ; f() } ; g() } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { f <- function() { assign("myfunc", function(i) { sum(i) }); lapply(2, "myfunc") } ; f() } ; g() } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { f <- function() { assign("x", 3) ; if (FALSE) { x } ; exists("x") } ; f() } ; g() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { f <- function() { assign("z", 3) ; if (FALSE) { x } ; exists("x") } ; f() } ; g() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { f <- function() { if (FALSE) { x } ; assign("x", 1) ; exists("x") } ; f() } ; g() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { f <- function() { if (FALSE) { x } ; exists("x") } ; f() } ; g() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) { x <- 2 ; y <- 3} ; f <- function() { if (FALSE) { x } ; assign("y", 2) ; exists("x") } ; f() } ; g() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) { x <- 2 ; z <- 3 } ; h <- function() { assign("z", 10) ; f <- function() { x <<- 3 } ; f() } ; h() } ; g() ; x } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) { x <- 2 ; z <- 3 } ; h <- function() { if (FALSE) { x <- 1 } ; assign("z", 10) ; f <- function() { assign("x", 4) ; x <<- 3 } ; f() } ; h() } ; g() ; x } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) { x <- 2 } ; f <- function() { assign("x", 4) ; x <<- 3 } ; f() } ; g() ; x } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) { x <- 2 } ; f <- function() { if (FALSE) { x } ; assign("x", 2) ; exists("x") } ; f() } ; g() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) { x <- 2 } ; f <- function() { if (FALSE) { x } ; exists("x") } ; f() } ; g() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) {y <- 3; x <- 2} ; f <- function() { assign("x", 2) ; exists("x") } ; f() } ; g() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) {y <- 3; x <- 2} ; f <- function() { assign("x", 2) ; gg <- function() { h <- function() { exists("x") } ; h() } ; gg() } ; f() } ; g() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) {y <- 3; x <- 2} ; f <- function() { assign("x", 2) ; gg <- function() { h <- function() { get("x") } ; h() } ; gg() } ; f() } ; g() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) {y <- 3; x <- 2} ; f <- function() { assign("x", 2) ; h <- function() { exists("x") } ; h() } ; f() } ; g() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { if (FALSE) {y <- 3; x <- 2} ; f <- function() { assign("y", 2) ; h <- function() { exists("x") } ; h() } ; f() } ; g() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup#Ignored.Unstable# #{ g <- function() { myfunc <- function(i) { i+i } ; f <- function() { lapply(2, "myfunc") } ; f() } ; g() } [[1]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { x <- 2 ; f <- function() { if (FALSE) { x <- 3 } ; exists("x") } ; f() } ; g() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { x <- 2 ; f <- function() { x ; exists("x") } ; f() } ; g() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { x <- 2 ; f <- function() { x <- 5 ; exists("x") } ; f() } ; g() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { x <- 2 ; z <- 3 ; hh <- function() { assign("z", 2) ; h <- function() { assign("x", 1); f <- function() { x <<- 3 } ; f() } ; h() } ; hh() ; x } ; x <- 10 ; g() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ g <- function() { x <- 2 ; z <- 3 ; hh <- function() { assign("z", 2) ; h <- function() { f <- function() { x <<- 3 } ; f() } ; h() } ; hh() } ; x <- 10 ; g() ; x } [1] 10 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ get("x") } Error in get("x") : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ gg <- function() { assign("x", function(){11}) ; g <- function() { if (FALSE) { x <- 2 } ; f <- function() { h <- function() { x() } ; h() } ; f() } ; g() } ; gg() } [1] 11 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ gg <- function() { assign("x", 100) ; g <- function() { if (FALSE) { x <- 2 ; z <- 3 } ; h <- function() { if (FALSE) { x <- 1 } ; assign("z", 10) ; f <- function() { assign("x", 4) ; x <<- 3 } ; f() } ; h() } ; g() } ; x <- 10 ; gg() ; x } [1] 10 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ gg <- function() { if (FALSE) { x <- 100 } ; g <- function() { if (FALSE) { x <- 100 } ; h <- function() { f <- function() { x <<- 3 } ; f() } ; h() } ; g() } ; x <- 10 ; gg() ; x } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { assign("f", function() {4}) ; f() } ; h() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { assign("x", 1) ; g <- function() { if (FALSE) { x <- 2 } ; f <- function() { if (FALSE) { x } ; exists("x") } ; f() } ; g() } ; h() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { assign("z", 1) ; g <- function() { if (FALSE) { x <- 2 } ; f <- function() { if (FALSE) { x } ; exists("x") } ; f() } ; g() } ; h() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { g <- function() { if (FALSE) { x <- 2 } ; f <- function() { if (FALSE) { x } ; exists("x") } ; f() } ; g() } ; h() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { g <- function() {4} ; f <- function() { if (FALSE) { g <- 4 } ; g() } ; f() } ; h() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { if (FALSE) { x <- 2 ; z <- 3 } ; g <- function() { assign("z", 3) ; if (FALSE) { x <- 4 } ; f <- function() { exists("x") } ; f() } ; g() } ; h() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { myfunc <- function(i) { sum(i) } ; g <- function() { myfunc <- 2 ; f <- function() { myfunc(2) } ; f() } ; g() } ; h() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- 2 ; f <- function() { if (FALSE) { x <- 1 } ; g <- function() { x } ; g() } ; f() } ; h() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- 3 ; f <- function() { assign("x", 2) ; g <- function() { x } ; g() } ; f() } ; h() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- 3 ; g <- function() { assign("x", 5) ; x } ; f <- function() { assign("x", 2) ; g() } ; f() } ; h() } [1] 5 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- 3 ; g <- function() { assign("z", 2) ; x } ; f <- function() { assign("x", 2) ; g() } ; f() } ; h() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- 3 ; g <- function() { f <- function() { if (FALSE) { x } ; exists("x") } ; f() } ; g() } ; h() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- 3 ; g <- function() { if (FALSE) { x <- 2 } ; f <- function() { if (FALSE) { x } ; exists("x") } ; f() } ; g() } ; h() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- 3 ; g <- function() { x } ; f <- function() { assign("x", 2) ; g() } ; f() } ; h() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- function() {3} ; g <- function() { assign("x", function() {4}) ; x() } ; g() } ; h() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- function() {3} ; g <- function() { assign("x", function() {5} ) ; x() } ; g() } ; h() } [1] 5 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- function() {3} ; g <- function() { assign("z", 2) ; x } ; f <- function() { assign("x", 2) ; g() } ; f() } ; z <- h() ; z() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- function() {3} ; gg <- function() { assign("x", 5) ; g <- function() { x() } ; g() } ; gg() } ; h() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { x <- function(){2} ; f <- function() { if (FALSE) { x <- 1 } ; g <- function() { x } ; g() } ; f() } ; z <- h() ; z() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { z <- 2 ; x <- function() {3} ; g <- function() { assign("z", 1) ; x() } ; g() } ; h() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { z <- 2 ; x <- function() {3} ; gg <- function() { assign("z", 5) ; g <- function() { x() } ; g() } ; gg() } ; h() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ h <- function() { z <- 3 ; x <- function() {3} ; g <- function() { x <- 1 ; assign("z", 5) ; x() } ; g() } ; h() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ myfunc <- function(i) { sum(i) } ; g <- function() { assign("z", 1); f <- function() { lapply(2, "myfunc") } ; f() } ; g() } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 10 ; g <- function() { x <- 100 ; z <- 2 ; f <- function() { assign("z", 1); x <- x ; x } ; f() } ; g() } [1] 100 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 1; exists("x", inherits = FALSE) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 2 ; rm("x") ; get("x") } Error in get("x") : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 2 ; y <- 3 ; rm("y") ; ls() } [1] "x" ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function() { assign("x", 2) ; g <- function() { x } ; g() } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function() { assign("x", 4) ; g <- function() { assign("y", 3) ; h <- function(s=1) { if (s==2) { x <- 5 } ; x } ; h() } ; g() } ; f() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function() { assign("x", 4) ; h <- function(s=1) { if (s==2) { x <- 5 } ; x <<- 6 } ; h() ; get("x") } ; f() } [1] 6 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function() { assign("x", 4) ; h <- function(s=1) { if (s==2) { x <- 5 } ; x } ; h() } ; f() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function() { assign("x", 4) ; hh <- function() { if (FALSE) { x <- 100 } ; h <- function() { x <<- 6 } ; h() } ; hh() ; get("x") } ; f() } [1] 6 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function() { exists("x") } ; f() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function() { exists("x", inherits=FALSE) } ; f() } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function() { get("x") } ; f() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function() { x <- 2 ; get("x") } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function() { x <- 2; h <- function() { get("x") } ; h() } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function(i) { if (i == 1) { assign("x", 4) } ; function() { x } } ; f1 <- f(1) ; f2 <- f(2) ; f1() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function(i) { if (i == 1) { assign("x", 4) } ; function() { x } } ; f1 <- f(1) ; f2 <- f(2) ; f2() ; f1() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function(i) { if (i == 1) { assign("x", 4) } ; function(v) { x <<- v} } ; f1 <- f(1) ; f2 <- f(2) ; f1(10) ; f2(11) ; x } [1] 11 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; f <- function(i) { if (i == 1) { assign("x", 4) } ; function(v) { x <<- v} } ; f1 <- f(1) ; f2 <- f(2) ; f2(10) ; f1(11) ; x } [1] 10 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; g <- function() { if (FALSE) { x <- 2 } ; f <- function() { h <- function() { x ; hh <- function() { x <<- 4 } ; hh() } ; h() } ; f() } ; g() ; x } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; g <- function() { if (FALSE) { x <- 2 } ; f <- function() { h <- function() { x } ; h() } ; f() } ; g() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; g <- function() { x } ; f <- function() { assign("x", 2) ; g() } ; f() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; gg <- function() { g <- function() { if (FALSE) { x <- 2 } ; f <- function() { h <- function() { x } ; h() } ; f() } ; g() } ; gg() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; h <- function() { g <- function() { x } ; f <- function() { assign("x", 2, inherits=TRUE) } ; f() ; g() } ; h() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; h <- function(s) { if (s == 2) { assign("x", 2) } ; x } ; h(1) ; h(2) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 3 ; h <- function(s) { y <- x ; if (s == 2) { assign("x", 2) } ; c(y,x) } ; c(h(1),h(2)) } [1] 3 3 3 2 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- 33 ; f <- function() { assign("x", 44) ; get("x", inherits=FALSE) } ; f() } [1] 44 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- function() { 3 } ; h <- function() { g <- function() { f <- function() { x <- 1 ; x() } ; f() } ; g() } ; h() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- function() { 3 } ; h <- function() { if (FALSE) { x <- 2 } ; z <- 2 ; g <- function() { assign("z", 1) ; x() } ; g() } ; h() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- function() {11} ; g <- function() { f <- function() { assign("x", 2) ; x() } ; f() } ; g() } [1] 11 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- function() {3} ; f <- function(i) { if (i == 1) { assign("x", function() {4}) } ; function() { x() } } ; f1 <- f(1) ; f2 <- f(2) ; f1() ; f2() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- function() {3} ; f <- function(i) { if (i == 1) { assign("x", function() {4}) } ; function() { x() } } ; f1 <- f(1) ; f2 <- f(2) ; f1() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- function() {3} ; f <- function(i) { if (i == 1) { assign("x", function() {4}) } ; function() { x() } } ; f1 <- f(1) ; f2 <- f(2) ; f2() ; f1() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- function(){3} ; f <- function() { assign("x", function(){4}) ; h <- function(s=1) { if (s==2) { x <- 5 } ; x() } ; h() } ; f() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- function(){3} ; g <- function() { if (FALSE) { x <- 2 } ; f <- function() { h <- function() { x() } ; h() } ; f() } ; g() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- function(){3} ; gg <- function() { g <- function() { if (FALSE) { x <- 2 } ; f <- function() { h <- function() { x() } ; h() } ; f() } ; g() } ; gg() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testLookup# #{ x <- function(){3} ; gg <- function() { assign("x", 4) ; g <- function() { if (FALSE) { x <- 2 } ; f <- function() { h <- function() { x() } ; h() } ; f() } ; g() } ; gg() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testSharing# #{ e <- new.env(); e$vec <- c(1,2,3); vv <- e$vec; vv[[1]] <- 42; e$vec; } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestEnvironments.testSharing# #{ e <- new.env(); f <- new.env(); e$vec <- c(1,2,3); f$vec <- e$vec; e$vec[[1]] <- 42; list(f = f$vec, e = e$vec); } $f [1] 1 2 3 $e [1] 42 2 3 ##com.oracle.truffle.r.test.library.base.TestIsElement.testIsElement# #{ is.element('b', c('a', 'b', 'b')) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestIsElement.testIsElement# #{ is.element(c('a', 'b', 'b'), 'b') } [1] FALSE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestIsElement.testIsElement# #{ is.element(c(1:10,rep(11,10)), 1) } [1] TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE [13] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestIsElement.testIsElement# #{ is.element(c(1:10,rep(11,10)), 11) } [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE [13] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestIsElement.testIsElement# #{ is.element(c(1:10,rep(11,10)), c(1:10,rep(11,10))) } [1] TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE [16] TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestIsElement.testIsElement# #{ is.element(paste0('a', 1:10), 'a0') } [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestIsElement.testIsElement# #{ is.element(paste0('a', 1:10), 'a1') } [1] TRUE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestIsElement.testIsElement# #{ is.element(paste0('a', c(1:10, rep(11,2))), 'a11') } [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ delayedAssign('x', c(1,2,3)); x/180; x } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ f <- function(x) { assign('e', function() {x}, parent.frame()) } ; a <- 1 ; f( a ) ; a <- 10 ; e() } [1] 10 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ f <- function(x) { assign('e', sys.frame(sys.nframe()), parent.frame()) } ; a <- 1 ; f( a ) ; a <- 10 ; e$x } [1] 10 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ f <- function(x) { b <<- function() {x} } ; a <- 1 ; f( a ) ; a <- 10 ; b() } [1] 10 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ f <- function(x) { delayedAssign('b', function() {x}, sys.frame(sys.nframe()), parent.frame()); } ; a <- 1 ; f( a ) ; a <- 10 ; b() } [1] 10 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ f <- function(x) { delayedAssign('v', x, sys.frame(sys.nframe()), parent.frame()) } ; a <- 1 ; v <- 0; f( a ) ; a <- 10 ; v } [1] 10 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ f <- function(x) { delayedAssign('v', x, sys.frame(sys.nframe()), parent.frame()); } ; a <- 1 ; v <- 0; f( a ) ; a <- 10 ; v } [1] 10 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ f <- function(x) { e <<- sys.frame(sys.nframe()) } ; a <- 1 ; f( a ) ; a <- 10 ; e$x } [1] 10 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ f <- function(x) { function() {x} } ; a <- 1 ; b <- f( a ) ; a <- 10 ; b() } [1] 10 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ f <- function(x) { le <- sys.frame(sys.nframe()); delayedAssign('e', le, le, parent.frame()) } ; a <- 1 ; f( a ) ; a <- 10 ; e$x } [1] 10 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ f <- function(x) { sys.frame(sys.nframe()) } ; a <- 1 ; e <- f( a ) ; a <- 10 ; e$x } [1] 10 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testDeoptimization# #{ pi/180; pi } [1] 3.141593 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testInterferingPromises# #{ a <- 3; bar <- function(x) { assign('a', 4, env=.GlobalEnv); x }; bar(a) } [1] 4 ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testInterferingPromises# #{ foo <- function(a,b) a == b ; bar <- function(x,y) foo(x,y); a <- 3; bar(assign('a', 4, env=.GlobalEnv), a) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testInterferingPromises# #{ foo <- function(a,b) a == b; bar <- function(x,y) foo(x,y); a <- 3; bar(a, a <<- 4) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testInterferingPromises# #{ foo <- function(a,b) b < a; bar <- function(x,y) foo(x,y); a <- 3; bar(a <<- 4, a) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestPromiseOptimizations.testInterferingPromises# #{ foo <- function(a,b,c) if (c) b < a else a > b; bar <- function(x,y,c) foo(x,y,c); a <- 3; bar(a <<- 4, a, TRUE) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSharedCluster.testSharedCluster#Ignored.Unstable# #library(parallel); fun <- function(data) { cl <- makeCluster(1, ifelse(exists('engine', where=R.version),'SHARED','PSOCK')); parLapply(cl, data, function(x) x+1); stopCluster(cl) }; fun(1:100) ##com.oracle.truffle.r.test.library.base.TestSharedCluster.testSharedCluster#Ignored.Unstable# #library(parallel); fun <- function(data) { cl <- makeCluster(2, ifelse(exists('engine', where=R.version),'SHARED','PSOCK')); parLapply(cl, data, function(x) x+1); stopCluster(cl) }; fun(1:100) ##com.oracle.truffle.r.test.library.base.TestSharedCluster.testSharedCluster#Ignored.Unstable# #library(parallel); fun <- function(data) { cl <- makeCluster(3, ifelse(exists('engine', where=R.version),'SHARED','PSOCK')); parLapply(cl, data, function(x) x+1); stopCluster(cl) }; fun(1:100) ##com.oracle.truffle.r.test.library.base.TestSharedCluster.testSharedCluster#Ignored.Unstable# #library(parallel); fun <- function(data) { cl <- makeCluster(4, ifelse(exists('engine', where=R.version),'SHARED','PSOCK')); parLapply(cl, data, function(x) x+1); stopCluster(cl) }; fun(1:100) ##com.oracle.truffle.r.test.library.base.TestSharedCluster.testSharedCluster#Ignored.Unstable# #library(parallel); fun <- function(data) { cl <- makeCluster(5, ifelse(exists('engine', where=R.version),'SHARED','PSOCK')); parLapply(cl, data, function(x) x+1); stopCluster(cl) }; fun(1:100) ##com.oracle.truffle.r.test.library.base.TestSharedCluster.testSharedCluster#Ignored.Unstable# #library(parallel); fun <- function(data) { cl <- makeCluster(6, ifelse(exists('engine', where=R.version),'SHARED','PSOCK')); parLapply(cl, data, function(x) x+1); stopCluster(cl) }; fun(1:100) ##com.oracle.truffle.r.test.library.base.TestSharedCluster.testSharedCluster#Ignored.Unstable# #library(parallel); fun <- function(data) { cl <- makeCluster(7, ifelse(exists('engine', where=R.version),'SHARED','PSOCK')); parLapply(cl, data, function(x) x+1); stopCluster(cl) }; fun(1:100) ##com.oracle.truffle.r.test.library.base.TestSharedCluster.testSharedCluster#Ignored.Unstable# #library(parallel); fun <- function(data) { cl <- makeCluster(8, ifelse(exists('engine', where=R.version),'SHARED','PSOCK')); parLapply(cl, data, function(x) x+1); stopCluster(cl) }; fun(1:100) ##com.oracle.truffle.r.test.library.base.TestSharedCluster.testSharedCluster#Ignored.Unstable# #library(parallel); fun <- function(data) { cl <- makeCluster(9, ifelse(exists('engine', where=R.version),'SHARED','PSOCK')); parLapply(cl, data, function(x) x+1); stopCluster(cl) }; fun(1:100) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testArgSideEffect# #{ a <- c(1, 2, 4); foo <- function() { a[[1]] <<- 42; 33; }; a + foo() } [1] 34 35 37 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testArithmeticUpdate# #{ x <- 3 ; f <- function(z) { if (z) { x <- 1 } ; x <- 1L + x ; x } ; f(FALSE) } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testArithmeticUpdate# #{ x <- 3 ; f <- function(z) { if (z) { x <- 1 } ; x <- x + 1L ; x } ; f(FALSE) } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testArithmeticUpdate# #{ x <- 3 ; f <- function(z) { if (z) { x <- 1 } ; x <- x - 1L ; x } ; f(FALSE) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity#IncludeList.arithmetic# #{ ((0+1i)/0) * ((0+1i)/0) } [1] -Inf+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity#IncludeList.arithmetic# #{ ((0-1i)/0) * ((-1-1i)/0) } [1] -Inf+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity#IncludeList.arithmetic# #{ ((0-1i)/0) * ((0+1i)/0) } [1] Inf+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity#IncludeList.arithmetic# #{ ((0-1i)/0) * ((0-1i)/0) } [1] -Inf+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity#IncludeList.arithmetic# #{ ((0-1i)/0) * ((1-1i)/0) } [1] -Inf-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity#IncludeList.arithmetic# #{ (-1+0i)/(0+0i) } [1] -Inf+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity#IncludeList.arithmetic# #{ (-1-1i)/(0+0i) } [1] -Inf-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity# #{ (0+0i)/(0+0i) } [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity#IncludeList.arithmetic# #{ (0+1i)/(0+0i) } [1] NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity#IncludeList.arithmetic# #{ (1+0i)/(0+0i) } [1] Inf+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity#IncludeList.arithmetic# #{ (1+1i)/(0+0i) } [1] Inf+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity# #{ (1+2i) / ((0-0i)/(0+0i)) } [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity# #{ 0/0 - 4i } [1] NaN-4i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity# #{ 0^(-1+1i) } [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity# #{ 4i + 0/0 } [1] NaN+4i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testComplexNaNInfinity# #{ a <- 1 + 2i; b <- 0/0 - 4i; a + b } [1] NaN-2i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ (-1)^(0/0) } [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ (-1/0)^(0/0) } [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ (-1/0)^3 } [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ (-2)^(-1/0) } [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ (-2)^(1/0) } [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ (0/0)^(1/0) } [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ (1)^(-1/0) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ (1/0)^(-4) } [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ (1/0)^(0/0) } [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ 0^(-1/0) } [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ 0^(0/0) } [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ 0^(1/0) } [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ 1^(0/0) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{ 1^(1/0) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testExponentiation# #{(-1/0)^(-4) } [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerDivision# #{ 3 %/% -2 } [1] -2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerDivision# #{ 3 %/% 0 } [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerDivision# #{ 3 %/% 2 } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerDivision# #{ 3L %/% -2L } [1] -2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerDivision# #{ 3L %/% 2L } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) 1:3 + 2147483647L } Warning messages: 1: In 1:3 + 2147483647L : NAs produced by integer overflow 2: In 1:3 + 2147483647L : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) 1:3 + c(2147483647L,2147483647L,2147483647L) } Warning messages: 1: In 1:3 + c(2147483647L, 2147483647L, 2147483647L) : NAs produced by integer overflow 2: In 1:3 + c(2147483647L, 2147483647L, 2147483647L) : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) 1:4 + c(2147483647L,2147483647L) } Warning messages: 1: In 1:4 + c(2147483647L, 2147483647L) : NAs produced by integer overflow 2: In 1:4 + c(2147483647L, 2147483647L) : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) 2147483647L + 1:3 } Warning messages: 1: In 2147483647L + 1:3 : NAs produced by integer overflow 2: In 2147483647L + 1:3 : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) 2147483647L + c(1L,2L,3L) } Warning messages: 1: In 2147483647L + c(1L, 2L, 3L) : NAs produced by integer overflow 2: In 2147483647L + c(1L, 2L, 3L) : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) c(1L,2L,3L) + 2147483647L } Warning messages: 1: In c(1L, 2L, 3L) + 2147483647L : NAs produced by integer overflow 2: In c(1L, 2L, 3L) + 2147483647L : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) c(1L,2L,3L) + c(2147483647L,2147483647L,2147483647L) } Warning messages: 1: In c(1L, 2L, 3L) + c(2147483647L, 2147483647L, 2147483647L) : NAs produced by integer overflow 2: In c(1L, 2L, 3L) + c(2147483647L, 2147483647L, 2147483647L) : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) c(1L,2L,3L,4L) + c(2147483647L,2147483647L) } Warning messages: 1: In c(1L, 2L, 3L, 4L) + c(2147483647L, 2147483647L) : NAs produced by integer overflow 2: In c(1L, 2L, 3L, 4L) + c(2147483647L, 2147483647L) : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) c(2147483647L,2147483647L) + 1:4 } Warning messages: 1: In c(2147483647L, 2147483647L) + 1:4 : NAs produced by integer overflow 2: In c(2147483647L, 2147483647L) + 1:4 : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) c(2147483647L,2147483647L) + c(1L,2L,3L,4L) } Warning messages: 1: In c(2147483647L, 2147483647L) + c(1L, 2L, 3L, 4L) : NAs produced by integer overflow 2: In c(2147483647L, 2147483647L) + c(1L, 2L, 3L, 4L) : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) c(2147483647L,2147483647L,2147483647L) + 1:3 } Warning messages: 1: In c(2147483647L, 2147483647L, 2147483647L) + 1:3 : NAs produced by integer overflow 2: In c(2147483647L, 2147483647L, 2147483647L) + 1:3 : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) c(2147483647L,2147483647L,2147483647L) + c(1L,2L,3L) } Warning messages: 1: In c(2147483647L, 2147483647L, 2147483647L) + c(1L, 2L, 3L) : NAs produced by integer overflow 2: In c(2147483647L, 2147483647L, 2147483647L) + c(1L, 2L, 3L) : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) {x <- -2147483647L ; x + -1L} } Warning messages: 1: In x + -1L : NAs produced by integer overflow 2: In x + -1L : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) {x <- -2147483647L ; x - 1L} } Warning messages: 1: In x - 1L : NAs produced by integer overflow 2: In x - 1L : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) {x <- -2147483647L ; x - 2L} } Warning messages: 1: In x - 2L : NAs produced by integer overflow 2: In x - 2L : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) {x <- 2147483647L ; x * x} } Warning messages: 1: In x * x : NAs produced by integer overflow 2: In x * x : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflow# #{ for(i in 1:2) {x <- 2147483647L ; x + 1L} } Warning messages: 1: In x + 1L : NAs produced by integer overflow 2: In x + 1L : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflowNoWarning# #{ 3L %% 0L } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflowNoWarning# #{ 3L %/% 0L } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflowNoWarning# #{ c(3L,3L) %% 0L } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testIntegerOverflowNoWarning# #{ c(3L,3L) %/% 0L } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatrices# #{ m <- matrix(1:6, nrow=2, ncol=3, byrow=TRUE) ; m+1L } [,1] [,2] [,3] [1,] 2 3 4 [2,] 5 6 7 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatrices# #{ m <- matrix(1:6, nrow=2, ncol=3, byrow=TRUE) ; m+m } [,1] [,2] [,3] [1,] 2 4 6 [2,] 8 10 12 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatrices# #{ m <- matrix(1:6, nrow=2, ncol=3, byrow=TRUE) ; m-1 } [,1] [,2] [,3] [1,] 0 1 2 [2,] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatrices# #{ z<-matrix(12)+1 ; z } [,1] [1,] 13 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesOuterProduct# #{ 1:3 %*% as.raw(c(1,2,3)) } Error in 1:3 %*% as.raw(c(1, 2, 3)) : requires numeric/complex matrix/vector arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesOuterProduct# #{ 1:3 %*% c(TRUE,FALSE,TRUE) } [,1] [1,] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesOuterProduct# #{ 1:3 %o% 1:2 } [,1] [,2] [1,] 1 2 [2,] 2 4 [3,] 3 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesOuterProduct# #{ 1:4 %*% 1:3 } Error in 1:4 %*% 1:3 : non-conformable arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesOuterProduct#Output.IgnoreErrorContext# #{ as.raw(1:3) %o% 1:3 } Error in tcrossprod(x, y) : requires numeric/complex matrix/vector arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesPrecedence# #{ 10 / 1:3 %*% 3:1 } [,1] [1,] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesPrecedence# #{ x <- 1:2 ; dim(x) <- c(1,1,2) ; y <- 2:3 ; dim(y) <- c(1,1,2) ; x + y } , , 1 [,1] [1,] 3 , , 2 [,1] [1,] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ 1:3 %*% matrix(4,nrow=2,ncol=5) } Error in 1:3 %*% matrix(4, nrow = 2, ncol = 5) : non-conformable arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ NA %*% NaN} [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ NaN %*% NA} [,1] [1,] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ a <- array(1:9, dim=c(3,1,3)) ; a %*% 1:9 } [,1] [1,] 285 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ a<-matrix(1:6, ncol=2) ; b<-matrix(11:16, nrow=2) ; a %*% b } [,1] [,2] [,3] [1,] 59 69 79 [2,] 82 96 110 [3,] 105 123 141 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ as.raw(1:3) %*% 1:3 } Error in as.raw(1:3) %*% 1:3 : requires numeric/complex matrix/vector arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ c(1,2,2,3) %*% c(1,3,NA,NaN) } [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ c(1,2,2,3) %*% c(1,3,NaN,NA) } [,1] [1,] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ c(1,2,NA,NaN) %*% c(1,3,3,4) } [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ c(1,2,NaN,NA) %*% c(1,3,3,4) } [,1] [1,] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ c(1.1,2.2) %*% c(NA,NaN) } [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ c(1.1,22.2) %*% c(NaN,NA) } [,1] [1,] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ c(NA) %*% c(NaN)} [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ c(NA,NaN) %*% c(1.6,3.6) } [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ c(NaN) %*% c(NA)} [,1] [1,] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ c(NaN,NA) %*% c(1.6,3.6) } [,1] [1,] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ double() %*% double() } [,1] [1,] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m <- double() ; dim(m) <- c(0,0) ; m %*% m } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m <- double() ; dim(m) <- c(0,4) ; m %*% t(m) } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m <- double() ; dim(m) <- c(0,4) ; n <- matrix(1:4,4) ; m %*% n } [,1] ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m <- double() ; dim(m) <- c(0,4) ; t(m) %*% m } [,1] [,2] [,3] [,4] [1,] 0 0 0 0 [2,] 0 0 0 0 [3,] 0 0 0 0 [4,] 0 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m <- double() ; dim(m) <- c(4,0) ; n <- matrix(1:4,ncol=4) ; n %*% m } [1,] ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m <- matrix(c(1,2,3,0/0), nrow=4) ; m %*% 1:4 } [,1] [,2] [,3] [,4] [1,] 1 2 3 4 [2,] 2 4 6 8 [3,] 3 6 9 12 [4,] NaN NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m <- matrix(c(NA,1,0/0,2), nrow=2) ; 1:2 %*% m } [,1] [,2] [1,] NA NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m <- matrix(c(NA,1,4,2), nrow=2) ; t(m) %*% m } [,1] [,2] [1,] NA NA [2,] NA 20 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m<-matrix(1:3, ncol=1) ; m %*% 1:2 } [,1] [,2] [1,] 1 2 [2,] 2 4 [3,] 3 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m<-matrix(1:3, nrow=1) ; 1:2 %*% m } [,1] [,2] [,3] [1,] 1 2 3 [2,] 2 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m<-matrix(1:6, nrow=2) ; 1:2 %*% m } [,1] [,2] [,3] [1,] 5 11 17 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ m<-matrix(1:6, nrow=2) ; m %*% 1:3 } [,1] [1,] 22 [2,] 28 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ matrix(2,nrow=2,ncol=3) %*% matrix(4,nrow=1,ncol=5) } Error in matrix(2, nrow = 2, ncol = 3) %*% matrix(4, nrow = 1, ncol = 5) : non-conformable arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ matrix(4,nrow=2,ncol=5) %*% 1:4 } Error in matrix(4, nrow = 2, ncol = 5) %*% 1:4 : non-conformable arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ matrix(c(3,1,0/0,2), nrow=2) %*% matrix(1:6,nrow=2) } [,1] [,2] [,3] [1,] NaN NaN NaN [2,] 5 11 17 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ options(matprod = 'blas'); matrix(c(NaN,1,7,2,4,NA), nrow=3) %*% matrix(c(3,1,NA,2,NaN,5,6,7), nrow=2) } [,1] [,2] [,3] [,4] [1,] NaN NaN NaN NaN [2,] 7 NA NaN 34 [3,] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{ x <- 1:3 %*% 9:11 ; x[1] } [1] 62 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(1.1, 2.2) %*% c(as.complex(NA), NaN)} [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(1.1, 2.2) %*% c(as.complex(NA), NaN, as.complex(NA))} Error in c(1.1, 2.2) %*% c(as.complex(NA), NaN, as.complex(NA)) : non-conformable arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(1.1, 2.2) %*% c(as.complex(NaN), NA)} [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(1.1, 2.2) %*% c(as.complex(NaN), NA, as.complex(NaN))} Error in c(1.1, 2.2) %*% c(as.complex(NaN), NA, as.complex(NaN)) : non-conformable arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(NA) %*% c(as.complex(NaN))} [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(NaN) %*% c(as.complex(NA))} [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(as.complex(NA)) %*% c(NaN)} [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(as.complex(NA), NaN) %*% c(1, 3.6)} [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(as.complex(NA), NaN, as.complex(NA)) %*% c(1, 3.6)} Error in c(as.complex(NA), NaN, as.complex(NA)) %*% c(1, 3.6) : non-conformable arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(as.complex(NaN)) %*% c(NA)} [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(as.complex(NaN), NA) %*% c(1, 3.6)} [,1] [1,] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testMatricesProduct# #{c(as.complex(NaN), NA, as.complex(NaN)) %*% c(1, 3.6)} Error in c(as.complex(NaN), NA, as.complex(NaN)) %*% c(1, 3.6) : non-conformable arguments ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testModulo# #{ 3 %% -2 } [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testModulo# #{ 3 %% 0 } [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testModulo# #{ 3 %% 2 } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testModulo# #{ 3L %% -2L } [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testModulo# #{ 3L %% 2L } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ "1" && c(1, 0) } Error in "1" && c(1, 0) : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ 1.0 && c(1+1i, 0+0i) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ FALSE && FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ FALSE && NA } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ FALSE && TRUE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ NA && FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ NA && NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ NA && TRUE } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ TRUE && FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ TRUE && NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ TRUE && TRUE } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ TRUE && c(TRUE, FALSE) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ as.raw(c(1, 0)) && TRUE } Error in as.raw(c(1, 0)) && TRUE : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ c("1", "0") && TRUE } Error in c("1", "0") && TRUE : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ c(1+1i, 0+0i) && 1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ c(1+1i, 0+0i) && c(1+1i, 0+0i) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ c(1, 0) && "1" } Error in c(1, 0) && "1" : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ c(1, 0) && 1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ c(1, 0) && 1+1i } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ c(1.0, 0.0) && 1.0 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ c(1.1, 0.0) && c(TRUE, FALSE) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ c(TRUE, FALSE) && c(TRUE, FALSE) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ c(TRUE, FALSE) && c(TRUE, FALSE, FALSE) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ x <- 1 ; f <- function(r) { x <<- 2; r } ; FALSE && f(FALSE) ; x } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ x <- 1 ; f <- function(r) { x <<- 2; r } ; NA && f(NA) ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAnd# #{ x <- 1 ; f <- function(r) { x <<- 2; r } ; c(FALSE, TRUE) && f(FALSE) ; x } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a && b } ; f(c(TRUE, FALSE), TRUE) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a && b } ; f(c(TRUE, FALSE), logical()) ; f(1:3,4:10) ; f(1,2) ; f(logical(),4) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a && b } ; f(c(TRUE, FALSE), logical()) ; f(1:3,4:10) ; f(1,2) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a && b } ; f(c(TRUE, FALSE), logical()) ; f(1:3,4:10) ; f(2+3i,1/0) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a && b } ; f(c(TRUE, FALSE), logical()) ; f(1:3,4:10) ; f(2+3i,logical()) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a && b } ; f(c(TRUE, FALSE), logical()) ; f(1:3,4:10) ; f(double(),2) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a && b } ; f(c(TRUE, FALSE), logical()) ; f(1:3,4:10) ; f(integer(),2) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a && b } ; f(c(TRUE, FALSE), logical()) ; f(TRUE, c(TRUE,TRUE,FALSE)) ; f(1,2) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a && b } ; f(c(TRUE, FALSE), logical()) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalLengthChecks# #{ as.raw(c(1,4)) | as.raw(c(1,5,4)) } [1] 01 05 05 Warning message: In as.raw(c(1, 4)) | as.raw(c(1, 5, 4)) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalLengthChecks# #{ as.raw(c(1,5,4)) | as.raw(c(1,4)) } [1] 01 05 05 Warning message: In as.raw(c(1, 5, 4)) | as.raw(c(1, 4)) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalLengthChecks# #{ c(TRUE, FALSE, FALSE) & c(TRUE,TRUE) } [1] TRUE FALSE FALSE Warning message: In c(TRUE, FALSE, FALSE) & c(TRUE, TRUE) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalLengthChecks# #{ c(TRUE, TRUE) & c(TRUE, FALSE, FALSE) } [1] TRUE FALSE FALSE Warning message: In c(TRUE, TRUE) & c(TRUE, FALSE, FALSE) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalLengthChecks# #{ c(a=TRUE, TRUE) | c(TRUE, b=FALSE, FALSE) } b TRUE TRUE TRUE Warning message: In c(a = TRUE, TRUE) | c(TRUE, b = FALSE, FALSE) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalOr# #{ 0 || 0 } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalOr# #{ 0 || NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalOr# #{ 1 || 0 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalOr# #{ 1.1 || 3.15 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalOr# #{ NA || 0 } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalOr# #{ NA || 1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalOr# #{ x <- 1 ; f <- function(r) { x <<- 2; r } ; NA || f(NA) ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalOr# #{ x <- 1 ; f <- function(r) { x <<- 2; r } ; TRUE || f(FALSE) ; x } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ "hello" && 1 } Error in "hello" && 1 : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ "hello" && 1L } Error in "hello" && 1L : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ "hello" && TRUE } Error in "hello" && TRUE : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ "hello" || 1 } Error in "hello" || 1 : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ "hello" || 1L } Error in "hello" || 1L : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ "hello" || FALSE } Error in "hello" || FALSE : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ "hello" || TRUE } Error in "hello" || TRUE : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 0 && "hello" } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 0 || "hello" } Error in 0 || "hello" : invalid 'y' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 0 || NULL } Error in 0 || NULL : invalid 'y' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 0 || as.raw(1) } Error in 0 || as.raw(1) : invalid 'y' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 0+0i || FALSE} [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 0.0 && "hello" } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 0.1 && "hello" } Error in 0.1 && "hello" : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 0.1 && NULL } Error in 0.1 && NULL : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 0.1 && as.raw(1) } Error in 0.1 && as.raw(1) : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 0L || "hello" } Error in 0L || "hello" : invalid 'y' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 1 && "hello" } Error in 1 && "hello" : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 1 || "hello" } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 1+2i && 0 } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 1+2i && TRUE } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 1+2i || 0 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 1+2i || 1.0 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 1.0 && 0+0i} [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ 1.1 || "hello" } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ FALSE && "hello" } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ FALSE || "hello" } Error in FALSE || "hello" : invalid 'y' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ FALSE || 1+2i } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ NULL && 1 } Error in NULL && 1 : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ NULL || 1 } Error in NULL || 1 : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ TRUE && "hello" } Error in TRUE && "hello" : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ TRUE && 0+0i} [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ TRUE || "hello" } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ as.raw(1) && 1 } Error in as.raw(1) && 1 : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ as.raw(1) || 1 } Error in as.raw(1) || 1 : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ as.raw(10) && "hi" } Error in as.raw(10) && "hi" : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks#IncludeList.arithmetic# #{ as.raw(c(1,4)) | raw() } raw(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ c(TRUE,FALSE) | logical() } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ character(0) && FALSE } Error in character(0) && FALSE : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ character(0) && TRUE } Error in character(0) && TRUE : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ character(0) || FALSE } Error in character(0) || FALSE : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ character(0) || TRUE } Error in character(0) || TRUE : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ logical() | c(TRUE,FALSE) } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ logical(0) && FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ logical(0) && TRUE } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ logical(0) && logical(0) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ logical(0) || FALSE } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ logical(0) || TRUE } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks# #{ logical(0) || logical(0) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testNonvectorizedLogicalSpecialChecks#IncludeList.arithmetic# #{ raw() | as.raw(c(1,4))} raw(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ (1:2)[3] + 2L } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ (1:2)[3] / 2L } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ 1L / 2L } [1] 0.5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ 2L + (1:2)[3] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ 2L / (1:2)[3] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ a <- (1:2)[3] ; b <- 2 ; a + b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ a <- (1:2)[3] ; b <- 2L ; a + b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ a <- (1:2)[3] ; b <- 2L ; a / b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ a <- 2 ; b <- (1:2)[3] ; a + b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ a <- 2L ; b <- (1:2)[3] ; a + b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ a <- 2L ; b <- (1:2)[3] ; a / b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a + b } ; f(1,1) ; f(1,1L) ; f((1:2)[3], 2L) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a + b } ; f(1,1) ; f(1,1L) ; f(2L,(1:2)[3]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a + b } ; f(1,1) ; f(1,1L) ; f(2L,4) } [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a + b } ; f(1,1) ; f(1,1L) ; f(2L,4L) } [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a / b } ; f(1,1) ; f(1,1L) ; f((1:2)[3], 2L) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a / b } ; f(1,1) ; f(1,1L) ; f((1:2)[3],2) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a / b } ; f(1,1) ; f(1,1L) ; f(2,(1:2)[3]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a / b } ; f(1,1) ; f(1,1L) ; f(2L,(1:2)[3]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a / b } ; f(1,1) ; f(1,1L) ; f(2L,4) } [1] 0.5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a / b } ; f(1,1) ; f(1,1L) ; f(2L,4L) } [1] 0.5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(a, b) { a / b } ; f(1L, 2L) ; f(1, 2) } [1] 0.5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { (1:2)[3] + b } ; f(1) ; f(2L) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { (1:2)[3] + b } ; f(1L) ; f(2) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 1 + b } ; f(1L) ; f(TRUE) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 1 / b } ; f(1) ; f(1L) ; f(4) } [1] 0.25 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 1 / b } ; f(1) ; f(1L) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 1 / b } ; f(1L) ; f(1) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 1 / b } ; f(TRUE) ; f(1L) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 4L + b } ; f(1L) ; f(2) ; f((1:2)[3]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 4L + b } ; f(1L) ; f(2) ; f(TRUE) } [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 4L + b } ; f(1L) ; f(2) } [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 4L / b } ; f(1L) ; f(2) ; f((1:2)[3]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 4L / b } ; f(1L) ; f(2) ; f(TRUE) } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { 4L / b } ; f(1L) ; f(2) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { FALSE + b } ; f(1L) ; f(2) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { b + 1 } ; f(1L) ; f(TRUE) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { b + 4L } ; f(1L) ; f(2) ; f((1:2)[3]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { b + 4L } ; f(1L) ; f(2) ; f(TRUE) } [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { b + FALSE } ; f(1L) ; f(2) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { b / 1 } ; f(1) ; f(1L) ; f(4) } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { b / 2 } ; f(1) ; f(1L) } [1] 0.5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { b / 2L } ; f(1L) ; f(2) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { b / 4 } ; f(1L) ; f(1) } [1] 0.25 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { b / 4L } ; f(1L) ; f(2) ; f((1:2)[3]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalars# #{ f <- function(b) { b / 4L } ; f(1L) ; f(2) ; f(TRUE) } [1] 0.25 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ (0+2i)^0 } [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex#IncludeList.arithmetic# #{ (1+2i) / ((0-1i)/(0+0i)) } [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ (1+2i)*(3+4i) } [1] -5+10i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ (1+2i)^0 } [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ (1+2i)^2 } [1] -3+4i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ (3+2i)^2 } [1] 5+12i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex#IncludeList.arithmetic# #{ 1/((1+0i)/(0+0i)) } [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ c(-1+2i,1.1+2.1i) } [1] -1.0+2.0i 1.1+2.1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ c(1+12i,1.1+2.1i) } [1] 1.0+12.0i 1.1+ 2.1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ c(1+2i,1.1+12.1i) } [1] 1.0+ 2.0i 1.1+12.1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ c(1+2i,1.1+2.1i) } [1] 1.0+2.0i 1.1+2.1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ c(1+2i,11.1+2.1i) } [1] 1.0+2.0i 11.1+2.1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ c(1-2i,1+22i) } [1] 1- 2i 1+22i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ c(11+2i,1.1+2.1i) } [1] 11.0+2.0i 1.1+2.1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(a, b) { a + b } ; f(1+2i, 3) ; f(1, 2) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(a, b) { a + b } ; f(1+2i, 3+4i) ; f(1, 2) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(a, b) { a + b } ; f(1,1) ; f(1,1+2i) ; f(TRUE, 2) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(a, b) { a + b } ; f(2, 3+4i) ; f(1, 2) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(a, b) { a / b } ; f(1,1) ; f(1,1L) ; f(2+1i,(1:2)[3]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(b) { 1 / b } ; f(1+1i) ; f(1L) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(b) { 1i / b } ; f(1) ; f(1L) ; f(4) } [1] 0+0.25i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(b) { 1i / b } ; f(1) ; f(1L) } [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(b) { 1i / b } ; f(1+1i) ; f(1L) } [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(b) { 1i / b } ; f(TRUE) ; f(1L) } [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(b) { b / 2 } ; f(1+1i) ; f(1L) } [1] 0.5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ f <- function(b) { b / 4i } ; f(1) ; f(1L) } [1] 0-0.25i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ round( ((1+1i)/(0+1i)) ^ (-3.54), digits=5) } [1] -0.27428+0.10364i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ round( (1+2i)^(3+4i), digits=5 ) } [1] 0.12901+0.03392i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ x <- 1+2i; y <- 3+4i; round(x*x*y/(x+y), digits=5) } [1] -1.92308+2.88462i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ x <- 1+2i; y <- 3+4i; x*y } [1] -5+10i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ x <- 1+2i; y <- 3+4i; x-y } [1] -2-2i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ x <- 1+2i; y <- 3+4i; x/y } [1] 0.44+0.08i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ x <- c(-1-2i,3+10i) ; y <- c(3+1i, -4+5i) ; round(y/x, digits=5) } [1] -1.00000+1.00000i 0.34862+0.50459i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ x <- c(-1-2i,3+10i) ; y <- c(3+1i, -4+5i) ; y*x } [1] -1- 7i -62-25i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ x <- c(-1-2i,3+10i) ; y <- c(3+1i, -4+5i) ; y+x } [1] 2- 1i -1+15i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ x <- c(-1-2i,3+10i) ; y <- c(3+1i, -4+5i) ; y-x } [1] 4+3i -7-5i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ x <- c(-1.5-1i,-1.3-1i) ; y <- c(0+0i, 0+0i) ; y*y+x } [1] -1.5-1i -1.3-1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplex# #{ x <- c(-1.5-1i,-1.3-1i) ; y <- c(0+0i, 0+0i) ; y-x } [1] 1.5+1i 1.3+1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplexIgnore#IncludeList.arithmetic# #{ ((1+0i)/(0+0i)) ^ (-3) } [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplexIgnore#IncludeList.arithmetic# #{ ((1+1i)/(0+0i)) ^ (-3) } [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsComplexIgnore# #{ (1+2i)^(-2) } [1] -0.12-0.16i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsRange# #{ f <- function(a, b) { a + b } ; f(1:2, 3:4) ; f(c(1,2), 3:4) } [1] 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsRange# #{ f <- function(a, b) { a + b } ; f(1:2, c(3,4)) ; f(c(1,2), 3:4) } [1] 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsRange# #{ f <- function(a, b) { a + b } ; f(c(1,2), c(3,4)) ; f(c(1,2), 3:4) } [1] 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ ( 1+1)*(3+2) } [1] 10 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 0x10 + 0x10L + 1.28 } [1] 33.28 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 1+FALSE<=0 } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 1+NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 1+TRUE } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 1000000000*100000000000 } [1] 1e+20 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 1000000000L*1000000000 } [1] 1e+18 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 1L*NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 1L+1 } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 1L+1L } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 1L+FALSE<=0 } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 1L+TRUE } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ 2L^10L } [1] 1024 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ TRUE+TRUE+TRUE*TRUE+FALSE+4 } [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testScalarsReal# #{ for(i in 1:2) 1000000000L*1000000000L } Warning messages: 1: In 1000000000L * 1000000000L : NAs produced by integer overflow 2: In 1000000000L * 1000000000L : NAs produced by integer overflow ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinus# #{ -(0/0) } [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinus# #{ -(1/0) } [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinus# #{ ----3 } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinus# #{ ---3 } [1] -3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinus# #{ --3 } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinus# #{ -3 } [1] -3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunction# #{ f <- function(z) { -z } ; f(1) ; f(1L) } [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunction# #{ f <- function(z) { -z } ; f(1:3) ; f(1L) } [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunction# #{ f <- function(z) { -z } ; f(1:3) ; f(TRUE) } [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunction# #{ f <- function(z) { -z } ; f(1L) ; f(1) } [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunction# #{ f <- function(z) { -z } ; f(1L) ; f(TRUE) } [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunction# #{ f <- function(z) { -z } ; f(TRUE) ; f(1L) } [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunction# #{ z <- double() ; -z } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunction# #{ z <- integer() ; -z } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunction# #{ z <- logical() ; -z } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunctionComplex# #{ f <- function(z) { -z } ; f(1+1i) ; f(1L) } [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunctionComplex# #{ f <- function(z) { -z } ; f(1:3) ; f(c((0+0i)/0,1+1i)) } [1] NaN+NaNi -1- 1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunctionComplex# #{ f <- function(z) { -z } ; f(1L) ; f(1+1i) } [1] -1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusAsFunctionComplex# #{ z <- (1+1i)[0] ; -z } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusComplex#IncludeList.arithmetic# #{ -((0+1i)/0) } [1] NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusComplex#IncludeList.arithmetic# #{ -((1+0i)/0) } [1] -Inf+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusComplex# #{ -(2+1i) } [1] -2-1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusComplex#IncludeList.arithmetic# #{ -c((1+0i)/0,2) } [1] -Inf+NaNi -2+ 0i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusDimensions# #{ xx <- double(0); dim(xx) <- c(0,0); dim(-xx) } [1] 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusDimensions# #{ xx <- double(1); dim(xx) <- c(1,1); dim(-xx) } [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusErrors# #{ f <- function(z) { -z } ; f(1:3) ; f("hello") } Error in -z : invalid argument to unary operator ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusErrors# #{ z <- "hello" ; -z } Error in -z : invalid argument to unary operator ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusErrors# #{ z <- c("hello","hi") ; -z } Error in -z : invalid argument to unary operator ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryMinusVector# #{ -(1[2]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNot# #{ !FALSE } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNot# #{ !NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNot# #{ !TRUE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotDimensions# #{ xx <- double(0); dim(xx) <- c(0,0); dim(!xx) } [1] 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotDimensions# #{ xx <- double(1); dim(xx) <- c(1,1); dim(!xx) } [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotError# #{ l <- c("hello", "hi") ; !l } Error in !l : invalid argument type ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotError# #{ l <- function(){1} ; !l } Error in !l : invalid argument type ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotError# #{ l <- list(1); !l } Error in !l : invalid argument type ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotError# #{ x<-1:4; dim(x)<-c(2, 2); names(x)<-101:104; attr(x, "dimnames")<-list(c("201", "202"), c("203", "204")); attr(x, "foo")<-"foo"; y<-!x; attributes(y) } $names [1] "101" "102" "103" "104" $dim [1] 2 2 $dimnames $dimnames[[1]] [1] "201" "202" $dimnames[[2]] [1] "203" "204" ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotPropagate# #{ x<-1:4; dim(x)<-c(2, 2); names(x)<-101:104; attr(x, "dimnames")<-list(201:202, 203:204); attr(x, "foo")<-"foo"; y<-!x; attributes(y) } $names [1] "101" "102" "103" "104" $dim [1] 2 2 $dimnames $dimnames[[1]] [1] "201" "202" $dimnames[[2]] [1] "203" "204" ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotRaw# #{ a <- as.raw(12) ; !a } [1] f3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotRaw# #{ a <- as.raw(201) ; !a } [1] 36 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotRaw# #{ f <- function(arg) { !arg } ; f(as.raw(10)) ; f(as.raw(1:3)) } [1] fe fd fc ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotRaw# #{ f <- function(arg) { !arg } ; f(as.raw(10)) ; f(as.raw(c(a=1,b=2))) } [1] fe fd ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotRaw# #{ f <- function(arg) { !arg } ; f(as.raw(10)) ; f(matrix(as.raw(1:4),nrow=2 )) } [,1] [,2] [1,] fe fc [2,] fd fb ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotRaw# #{ f <- function(arg) { !arg } ; f(as.raw(10)) ; x <- as.raw(10:11) ; attr(x, "my") <- 1 ; f(x) } [1] f5 f4 attr(,"my") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotRaw# #{ l <- list(); !l } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotVector# #{ !((0-3):3) } [1] FALSE FALSE FALSE TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotVector# #{ !c(1,2,3,4,0,0,NA) } [1] FALSE FALSE FALSE FALSE TRUE TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testUnaryNotVector# #{ !c(TRUE,TRUE,FALSE,NA) } [1] FALSE FALSE TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ 1:4 & c(FALSE,TRUE) } [1] FALSE TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ FALSE & FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ FALSE & NA } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ FALSE & TRUE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ NA & FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ NA & NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ NA & TRUE } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ TRUE & FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ TRUE & NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ TRUE & TRUE } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ a <- as.raw(201) ; b <- as.raw(1) ; a & b } [1] 01 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ c(FALSE, NA) & c(NA, NA) } [1] FALSE NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ x <- 1 ; f <- function(r) { x <<- 2; r } ; FALSE & f(FALSE) ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAnd# #{ x <- 1 ; f <- function(r) { x <<- 2; r } ; NA & f(NA) ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a & b } ; f(TRUE, 1L) ; f(1L, 0) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a & b } ; f(TRUE, 1L) ; f(1L, 0L) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a & b } ; f(TRUE, 1L) ; f(1L, 3+4i) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a & b } ; f(TRUE, 1L) ; f(1L, TRUE) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a & b } ; f(TRUE, 1L) ; f(FALSE, FALSE) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a & b } ; f(TRUE, 1L) ; f(as.raw(10), as.raw(11)) } [1] 0a ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a & b } ; f(TRUE, FALSE) ; f(1L, 3+4i) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAndAsFunction# #{ f <- function(a,b) { a & b } ; f(TRUE, FALSE) ; f(TRUE, 3+4i) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAttributes#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); y<-21:28; x | y } Error: dims [product 4] do not match the length of object [8] ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAttributes# #{ x<-1:4; names(x)<-101:104; attr(x, "foo")<-"foo"; attributes(x | TRUE) } $names [1] "101" "102" "103" "104" ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAttributes# #{ x<-1:4; names(x)<-101:104; attr(x, "foo")<-"foo"; y<-21:24; names(y)<-121:124; attributes(x | y) } $names [1] "101" "102" "103" "104" ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAttributes# #{ x<-1:4; names(x)<-101:104; x | TRUE } 101 102 103 104 TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAttributes# #{ x<-1:4; names(x)<-101:104; y<-21:24; names(y)<-121:124; x | y } 101 102 103 104 TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAttributes# #{ x<-1:4; names(x)<-101:104; y<-21:28; attributes(x | y) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAttributes# #{ x<-1:4; names(x)<-101:104; y<-21:28; names(y)<-121:128; attributes(y | x) } $names [1] "121" "122" "123" "124" "125" "126" "127" "128" ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAttributes# #{ x<-1:4; names(x)<-101:104; y<-21:28; names(y)<-121:128; x | y } 121 122 123 124 125 126 127 128 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAttributes# #{ x<-1:4; y<-21:24; names(y)<-121:124; attributes(x | y) } $names [1] "121" "122" "123" "124" ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalAttributes#Ignored.ReferenceError# #{ x<-as.raw(1:4); names(x)<-101:104; y<-as.raw(21:24); names(y)<-121:124; x | y } 101 102 103 104 15 16 17 1c ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalComplex# #{ 1+2i & 0 } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalComplex# #{ 1+2i | 0 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #c(TRUE, FALSE) | c(NA, NA) [1] TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #{ 0 | 0 } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #{ 0 | NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #{ 1 | 0 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #{ 1.1 | 3.15 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #{ NA | 0 } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #{ NA | 1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #{ a <- as.raw(200) ; b <- as.raw(1) ; a | b } [1] c9 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #{ a <- as.raw(200) ; b <- as.raw(255) ; a | b } [1] ff ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #{ x <- 1 ; f <- function(r) { x <<- 2; r } ; NA | f(NA) ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOr# #{ x <- 1 ; f <- function(r) { x <<- 2; r } ; TRUE | f(FALSE) ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOrAsFunction# #{ f <- function(a,b) { a | b } ; f(as.raw(c(1,4)), as.raw(3)) ; f(4, FALSE) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOrAsFunction# #{ f <- function(a,b) { a | b } ; f(c(TRUE, FALSE), FALSE) ; f(1L, 3+4i) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalOrAsFunction# #{ f <- function(a,b) { a | b } ; f(c(TRUE, FALSE), FALSE) ; f(c(FALSE,FALSE), 3+4i) } [1] TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalTypeCheck# #{ TRUE | "hello" } Error in TRUE | "hello" : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalTypeCheck# #{ f <- function(a,b) { a & b } ; f(TRUE, 1L) ; f(FALSE, as.raw(10)) } Error in a & b : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalTypeCheck# #{ f <- function(a,b) { a & b } ; f(TRUE, 1L) ; f(as.raw(10), 12) } Error in a & b : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalTypeCheck# #{ f <- function(a,b) { a | b } ; f(3, as.raw(c(1,4))) } Error in a | b : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalTypeCheck# #{ f <- function(a,b) { a | b } ; f(as.raw(c(1,4)), 3) } Error in a | b : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalTypeCheck# #{ f <- function(a,b) { a | b } ; f(as.raw(c(1,4)), as.raw(3)) ; f(FALSE, as.raw(4)) } Error in a | b : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorizedLogicalTypeCheck# #{ f <- function(a,b) { a | b } ; f(as.raw(c(1,4)), as.raw(3)) ; f(as.raw(4), FALSE) } Error in a | b : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ c(1L,2L,3L)*c(10,11,12) } [1] 10 22 36 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ c(1L,2L,3L)*c(10L) } [1] 10 20 30 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ c(1L,2L,3L)+TRUE } [1] 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ c(1L,2L,3L,4L)-c(TRUE,FALSE) } [1] 0 2 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ ia<-c(1L,2L);ib<-c(3L,4L);d<-c(5,6);ia+ib+d } [1] 9 12 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ x<-1+NA; c(1,2,3,4)+c(x,10) } [1] NA 12 NA 14 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ x<-c(1,2);y<-c(3,4,5,6);x*y } [1] 3 8 5 12 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ x<-c(1,2);y<-c(3,4,5,6);x+y } [1] 4 6 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ x<-c(1,2);z<-c();x==z } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ x<-c(1,2,3);x } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ x<-c(1,2,3);x*2 } [1] 2 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ x<-c(1,2,3);x*x+x } [1] 2 6 12 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ x<-c(1,2,3);x+2 } [1] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ x<-c(1,2,3);x+FALSE } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectors# #{ x<-c(1,2,3);x+TRUE } [1] 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsComplex# #x <- c(NaN, 3+2i); xre <- Re(x); xim <- (0+1i) * Im(x); xre + xim [1] NaN+0i 3+2i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsComplex# #{ 1:4+c(1,2+2i) } [1] 2+0i 4+2i 4+0i 6+2i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsComplex# #{ c(1,2+2i)+1:4 } [1] 2+0i 4+2i 4+0i 6+2i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsEmptyResult# #{ 1+integer() } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsEmptyResult# #{ integer()+1 } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsIntegerDivision# #{ c(3,4) %/% 2 } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsLengthWarning# #{ 1:2+1:3 } [1] 2 4 4 Warning message: In 1:2 + 1:3 : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsLengthWarning# #{ 1:3*1:2 } [1] 1 4 3 Warning message: In 1:3 * 1:2 : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsLengthWarning# #{ 1:3+c(1,2+2i) } [1] 2+0i 4+2i 4+0i Warning message: In 1:3 + c(1, 2 + (0+2i)) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsLengthWarning# #{ c(1,2+2i)+1:3 } [1] 2+0i 4+2i 4+0i Warning message: In c(1, 2 + (0+2i)) + 1:3 : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsMatrixDimsDontMatch#Output.IgnoreErrorContext# #{ m <- matrix(nrow=2, ncol=2, 1:4) ; m + 1:16 } Error: dims [product 4] do not match the length of object [16] ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsModulo# #{ c(3,4) %% 2 } [1] 1 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsModulo# #{ c(3,4) %% c(2,5) } [1] 1 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ 1 + c(1L, NA, 3L) } [1] 2 NA 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ 1:2+c(NA,NA,NA,NA) } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ 1:3+NA } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ 1:3+c(NA, NA, NA) } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ 1:4+c(NA, NA) } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ NA + c(1, 2, 3) } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ NA+1:3 } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ NA+c(1L, 2L, 3L) } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(1, 2, 3) + NA } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(1L, 2L, 3L)+NA } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(1L,2L)+c(NA,NA,NA,NA) } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(1L,2L,3L)+c(NA, NA, NA) } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(1L,2L,3L,4L)+c(NA, NA) } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(1L,NA) + c(2,3) } [1] 3 NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(1L,NA)+1 } [1] 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(2,3) + c(1L,NA)} [1] 3 NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(NA,NA)+1:4 } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(NA,NA)+c(1L,2L,3L,4L) } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(NA,NA,NA)+1:3 } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(NA,NA,NA)+c(1L,2L,3L) } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(NA,NA,NA,NA)+1:2 } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNA# #{ c(NA,NA,NA,NA)+c(1L,2L) } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNonConformable# #{ x <- 1:2 ; dim(x) <- 1:2 ; y <- 2:3 ; dim(y) <- 2:1 ; x + y } Error in x + y : non-conformable arrays ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsNonConformable# #{ x <- 1:2 ; dim(x) <- 1:2 ; y <- 2:3 ; dim(y) <- c(1,1,2) ; x + y } Error in x + y : non-conformable arrays ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperations# #3 ** 4 [1] 81 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperations# #{ -2:2 / 0:0 } [1] -Inf -Inf NaN Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperations# #{ 1:1 / 0:0 } [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperations# #{ a <- c(1,3) ; a ^ 3 } [1] 1 27 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperations# #{ a <- c(1,3) ; b <- c(2,4) ; a ^ b } [1] 1 81 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperations# #{ c(1,3) %/% c(2,4) } [1] 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperations# #{ c(1,3) - 4 } [1] -3 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperations# #{ c(1,3) / c(2,4) } [1] 0.50 0.75 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperationsComplex# #{ a <- c(1+1i,3+2i) ; a - (4+3i) } [1] -3-2i -1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperationsComplex# #{ c(1+1i,3+2i) * c(1,2) } [1] 1+1i 6+4i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperationsComplex# #{ c(1+1i,3+2i) / 2 } [1] 0.5+0.5i 1.5+1.0i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperationsComplex# #{ c(1,2,3+1i)^3 } [1] 1+ 0i 8+ 0i 18+26i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperationsComplex# #{ round( 3^c(1,2,3+1i), digits=5 ) } [1] 3.00000+ 0.00000i 9.00000+ 0.00000i 12.28048+24.04558i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperationsComplex# #{ round(c(1+1i,2+3i)^c(1+1i,3+4i), digits = 5) } [1] 0.27396+0.58370i -0.20455+0.89662i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperationsComplex# #{ z <- c(-1.5-1i,10) ; (z * z)[1] } [1] 1.25+3i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsOperationsComplex# #{ z <- c(1+1i,3+2i) ; z * c(1,2) } [1] 1+1i 6+4i ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1 + 1:2 } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1:2 + 1 } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1:2 + 2L } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1:2 + 3:4 } [1] 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1:2 + c(1,2) } [1] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1:2 + c(1,2,3,4) } [1] 2 4 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1:2 + c(1L, 2L) } [1] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1:4 + c(1L, 2L) } [1] 2 4 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1:4+c(1,2) } [1] 2 4 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1L + 1:2 } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 1L + c(1,2) } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 2L + 1:2 } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 2L + c(1L, 2L) } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ 4:3 + 2L } [1] 6 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ c(1,2) + 1:2 } [1] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ c(1,2)+1:4 } [1] 2 4 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ c(1,2,3,4) + 1:2 } [1] 2 4 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ c(1,2,3,4) + c(1L,2L) } [1] 2 4 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ c(1L, 2L) + 1:4 } [1] 2 4 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ c(1L, 2L) + 2L } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testVectorsRanges# #{ c(1L,2L) + c(1,2,3,4) } [1] 2 4 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testXor# # xor(FALSE, FALSE) [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testXor# # xor(FALSE, TRUE) [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testXor# # xor(TRUE, FALSE) [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testXor# # xor(TRUE, TRUE) [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testXor# #{ xor(0:2, 2:4) } [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testXor# #{ xor(0:2, 2:7) } [1] TRUE FALSE FALSE TRUE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArithmetic.testXor# #{ xor(7, 42) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ e <- new.env(); assign("a", 1, e); e["a"] } Error in e["a"] : object of type 'environment' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ e <- new.env(); assign("a", 1, e); e[["a"]] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ e <- new.env(); assign("a", 1, e); e[[1]] } Error in e[[1]] : wrong arguments for subsetting an environment ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ v<-c("a", "b"); dim(v)<-c(1,2); dimnames(v)<-list("x", c("y", "z")); v[1, c(1,2), drop=FALSE] } y z x "a" "b" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x <- c(1, 2); names(x) <- c("A", "A2"); x["A"] } A 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-(1:8); dim(x)<-c(2, 2, 2); dim(x[0,0,0]) } [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-(1:8); dim(x)<-c(2, 2, 2); dimnames(x)<-list(c("a", "b"), c("c", "d"), c("e", "f")) ;x[,0,] } , , e a b , , f a b ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-(1:8); dim(x)<-c(2, 2, 2); dimnames(x)<-list(c("a", "b"), c("c", "d"), c("e", "f")) ;x[1,1,NA] } NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-(1:8); dim(x)<-c(2, 2, 2); dimnames(x)<-list(c("a", "b"), c("c", "d"), c("e", "f")) ;x[1,1,] } e f 1 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-(1:8); dim(x)<-c(2, 2, 2); dimnames(x)<-list(c("a", "b"), c("c", "d"), c("e", "f")); x[1,1,c(1,NA,1)] } e e 1 NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-(1:8); dim(x)<-c(2, 2, 2); dimnames(x)<-list(c("a", "b"), c("c", "d"), c("e", "f")); x[NA,1,c(1,NA,1)] } e e NA NA NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-(1:8); dim(x)<-c(2, 2, 2); x[0,0,1] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-(1:8); dim(x)<-c(2, 2, 2); x[1,1,NA] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-(1:8); dim(x)<-c(2, 2, 2); x[1,1,c(1,NA,1)] } [1] 1 NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-(1:8); dim(x)<-c(2, 2, 2); x[NA,1,c(1,NA,1)] } [,1] [,2] [,3] [1,] NA NA NA [2,] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:16; dim(x)<-c(2,2,4); dim(x[0,-1,-1]) } [1] 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:16; dim(x)<-c(2,2,4); x[,1,1] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:16; dim(x)<-c(4,1,4); dimnames(x)<-list(c("a", "b", "c", "d"), "z", c("e", "f", "g", "h")); dimnames(x[-1,1,-1]) } [[1]] [1] "b" "c" "d" [[2]] [1] "f" "g" "h" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:16; dim(x)<-c(4,1,4); dimnames(x)<-list(c("a", "b", "c", "d"), NULL, c("e", "f", "g", "h")); x[-1,1,-1] } f g h b 6 10 14 c 7 11 15 d 8 12 16 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:16; dim(x)<-c(4,1,4); dimnames(x)<-list(c("a", "b", "c", "d"), NULL, c("e", "f", "g", "h")); x[-1,1,1] } b c d 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:256; dim(x)<-c(4,4,4,4); dim(x[1,0, 1,-1]) } [1] 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:256; dim(x)<-c(4,4,4,4); dim(x[1,1, 0,-1]) } [1] 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:32; dim(x)<-c(4,2,4); dim(x[-1,1,1]) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:32; dim(x)<-c(4,2,4); dimnames(x)<-list(NULL, c("x", "y"), c("e", "f", "g", "h")); x[-1,1,1] } [1] 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:32; dim(x)<-c(4,2,4); dimnames(x)<-list(c("a", "b", "c", "d"), NULL, c("e", "f", "g", "h")); x[-1,,-1] } , , f [,1] [,2] b 10 14 c 11 15 d 12 16 , , g [,1] [,2] b 18 22 c 19 23 d 20 24 , , h [,1] [,2] b 26 30 c 27 31 d 28 32 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:32; dim(x)<-c(4,2,4); dimnames(x)<-list(c("a", "b", "c", "d"), c("x", "y"), c("e", "f", "g", "h")); x[-1,,-1] } , , f x y b 10 14 c 11 15 d 12 16 , , g x y b 18 22 c 19 23 d 20 24 , , h x y b 26 30 c 27 31 d 28 32 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:32; dim(x)<-c(4,2,4); dimnames(x)<-list(c("a", "b", "c", "d"), c("x", "y"), c("e", "f", "g", "h")); x[1,1,1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:64; dim(x)<-c(4,4,2,2); dim(x[1,0, 1,-1]) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:64; dim(x)<-c(4,4,2,2); dim(x[1,1, 0,-1]) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:64; dim(x)<-c(4,4,4); dim(x[0,-1,-1]) } [1] 0 3 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:64; dim(x)<-c(4,4,4); dim(x[0,1,-1]) } [1] 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:64; dim(x)<-c(4,4,4); dim(x[1,0,-1]) } [1] 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:64; dim(x)<-c(4,4,4); x[-1,-1,1] } [,1] [,2] [,3] [1,] 6 10 14 [2,] 7 11 15 [3,] 8 12 16 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:64; dim(x)<-c(4,4,4); x[-1,1,3] } [1] 34 35 36 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:64; dim(x)<-c(4,4,4); x[1,1,3] } [1] 33 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:8; dim(x)<-c(1,2,4); dim(x[0,,-1]) } [1] 0 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:8; dim(x)<-c(1,2,4); dim(x[0,1,-1]) } [1] 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:8; dim(x)<-c(1,2,4); dim(x[1,0,-1]) } [1] 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:8; dim(x)<-c(1,2,4); dim(x[1,0,3]) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:8; dim(x)<-c(2,2,2); dim(x[1,0,1]) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:8; dim(x)<-c(2,2,2); x[1, 1, 1, 1] } Error in x[1, 1, 1, 1] : incorrect number of dimensions ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:8; dim(x)<-c(2,2,2); x[42,1,1] } Error in x[42, 1, 1] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testAccess# #{ x<-1:8; dim(x)<-c(2,2,2); x[[, 1, 1]] } Error in x[[, 1, 1]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayBuiltin# #{ a <- array(); dim(a) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayBuiltin# #{ a = array(); is.na(a[1]) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayBuiltin# #{ a = array(); is.null(dimnames(a)); } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayBuiltin# #{ a = array(); length(a) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayBuiltin# #{ a = array(1:10, dim = c(2,6)); length(a) } [1] 12 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayBuiltin# #{ array(NA, dim=c(-2,-2)); } Error in array(NA, dim = c(-2, -2)) : the dims contain negative values ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayBuiltin# #{ array(NA, dim=c(-2,2)); } Error in array(NA, dim = c(-2, 2)) : negative length vectors are not allowed ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayBuiltin# #{ c <- array(c(3+2i, 5+0i, 1+3i, 5-3i), c(2,2,2)); length(c); dim(c) <- c(2,2,2); } ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayBuiltin# #{ dim(array(NA, dim=c(2.1,2.9,3.1,4.7))) } [1] 2 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayBuiltin# #{ length(array(NA, dim=c(1,0,2,3))) } [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ a = array(1,c(3,3,3)); a = dim(a[,1,]); c(length(a),a[1],a[2]) } [1] 2 3 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ a = array(1,c(3,3,3)); a = dim(a[1,1,1, drop = FALSE]); c(length(a),a[1],a[2],a[3]) } [1] 3 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ a = array(1,c(3,3,3)); a[2,2]; } Error in a[2, 2] : incorrect number of dimensions ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ a = array(1,c(3,3,3)); is.null(dim(a[1,1,1])) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ a = array(1,c(3,3,3)); is.null(dim(a[1,1,])) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ a = array(1:27, c(3,3,3)); b = a[,,]; d = dim(b); c(d[1],d[2],d[3]) } [1] 3 3 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ a = array(1:27, c(3,3,3)); c(a[1],a[27],a[22],a[6]) } [1] 1 27 22 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ a = array(1:27,c(3,3,3)); c(a[1,1,1],a[3,3,3],a[1,2,3],a[3,2,1]) } [1] 1 27 22 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ m <- array(1:4, dim=c(4,1,1)) ; x <- m[[2,1,1,drop=FALSE]] ; is.null(dim(x)) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ m <- array(c(1,2,3), dim=c(3,1,1)) ; x <- dim(m[1:2,1,1,drop=FALSE]) ; c(x[1],x[2],x[3]) } [1] 2 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ m <- array(c(1,2,3), dim=c(3,1,1)) ; x <- dim(m[1:2,1,1]) ; is.null(x) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ m <- array(c(1,2,3), dim=c(3,1,1)) ; x <- m[1:2,1,1] ; c(x[1],x[2]) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ m <- array(c(1,2,3), dim=c(3,1,1)) ; x <- m[1:2,1,integer()] ; d <- dim(x) ; c(d[1],d[2]) } [1] 2 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ m <- array(c(1,2,3), dim=c(3,1,1)) ; x <- m[1:2,1,integer()] ; d <- dim(x) ; length(x) } [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ x<-1:64; dim(x)<-c(4,4,2,2); dim(x[1,1, drop=0, 0, -1]) } [1] 1 1 0 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ x<-1:64; dim(x)<-c(4,4,2,2); dim(x[1,1, drop=FALSE, 0, -1]) } [1] 1 1 0 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ x<-1:64; dim(x)<-c(4,4,2,2); dim(x[1,1, drop=FALSE, 0, drop=TRUE, -1]) } Error in x[1, 1, drop = FALSE, 0, drop = TRUE, -1] : incorrect number of dimensions ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ x<-1:64; dim(x)<-c(4,4,2,2); dim(x[1,1, drop=c(0,2), 0, -1]) } [1] 1 1 0 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ x<-1:64; dim(x)<-c(4,4,2,2); dim(x[1,1, drop=integer(), 0, -1]) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySimpleRead# #{ x<-1:64; dim(x)<-c(4,4,2,2); dim(x[1,drop=FALSE, 1, drop=TRUE, -1]) } [1] 1 1 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySubsetAndSelection# #{ array(1,c(3,3,3))[1,1,1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySubsetAndSelection# #{ array(1,c(3,3,3))[[,,]]; } Error in array(1, c(3, 3, 3))[[, , ]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySubsetAndSelection# #{ array(1,c(3,3,3))[[1,1,1]] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySubsetAndSelection#Output.IgnoreErrorContext# #{ array(1,c(3,3,3))[[c(1,2),1,1]]; } Error in array(1, c(3, 3, 3))[[c(1, 2), 1, 1]] : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySubsetAndSelection# #{ m <- array(1:24, dim=c(2,3,4)) ; f <- function(i) { m[,,i] } ; f(1) ; f(2) ; dim(f(1:2)) } [1] 2 3 2 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySubsetAndSelection# #{ m <- array(1:24, dim=c(2,3,4)) ; f <- function(i) { m[,,i] } ; f(1[2]) ; f(3) } [,1] [,2] [,3] [1,] 13 15 17 [2,] 14 16 18 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySubsetAndSelection# #{ m <- array(1:24, dim=c(2,3,4)) ; m[,,2,drop=FALSE] } , , 1 [,1] [,2] [,3] [1,] 7 9 11 [2,] 8 10 12 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArraySubsetAndSelection# #{ m <- array(1:24, dim=c(2,3,4)) ; m[,,2] } [,1] [,2] [,3] [1,] 7 9 11 [2,] 8 10 12 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayUpdate# #{ a = array(1,c(3,3,3)); a[1,2,3] = 3; a } , , 1 [,1] [,2] [,3] [1,] 1 1 1 [2,] 1 1 1 [3,] 1 1 1 , , 2 [,1] [,2] [,3] [1,] 1 1 1 [2,] 1 1 1 [3,] 1 1 1 , , 3 [,1] [,2] [,3] [1,] 1 3 1 [2,] 1 1 1 [3,] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayUpdate# #{ a = array(1,c(3,3,3)); b = a; b[1,2,3] = 3; c(a[1,2,3],b[1,2,3]) } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayUpdate# #{ a = array(1,c(3,3,3)); c(a[1,2,3],a[1,2,3]) } [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayUpdate# #{ a = matrix(1,2,2); a[1,2] = 3; a[1,2] == 3; } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayUpdate# #{ ansmat <- array(dim=c(2,2),dimnames=list(c("1","2"),c("A","B"))) ; ansmat } A B 1 NA NA 2 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayUpdate# #{ ansmat <- array(dim=c(2,2),dimnames=list(c("1","2"),c("A","B"))) ; ansmat[c(1,2,4)] <- c(1,2,3) ; ansmat } A B 1 1 NA 2 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testArrayUpdate# #{ x <- array(c(1,2,3), dim=c(3,1,1)) ; x[1:2,1,1] <- sqrt(x[2:1]) ; c(x[1] == sqrt(2), x[2], x[3]) } [1] 1 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testBugIfiniteLoopInGeneralizedRewriting# #{ m <- array(1:3, dim=c(3,1,1)) ; f <- function(x,v) { x[1:2,1,1] <- v ; x } ; f(m,10L) ; f(m,10) ; f(m,c(11L,12L)); c(m[1,1,1],m[2,1,1],m[3,1,1]) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testDefinitions# #{ m <- matrix() ; m } [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testDefinitions# #{ m <- matrix(1:6, ncol=3, byrow=TRUE) ; m } [,1] [,2] [,3] [1,] 1 2 3 [2,] 4 5 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testDefinitions# #{ m <- matrix(1:6, nrow=2, byrow=TRUE) ; m } [,1] [,2] [,3] [1,] 1 2 3 [2,] 4 5 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testDefinitions# #{ m <- matrix(1:6, nrow=2, ncol=3, byrow=TRUE) ; m } [,1] [,2] [,3] [1,] 1 2 3 [2,] 4 5 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testDefinitions# #{ matrix( (1:6) * (1+3i), nrow=2 ) } [,1] [,2] [,3] [1,] 1+3i 3+ 9i 5+15i [2,] 2+6i 4+12i 6+18i ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testDefinitions# #{ matrix( as.raw(101:106), nrow=2 ) } [,1] [,2] [,3] [1,] 65 67 69 [2,] 66 68 6a ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testLhsCopy# #{ a = array(1.3,c(3,3,3)); a[1,2,3] = 2+3i; typeof(a[1,2,3]) } [1] "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testLhsCopy# #{ a = array(1.5,c(3,3,3)); a[1,2,3] = "2+3i"; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "character" "character" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testLhsCopy# #{ a = array(1L,c(3,3,3)); a[1,2,3] = "2+3i"; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "character" "character" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testLhsCopy# #{ a = array(1L,c(3,3,3)); a[1,2,3] = 2+3i; typeof(a[1,2,3]) } [1] "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testLhsCopy# #{ a = array(1L,c(3,3,3)); a[1,2,3] = 8.1; typeof(a[1,2,3]) } [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testLhsCopy# #{ a = array(TRUE,c(3,3,3)); a[1,2,3] = "2+3i"; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "character" "character" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testLhsCopy# #{ a = array(TRUE,c(3,3,3)); a[1,2,3] = 2+3i; typeof(a[1,2,3]) } [1] "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testLhsCopy# #{ a = array(TRUE,c(3,3,3)); a[1,2,3] = 8.1; typeof(a[1,2,3]) } [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testLhsCopy# #{ a = array(TRUE,c(3,3,3)); a[1,2,3] = 8L; typeof(a[1,2,3]) } [1] "integer" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMatrixBuiltin# #{ length(matrix()) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMatrixBuiltin# #{ matrix(1:4, dimnames=list(101:104, 42)) } 42 101 1 102 2 103 3 104 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMatrixBuiltin# #{ matrix(1:4, dimnames=list(c("b", "c", "d", "e"), "a")) } a b 1 c 2 d 3 e 4 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMatrixSimpleRead# #{ a = matrix(1,3,3); is.null(dim(a[1,])); } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMatrixSubsetAndSelection# #{ m <- matrix(1:6, nrow=2) ; m[1,NULL] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMatrixSubsetAndSelection# #{ matrix(1,3,3)[1,1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMatrixSubsetAndSelection# #{ matrix(1,3,3)[[,]]; } Error in matrix(1, 3, 3)[[, ]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMatrixSubsetAndSelection# #{ matrix(1,3,3)[[1,1]] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMatrixSubsetAndSelection#Output.IgnoreErrorContext# #{ matrix(1,3,3)[[c(1,2),1]]; } Error in matrix(1, 3, 3)[[c(1, 2), 1]] : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMultiDimensionalUpdate# #{ a = array(1,c(3,3,3)); a[,1,1] = c(3,4,5); c(a[1,1,1],a[2,1,1],a[3,1,1]) } [1] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMultiDimensionalUpdate# #{ a = array(1,c(3,3,3)); a[1,,1] = c(3,4,5); c(a[1,1,1],a[1,2,1],a[1,3,1]) } [1] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMultiDimensionalUpdate# #{ a = array(1,c(3,3,3)); a[1,,] = matrix(1:9,3,3); c(a[1,1,1],a[1,3,1],a[1,3,3]) } [1] 1 3 9 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMultiDimensionalUpdate# #{ a = array(1,c(3,3,3)); a[1,1,] = c(3,4,5); c(a[1,1,1],a[1,1,2],a[1,1,3]) } [1] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMultiDimensionalUpdate# #{ a = matrix(1,3,3); a[,1] = c(3,4,5); c(a[1,1],a[2,1],a[3,1]) } [1] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testMultiDimensionalUpdate# #{ a = matrix(1,3,3); a[1,] = c(3,4,5); c(a[1,1],a[1,2],a[1,3]) } [1] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testRhsCopy# #{ a = array("3+2i",c(3,3,3)); b = 2+3i; a[1,2,3] = b; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "character" "character" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testRhsCopy# #{ a = array("3+2i",c(3,3,3)); b = 7L; a[1,2,3] = b; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "character" "character" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testRhsCopy# #{ a = array("3+2i",c(3,3,3)); b = TRUE; a[1,2,3] = b; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "character" "character" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testRhsCopy# #{ a = array(1.7,c(3,3,3)); b = 3L; a[1,2,3] = b; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "double" "double" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testRhsCopy# #{ a = array(1.7,c(3,3,3)); b = TRUE; a[1,2,3] = b; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "double" "double" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testRhsCopy# #{ a = array(3+2i,c(3,3,3)); b = 4.2; a[1,2,3] = b; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "complex" "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testRhsCopy# #{ a = array(3+2i,c(3,3,3)); b = 4L; a[1,2,3] = b; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "complex" "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testRhsCopy# #{ a = array(3+2i,c(3,3,3)); b = TRUE; a[1,2,3] = b; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "complex" "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testRhsCopy# #{ a = array(7L,c(3,3,3)); b = TRUE; a[1,2,3] = b; c(typeof(a[1,2,3]),typeof(a[1,1,1])) } [1] "integer" "integer" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testRhsCopy# #{ m <- array(c(1+1i,2+2i,3+3i), dim=c(3,1,1)) ; m[1:2,1,1] <- c(100L,101L) ; m ; c(typeof(m[1,1,1]),typeof(m[2,1,1])) } [1] "complex" "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testSelection# #{ m <- matrix(1:6, nrow=2) ; m[upper.tri(m)] } [1] 3 5 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testSelection# #{ m <- matrix(c(1,2,3,4,5,6), nrow=3) ; m[0] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testSelection# #{ m <- matrix(list(1,2,3,4,5,6), nrow=3) ; m[0] } list() ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #({ x<-1:8; dim(x)<-c(2,2,2); x[1, 1, 1] = as.raw(42); x }) Error in x[1, 1, 1] = as.raw(42) : incompatible types (from raw to integer) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #({ x<-as.character(1:8); dim(x)<-c(2,2,2); x[1, 1, 1] = as.raw(42); x }) Error in x[1, 1, 1] = as.raw(42) : incompatible types (from raw to character) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #({ x<-as.complex(1:8); dim(x)<-c(2,2,2); x[1, 1, 1] = as.raw(42); x }) Error in x[1, 1, 1] = as.raw(42) : incompatible types (from raw to complex) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #({ x<-as.double(1:8); dim(x)<-c(2,2,2); x[1, 1, 1] = as.raw(42); x }) Error in x[1, 1, 1] = as.raw(42) : incompatible types (from raw to double) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #({ x<-as.logical(1:8); dim(x)<-c(2,2,2); x[1, 1, 1] = as.raw(42); x }) Error in x[1, 1, 1] = as.raw(42) : incompatible types (from raw to logical) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- array(1:3, dim=c(3,1,1)) ; f <- function(x,v) { x[[2,1,1]] <- v ; x } ; f(m,10L) ; f(m,10) ; x <- f(m,11L) ; c(x[1],x[2],x[3]) } [1] 1 11 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ a <- 1:9 ; a[, , 1] <- 10L } Error in a[, , 1] <- 10L : incorrect number of subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ a <- 1:9 ; a[, 1] <- 10L } Error in a[, 1] <- 10L : incorrect number of subscripts on matrix ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ a <- 1:9 ; a[1, 1, 1] <- 10L } Error in a[1, 1, 1] <- 10L : incorrect number of subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ a <- 1:9 ; a[1, 1] <- 10L } Error in a[1, 1] <- 10L : incorrect number of subscripts on matrix ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- array(1:24, dim=c(2,3,4)) ; m[,,4] <- 10:15 ; m[,,4] } [,1] [,2] [,3] [1,] 10 12 14 [2,] 11 13 15 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1,2,2) ; m[, 1] = c(1, 2, 3, 4) ; m } Error in m[, 1] = c(1, 2, 3, 4) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1,2,2) ; m[,1] = 7 ; m } [,1] [,2] [1,] 7 1 [2,] 7 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1,2,2) ; m[,1] = c(10,11) ; m } [,1] [,2] [1,] 10 1 [2,] 11 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1,2,2) ; m[1,] = 7 ; m } [,1] [,2] [1,] 7 7 [2,] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1,2,2); m[1,1] = 6; m } [,1] [,2] [1,] 6 1 [2,] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:100, nrow=10) ; z <- 1; s <- 0 ; for(i in 1:3) { m[z <- z + 1,z <- z + 1] <- z * z * 1000 } ; sum(m) } [1] 39918 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; f <- function(i,j) { m[i,j] <- 10 ; m } ; m <- f(1, c(-1,-10)) ; m } [,1] [,2] [,3] [1,] 1 10 10 [2,] 2 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; f <- function(i,j) { m[i,j] <- 10 ; m } ; m <- f(1,-1) ; m } [,1] [,2] [,3] [1,] 1 10 10 [2,] 2 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; f <- function(i,j) { m[i,j] <- 10 ; m } ; m <- f(1,c(-1,-10)) ; m <- f(-1,2) ; m } [,1] [,2] [,3] [1,] 1 10 10 [2,] 2 10 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; f <- function(i,j) { m[i,j] <- 10 ; m } ; m <- f(1,c(-1,-10)) ; m <- f(1,-1) ; m } [,1] [,2] [,3] [1,] 1 10 10 [2,] 2 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; f <- function(i,j) { m[i,j] <- 10 ; m } ; m <- f(2,1:3) ; m <- f(1,-2) ; m } [,1] [,2] [,3] [1,] 10 3 10 [2,] 10 10 10 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; m[, 2] <- integer() } Error in m[, 2] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; m[,2:3] <- 10:11 ; m } [,1] [,2] [,3] [1,] 1 10 10 [2,] 2 11 11 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; m[,2] <- 10:11 ; m } [,1] [,2] [,3] [1,] 1 10 5 [2,] 2 11 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; m[,integer()] <- integer() ; m } [,1] [,2] [,3] [1,] 1 3 5 [2,] 2 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; m[1, 2] <- 1:3 } Error in m[1, 2] <- 1:3 : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; m[1, 2] <- integer() } Error in m[1, 2] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=2) ; m[[1, 1]] <- integer() } Error in m[[1, 1]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate#Output.IgnoreErrorMessage# #{ m <- matrix(1:6, nrow=2) ; m[[1:2, 1]] <- integer() } Error in m[[1:2, 1]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate#Output.IgnoreErrorContext# #{ m <- matrix(1:6, nrow=2) ; m[[1:2,1]] <- 1 } Error in `[[<-`(`*tmp*`, 1:2, 1, value = 1) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate#Output.IgnoreErrorContext# #{ m <- matrix(1:6, nrow=2) ; m[[integer(),1]] <- 1 } Error in `[[<-`(`*tmp*`, integer(), 1, value = 1) : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(1:6, nrow=3) ; m[2] <- list(100) ; m } [[1]] [1] 1 [[2]] [1] 100 [[3]] [1] 3 [[4]] [1] 4 [[5]] [1] 5 [[6]] [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(as.double(1:6), nrow=2) ; mi <- matrix(1:6, nrow=2) ; f <- function(v,i,j) { v[i,j] <- 100 ; v[i,j] * i * j } ; f(m, 1L, 2L) ; f(m,1L,-1) } [1] -100 -100 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(as.double(1:6), nrow=2) ; mi <- matrix(1:6, nrow=2) ; f <- function(v,i,j) { v[i,j] <- 100 ; v[i,j] * i * j } ; f(m, 1L, 2L) ; f(m,1L,TRUE) } [1] 100 100 100 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(list(1,2,3,4,5,6), nrow=3) ; m[2] <- list(100) ; m } [,1] [,2] [1,] 1 4 [2,] 100 5 [3,] 3 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(list(1,2,3,4,5,6), nrow=3) ; m[[2]] <- list(100) ; m } [,1] [,2] [1,] 1 4 [2,] List,1 5 [3,] 3 6 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ m <- matrix(list(1,2,3,4,5,6), nrow=3) ; m[c(2,3,4,6)] <- NULL ; m } [[1]] [1] 1 [[2]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x <- array(c(1,2,3), dim=c(3,1)) ; x[1:2,1] <- 2:1 ; x } [,1] [1,] 2 [2,] 1 [3,] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1.1:8.8; dim(x)<-c(2,2,2); x[1, 1, 1] = as.raw(42); x } Error in x[1, 1, 1] = as.raw(42) : incompatible types (from raw to double) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:16; dim(x)<-c(2,2,2,2); y<-c(101:108); dim(y)<-c(2,4); x[1:2, 1:2, 1] <- y; x } Error in x[1:2, 1:2, 1] <- y : incorrect number of subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); x[1, 1, 1] = as.raw(42); x } Error in x[1, 1, 1] = as.raw(42) : incompatible types (from raw to integer) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); x[] = 42; x } , , 1 [,1] [,2] [1,] 42 42 [2,] 42 42 , , 2 [,1] [,2] [1,] 42 42 [2,] 42 42 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); x[] = c(42,7); x } , , 1 [,1] [,2] [1,] 42 42 [2,] 7 7 , , 2 [,1] [,2] [1,] 42 42 [2,] 7 7 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:102); z<-(x[1:2,c(1,2,0),1]<-y); x } , , 1 [,1] [,2] [1,] 101 101 [2,] 102 102 , , 2 [,1] [,2] [1,] 5 7 [2,] 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:104); dim(y)<-c(2,2); x[1, 1] <- y; x } Error in x[1, 1] <- y : incorrect number of subscripts on matrix ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:104); dim(y)<-c(2,2); x[1:2,1:2,1]<-y; x } , , 1 [,1] [,2] [1,] 101 103 [2,] 102 104 , , 2 [,1] [,2] [1,] 5 7 [2,] 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate#Output.IgnoreErrorContext# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:104); dim(y)<-c(2,2); z<-(x[0,5,1] <- y); x } Error in `[<-`(`*tmp*`, 0, 5, 1, value = 101:104) : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:104); dim(y)<-c(2,2); z<-(x[1:2, c(1, 2, 1), 1] <- y); x } Error in x[1:2, c(1, 2, 1), 1] <- y : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:104); dim(y)<-c(2,2); z<-(x[1:2, c(1, NA), 1] <- y); x } Error in x[1:2, c(1, NA), 1] <- y : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:104); dim(y)<-c(2,2); z<-(x[1:2,1:2,0]<-y); x } , , 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2 [,1] [,2] [1,] 5 7 [2,] 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:104); dim(y)<-c(2,2); z<-(x[1:2,1:2,c(0,0)]<-y); x } , , 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2 [,1] [,2] [1,] 5 7 [2,] 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:104); dim(y)<-c(2,2); z<-(x[1:2,c(1,1),1]<-y); x } , , 1 [,1] [,2] [1,] 103 3 [2,] 104 4 , , 2 [,1] [,2] [1,] 5 7 [2,] 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:104); dim(y)<-c(2,2); z<-(x[1:2,c(1,2,0),1]<-y); x } , , 1 [,1] [,2] [1,] 101 103 [2,] 102 104 , , 2 [,1] [,2] [1,] 5 7 [2,] 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate#Output.IgnoreErrorMessage# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:104); dim(y)<-c(2,2); z<-(x[1:2,c(1,2,NA),1]<-y); x } Error in x[1:2, c(1, 2, NA), 1] <- y : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); y<-c(101:120); z<-(x[1:2, c(1, 2, 0), 1] <- y); x } Error in x[1:2, c(1, 2, 0), 1] <- y : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-1:8; dim(x)<-c(2,2,2); z<-(x[1,1,1]<-42); z } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ x<-as.double(1:8); dim(x)<-c(2,2,2); x[1,1,1]<-42L; x } , , 1 [,1] [,2] [1,] 42 3 [2,] 2 4 , , 2 [,1] [,2] [1,] 5 7 [2,] 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ z<-1:4; y<-((names(z)<-101:104) > 1) } ##com.oracle.truffle.r.test.library.base.TestSimpleArrays.testUpdate# #{ z<-1:4; y<-((z[1]<-42) > 1) } ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssign# #{ a<-1 } ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssign# #{ a<-FALSE ; b<-a } ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssign# #{ x = if (FALSE) 1 } ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssign1# #{ a<-1; a } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssign1# #{ a<-1; a<-a+1; a } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssign2# #a <- 42; f <- function() { a <- 13; a <<- 37; }; f(); a; [1] 37 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssignBuiltin# #{ x <- 3 ; f <- function() { assign("x", 4) ; h <- function() { assign("z", 5) ; g <- function() { x <<- 10 ; x } ; g() } ; h() } ; f() ; x } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssignFunctionLookup1# #f <- function(b) { c <- 42; c(1,1); }; f(0); f(1) [1] 1 1 [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssignFunctionLookup1# #f <- function(b) { if (b) c <- 42; c(1,1); }; f(0); f(1) [1] 1 1 [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssignPoly1# #test <- function(b) { if (b) f <- function() { 42 }; g <- function() { if (!b) f <- function() { 43 }; f() }; g() }; c(test(FALSE), test(TRUE)) [1] 43 42 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssignShadowBuiltin1# #c <- NULL; f <- function(b) { if (b) c <- function(x,y) 42; c(1,1); }; f(FALSE); f(TRUE) [1] 1 1 [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssignShadowBuiltin1# #f <- function(b) { c <- function(x,y) 42; c(1,1); }; f(0); f(1) [1] 42 [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testAssignShadowBuiltin1# #f <- function(b) { if (b) c <- function(x,y) 42; c(1,1); }; f(0); f(1) [1] 1 1 [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testDynamic# #{ l <- quote(x <- 1) ; f <- function() { eval(l) ; x <<- 10 ; get("x") } ; f() } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testDynamic# #{ l <- quote(x <- 1) ; f <- function() { eval(l) } ; x <- 10 ; f() ; x } [1] 10 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testEmptyName# #{ "" <- 123 } Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testEmptyName# #{ '' <- 123 } Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testEmptyName# #{ 123 + `` } Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testEmptyName# #{ `` + 123 } Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testEmptyName# #{ `` <- 123 } Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #proto <- c(11,11); f <- function() { for (i in 1:2) print(proto[[i]] <- i); proto }; f() [1] 1 [1] 2 [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #proto <- c(11,11); f <- function() { for (i in 1:2) print(proto[[i]] <<- i); proto }; f() [1] 1 [1] 2 [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #proto <- c(11,11); f <- function() { for (i in 1:2) proto[[i]] <- i; proto }; f() [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #proto <- c(11,11); f <- function() { for (i in 1:2) proto[[i]] <<- i; proto }; f() [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #proto <- c(11,11); f <- function() { proto <- c(4,5); for (i in 1:2) print(proto[[i]] <- i); proto }; f() [1] 1 [1] 2 [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #proto <- c(11,11); f <- function() { proto <- c(4,5); for (i in 1:2) print(proto[[i]] <<- i); proto }; f() [1] 1 [1] 2 [1] 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #proto <- c(11,11); f <- function() { proto <- c(4,5); for (i in 1:2) proto[[i]] <- i; proto }; f() [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #proto <- c(11,11); f <- function() { proto <- c(4,5); for (i in 1:2) proto[[i]] <<- i; proto }; f() [1] 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #{ `f<-` <- function(x, y=42, value) { x[1]<-value+y; x }; y<-1:10; f(y)<-7; y } [1] 49 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #{ f <- function() { if (FALSE) { c <- 1 } ; g <- function() { c } ; g() } ; typeof(f()) } [1] "builtin" ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #{ f <- function() { if (FALSE) { x <- 1 } ; g <- function() { x } ; g() } ; f() } Error in g() : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #{ f <- function(i) { if (i==1) { c <- 1 ; x <- 1 } ; if (i!=2) { x } else { c }} ; f(1) ; f(1) ; typeof(f(2)) } [1] "builtin" ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #{ f <- function(i) { if (i==1) { c <- 1 } ; c } ; f(1) ; typeof(f(2)) } [1] "builtin" ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #{ f <- function(i) { if (i==1) { x <- 1 } ; x } ; f(1) ; f(1) ; f(2) } Error in f(2) : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #{ f <- function(i) { if (i==1) { x <- 1 } ; x } ; f(1) ; f(2) } Error in f(2) : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #{ nonexistent } Error: object 'nonexistent' not found ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testMisc# #{ x <- 3 ; f <- function() { assign("x", 4) ; g <- function() { assign("y", 3) ; hh <- function() { assign("z", 6) ; h <- function(s=1) { if (s==2) { x <- 5 } ; x } ; h() } ; hh() } ; g() } ; f() } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ a <- c(0,0,0) ; f <- function() { g <- function() { a[2] <<- 9 } ; g() } ; u <- function() { a <- c(1,1,1) ; f() ; a } ; r <- a ; s <- u() ; t <- a ; list(r,s,t) } [[1]] [1] 0 0 0 [[2]] [1] 1 1 1 [[3]] [1] 0 9 0 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ a <- c(0,0,0) ; u <- function() { a <- c(1,1,1) ; f <- function() { g <- function() { a[2] <<- 9 } ; g() } ; f() ; a } ; list(a,u()) } [[1]] [1] 0 0 0 [[2]] [1] 1 9 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ a <- c(1,2,3) ; f <- function() { a[2] <- 4 } ; list(f(),a) } [[1]] [1] 4 [[2]] [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ a <- c(1,2,3) ; f <- function() { a[2] <<- 4 } ; f() ; a } [1] 1 4 3 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ answer <<- 42 } ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ b <- 2 ; f <- function() { b <- 4 } ; f() ; b } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ b <- 2 ; f <- function() { b <<- 4 } ; f() ; b } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ b <- 2 ; f <- function() { b[2] <- 4 } ; f() ; b } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ b <- 2 ; f <- function() { b[2] <<- 4 } ; f() ; b } [1] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ b <- c(1,1) ; f <- function(v,x) { g <- function(y) { v[y] <<- 2 } ; g(x) ; v } ; k <- f(b,1) ; l <- f(b,2) ; list(k,l,b) } [[1]] [1] 2 1 [[2]] [1] 1 2 [[3]] [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ f <- function() { x <<- 2 } ; f() ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ f <- function(a) { g <- function(x,y) { a[x] <<- y } ; g(2,4) ; a } ; u <- c(1,2,3) ; k <- f(u) ; u <- c(3,2,1) ; l <- f(u) ; list(k,l) } [[1]] [1] 1 4 3 [[2]] [1] 3 4 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ h <- function() { x <- 10 ; g <- function() { if (FALSE) { x <- 2 } ; f <- function() { x <<- 3 ; x } ; f() } ; g() } ; h() } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ x <- 10 ; f <- function() { x <- x ; x <<- 2 ; x } ; c(f(), f()) } [1] 10 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ x <- 10 ; f <- function() { x <<- 2 ; x } ; c(f(), f()) } [1] 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ x <- 10 ; f <- function() { x <<- 2 } ; f() ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ x <- 10 ; g <- function() { f <- function() { x <- x ; x <<- 2 ; x } ; c(f(), f()) } ; g() } [1] 10 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ x <- 10 ; g <- function() { x ; f <- function() { x <- x ; x <<- 2 ; x } ; c(f(), f()) } ; g() } [1] 10 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ x <- 10 ; g <- function() { x <- 100 ; f <- function() { x <- x ; x <<- 2 ; x } ; c(f(), f()) } ; g() } [1] 100 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ x <<- 1 ; x } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAssignment.testSuperAssign# #{ x <<- 1 } ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- 1 ; attr(x, "my") <- 2; 2+x } [1] 3 attr(,"my") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- 1+1i; attr(x, "hi") <- 1+2 ; y <- 2:3 ; x+y } [1] 3+1i 4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- 1+1i; attr(x, "hi") <- 1+2 ; y <- 2:3 ; attr(y,"zz") <- 2; x+y } [1] 3+1i 4+1i attr(,"zz") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- 1:2 ; attr(x, "hi") <- 2 ; !x } [1] FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- 1:2 ; attr(x, "hi") <- 3 ; attr(x, "hihi") <- 10 ; y <- 2:3 ; attr(y,"zz") <- 2; attr(y,"hi") <-3; attr(y,"bye") <- 4 ; x+y } [1] 3 5 attr(,"zz") [1] 2 attr(,"hi") [1] 3 attr(,"bye") [1] 4 attr(,"hihi") [1] 10 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- 1:2; attr(x, "hi") <- 2 ; x & x } [1] TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- 1:2; attr(x, "hi") <- 2 ; x+1 } [1] 2 3 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- 1:2; attr(x, "hi") <- 2 ; x+1:4 } [1] 2 4 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- 1:2; attr(x, "hi") <- 2 ; y <- 2:3 ; attr(y,"hello") <- 3; x+y } [1] 3 5 attr(,"hello") [1] 3 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- 1; attr(x, "hi") <- 1+2 ; y <- 2:3 ; attr(y, "zz") <- 2; x+y } [1] 3 4 attr(,"zz") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- as.raw(1:2); attr(x, "hi") <- 2 ; x & x } [1] 01 02 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- c(1+1i, 2+2i) ; attr(x, "hi") <- 3 ; attr(x, "hihi") <- 10 ; y <- c(2+2i, 3+3i) ; attr(y,"zz") <- 2; attr(y,"hi") <-3; attr(y,"bye") <- 4 ; x+y } [1] 3+3i 5+5i attr(,"zz") [1] 2 attr(,"hi") [1] 3 attr(,"bye") [1] 4 attr(,"hihi") [1] 10 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- c(1+1i,2+2i); attr(x, "hi") <- 3 ; y <- 2:3 ; attr(y,"zz") <- 2; x+y } [1] 3+1i 5+2i attr(,"zz") [1] 2 attr(,"hi") [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- c(1+1i,2+2i); names(x)<-c("a", "b"); attr(x, "hi") <- 3 ; y <- 2:3 ; attr(y,"zz") <- 2; attributes(x+y) } $zz [1] 2 $hi [1] 3 $names [1] "a" "b" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- c(1+1i,2+2i,3+3i,4+4i); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); attr(x, "hi") <- 3 ; y <- 2:5 ; attr(y,"zz") <- 2; attributes(x+y) } $zz [1] 2 $hi [1] 3 $dim [1] 2 2 $dimnames $dimnames[[1]] [1] "a" "b" $dimnames[[2]] [1] "c" "d" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- c(1+1i,2+2i,3+3i,4+4i); dim(x)<-c(2,2); names(x)<-c("a", "b"); attr(x, "hi") <- 3 ; y <- 2:5 ; attr(y,"zz") <- 2; attributes(x+y) } $zz [1] 2 $hi [1] 3 $dim [1] 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- c(a=1) ; y <- c(b=2,c=3) ; x + y } b c 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- c(a=1) ; y <- c(b=2,c=3) ; y + x } b c 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- c(a=1,b=2) ; attr(x, "hi") <- 2 ; -x } a b -1 -2 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArithmeticPropagation# #{ x <- c(a=FALSE,b=TRUE) ; attr(x, "hi") <- 2 ; !x } a b TRUE FALSE attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArrayPropagation# #{ a <- array(c(1,1), dim=c(1,2)) ; attr(a, "a") <- 1 ; a[1,1] <- 1+1i ; a } [,1] [,2] [1,] 1+1i 1+0i attr(,"a") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArrayPropagation# #{ m <- matrix(rep(1,4), nrow=2) ; attr(m, "a") <- 1 ; m[2,2] <- 1+1i ; m } [,1] [,2] [1,] 1+0i 1+0i [2,] 1+0i 1+1i attr(,"a") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArrayPropagation# #{ x <- TRUE ; attr(x, "myatt") <- 1; x[1] <- 2 ; x } [1] 2 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArrayPropagation# #{ x <- TRUE ; attr(x, "myatt") <- 1; x[2] <- 2 ; x } [1] 1 2 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArrayPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1; x["a"] <- 2 ; x } a b 2 2 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArrayPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1; x[c(1,1)] } a a 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testArrayPropagation# #{ x <- c(a=TRUE, b=FALSE) ; attr(x, "myatt") <- 1; x[2] <- 2 ; x } a b 1 2 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ a <- c(1,2,3,4); attr(a, "x") <- "attrib"; dim(a) <- NULL; a } [1] 1 2 3 4 attr(,"x") [1] "attrib" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ a <- c(1,2,3,4); attr(a, "x") <- "attrib"; dim(a) <- c(2,2); a } [,1] [,2] [1,] 1 3 [2,] 2 4 attr(,"x") [1] "attrib" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ m <- 1:3 ; attr(m,"a") <- 1 ; t(m) } [,1] [,2] [,3] [1,] 1 2 3 attr(,"a") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ m <- matrix(1:6, nrow=2) ; attr(m,"a") <- 1 ; aperm(m) } [,1] [,2] [1,] 1 2 [2,] 3 4 [3,] 5 6 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ m <- matrix(1:6, nrow=2) ; attr(m,"a") <- 1 ; diag(m) <- c(1,1) ; m } [,1] [,2] [,3] [1,] 1 3 5 [2,] 2 1 6 attr(,"a") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ m <- matrix(1:6, nrow=2) ; attr(m,"a") <- 1 ; t(m) } [,1] [,2] [1,] 1 2 [2,] 3 4 [3,] 5 6 attr(,"a") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ m <- matrix(1:6, nrow=2) ; attr(m,"a") <- 1 ; mm <- aperm(m) ; dim(mm) } [1] 3 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ m <- matrix(rep(1,4), nrow=2) ; attr(m,"a") <- 1 ; upper.tri(m) } [,1] [,2] [1,] FALSE TRUE [2,] FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- "a" ; attr(x, "myatt") <- 1; tolower(x) } [1] "a" attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- "a" ; attr(x, "myatt") <- 1; toupper(x) } [1] "A" attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- 1 ; attr(x, "myatt") <- 1; c(x, x, x) } [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- 1 ; attr(x, "myatt") <- 1; cumsum(c(x, x, x)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- 1 ; attr(x, "myatt") <- 1; min(x) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- 1 ; attr(x, "myatt") <- 1; rep(x,2) } [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- 1 ; attr(x, "myatt") <- 1; round(exp(x), digits=5) } [1] 2.71828 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- 1 ; attr(x, "myatt") <- 1; x%o%x } [,1] [1,] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- 1 ; attr(x, "myatt") <- 1; x:x } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(1,2) ; dim(x)<-c(1,2); attr(x, "myatt") <- 1; round(exp(x), digits=5) } [,1] [,2] [1,] 2.71828 7.38906 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1) ; attr(x, "myatt") <- 1 ; lapply(1:2, function(z) {x}) } [[1]] a 1 attr(,"myatt") [1] 1 [[2]] a 1 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1) ; attr(x, "myatt") <- 1; log10(x) } a 0 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1) ; attr(x, "myatt") <- 1; nchar(x) } a 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1 ; abs(x) } a b 1 2 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1 ; sapply(1:2, function(z) {x}) } [,1] [,2] a 1 1 b 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1; array(x) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1; matrix(x) } [,1] [1,] 1 [2,] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1; order(x) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1; rev(x) } b a 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1; seq(x) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1; sum(x) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1; unlist(list(x,x)) } a b a b 1 2 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1; unlist(x) } a b 1 2 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=1,b=2) ; attr(x, "myatt") <- 1; round(exp(x), digits=5) } a b 2.71828 7.38906 attr(,"myatt") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(a=TRUE) ; attr(x, "myatt") <- 1; rep(x,2) } a a TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x <- c(hello=1, hi=9) ; attr(x, "hi") <- 2 ; sqrt(x) } hello hi 1 3 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x<-1:8; dim(x)<-c(2, 2, 2); names(x)<-101:108; attr(x, "dimnames")<-list(201:202, 203:204, 205:206); attr(x, "foo")<-"foo"; y<-x; attributes(x>y) } $dim [1] 2 2 2 $dimnames $dimnames[[1]] [1] "201" "202" $dimnames[[2]] [1] "203" "204" $dimnames[[3]] [1] "205" "206" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagation# #{ x<-1:8; dim(x)<-c(2, 2, 2); names(x)<-101:108; attr(x, "dimnames")<-list(c("201", "202"), c("203", "204"), c("205", "206")); attr(x, "foo")<-"foo"; y<-x; attributes(x>y) } $dim [1] 2 2 2 $dimnames $dimnames[[1]] [1] "201" "202" $dimnames[[2]] [1] "203" "204" $dimnames[[3]] [1] "205" "206" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testBuiltinPropagationIgnore# #{ m <- matrix(c(1,1,1,1), nrow=2) ; attr(m,"a") <- 1 ; r <- eigen(m) ; r$vectors <- round(r$vectors, digits=5) ; r } eigen() decomposition $values [1] 2 0 $vectors [,1] [,2] [1,] 0.70711 -0.70711 [2,] 0.70711 0.70711 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testCasts# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1 ; as.character(x) } [1] "1" "2" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testCasts# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1 ; as.double(x) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testCasts# #{ x <- c(a=1, b=2) ; attr(x, "myatt") <- 1 ; as.integer(x) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ attributes(NULL) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ f<-function() 42; attr(f, '.Environment')<-baseenv(); attr(f, '.Environment') } ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ f<-function() 42; attr(f, '.Environment')<-baseenv(); environment(f) } ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ f<-function() 42; attributes(f)<-list(.Environment=baseenv()); attributes(f) } $.Environment ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ f<-function() 42; attributes(f)<-list(.Environment=baseenv()); environment(f) } ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ f<-function(y) attr(y, "foo")<-NULL; x<-function() 42; attr(x, "foo")<-"foo"; s<-"bar"; switch(s, f(x)); x } function() 42 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ setClass("foo", representation(j="numeric")); x<-new("foo", j=42); attr(x, "foo")<-"foo"; y<-x; attributes(y)<-NULL; x } An object of class "foo" Slot "j": [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- "s" ; attr(x, "hi") <- 2 ; x } [1] "s" attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- 1 ; attr(x, "hi") <- 2 ; x } [1] 1 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- 1+1i ; attr(x, "hi") <- 2 ; x } [1] 1+1i attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- 1L ; attr(x, "hi") <- 2 ; x } [1] 1 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- TRUE ; attr(x, "hi") <- 2 ; x } [1] TRUE attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- as.raw(10) ; attr(x, "hi") <- 2 ; x } [1] 0a attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- c(1, 2) ; attr(x, "hi") <- 2; x } [1] 1 2 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- c(1L, 2L) ; attr(x, "hi") <- 2; attr(x, "hello") <- 1:2 ; x } [1] 1 2 attr(,"hi") [1] 2 attr(,"hello") [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- c(1L, 2L) ; attr(x, "hi") <- 2; x } [1] 1 2 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- c(hello=1) ; attr(x, "hi") <- 2 ; attr(x,"names") <- "HELLO" ; x } HELLO 1 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x <- c(hello=9) ; attr(x, "hi") <- 2 ; y <- x ; y } hello 9 attr(,"hi") [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-1:4; attributes(x)<-list(dim=c(2,2), dimnames=list(c(1,2), c(3,4))); attributes(x) } $dim [1] 2 2 $dimnames $dimnames[[1]] [1] "1" "2" $dimnames[[2]] [1] "3" "4" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-1; dim(x)<-1; y<-(attr(x, "dimnames")<-list(1)); y } [[1]] [1] "1" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-1; dim(x)<-1; y<-list(a="1"); attr(y, "foo")<-"foo"; z<-(attr(x, "dimnames")<-y); z } $a [1] "1" attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-1; dim(x)<-1; y<-list(a="1"); z<-(attr(x, "dimnames")<-y); z } $a [1] "1" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-42; attr(x, '.Environment')<-globalenv(); attr(x, '.Environment') } ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-42; attr(x, '.Environment')<-globalenv(); attr(x, '.Environment')<-NULL; environment(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-42; attr(x, '.Environment')<-globalenv(); environment(x) } ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-42; attributes(x)<-list(.Environment=globalenv()); attributes(x) } $.Environment ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-42; attributes(x)<-list(.Environment=globalenv()); attributes(x)<-NULL; environment(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-42; attributes(x)<-list(.Environment=globalenv()); environment(x) } ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-array(1:4, c(2,2), list(c(1,2), c(3,4))); attributes(x) } $dim [1] 2 2 $dimnames $dimnames[[1]] [1] "1" "2" $dimnames[[2]] [1] "3" "4" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testDefinition# #{ x<-function() 42; attr(x, "foo")<-"foo"; y<-x; attr(y, "foo")<-NULL; x } function() 42 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testLanguage# #e <- quote(x(y)); e[[1]]; typeof(e[[1]]) x [1] "symbol" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testOtherPropagation# #{ gen<-function(object) 0; setGeneric("gen"); x<-gen; attr(x, "valueClass")<-character(); res<-print(isS4(x)); removeGeneric("gen"); res } [1] TRUE [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testOtherPropagation# #{ x <- 1:2; attr(x, "hi") <- 2 ; x == x } [1] TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testOtherPropagation# #{ x<-c(1,2); attr(x, "foo")<-"foo"; y<-x; attributes(y)<-NULL; x } [1] 1 2 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testOtherPropagation#Ignored.OutputFormatting# #{ x<-matrix(1, ncol=1); y<-c(1,2,3,4); x*y } [1] 1 2 3 4 Warning message: In x * y : Recycling array of length 1 in array-vector arithmetic is deprecated. Use c() or as.vector() instead. ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testOtherPropagation# #{ xx<-c(Package="digest", Version="0.6.4"); db<-list(xx); db <- do.call("rbind", db); attributes(db) } $dim [1] 1 2 $dimnames $dimnames[[1]] NULL $dimnames[[2]] [1] "Package" "Version" ##com.oracle.truffle.r.test.library.base.TestSimpleAttributes.testOtherPropagation# #{ xx<-c(Package="digest", Version="0.6.4"); db<-list(xx); db <- rbind(db); attributes(db) } $dim [1] 1 1 $dimnames $dimnames[[1]] [1] "db" $dimnames[[2]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testAttributes#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); y<-21:28; x > y } Error: dims [product 4] do not match the length of object [8] ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testAttributes# #{ x<-1:4; names(x)<-101:104; attr(x, "foo")<-"foo"; attributes(x < 7) } $names [1] "101" "102" "103" "104" ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testAttributes# #{ x<-1:4; names(x)<-101:104; attr(x, "foo")<-"foo"; y<-21:24; names(y)<-121:124; attributes(x < y) } $names [1] "101" "102" "103" "104" ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testAttributes# #{ x<-1:4; names(x)<-101:104; x < 7 } 101 102 103 104 TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testAttributes# #{ x<-1:4; names(x)<-101:104; y<-21:24; names(y)<-121:124; x < y } 101 102 103 104 TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testAttributes# #{ x<-1:4; names(x)<-101:104; y<-21:28; attributes(x > y) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testAttributes# #{ x<-1:4; names(x)<-101:104; y<-21:28; names(y)<-121:128; attributes(y > x) } $names [1] "121" "122" "123" "124" "125" "126" "127" "128" ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testAttributes# #{ x<-1:4; names(x)<-101:104; y<-21:28; names(y)<-121:128; x < y } 121 122 123 124 125 126 127 128 TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testAttributes# #{ x<-1:4; y<-21:24; names(y)<-121:124; attributes(x > y) } $names [1] "121" "122" "123" "124" ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testAttributes# #{ x<-factor(c(a=1)); y<-factor(c(b=1)); x==y } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testMatrices# #{ m <- matrix(1:6, nrow=2) ; m > c(1,2,3) } [,1] [,2] [,3] [1,] FALSE FALSE TRUE [2,] FALSE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testMatrices# #{ matrix(1) > NA } [,1] [1,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testMatrices# #{ matrix(1) > matrix(2) } [,1] [1,] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testOther# #{ quote(a) == quote(b) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testOther# #{ quote(a+b) == quote(a+b) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testOther# #{ quote(a+b) == quote(b+b) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testOther# #{ stdin() == 0L } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ "+1+1i" > 1+1i } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ "-1+1i" > "1+1i" } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ "-1+1i" > 1+1i } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ "1+1.100i" == 1+1.100i } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ "1+1.1i" == 1+1.1i } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ "1+2i" > 1+1i } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 0/0 <= 2 } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 1+0i == 1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 1+1i == 1 } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 1+1i == TRUE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 1<=0L } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 1==1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 1==NULL } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 1L<=1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 1L==1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 2==1 } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 2L==NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 2L==TRUE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ 2L==as.double(NA) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ FALSE<=TRUE } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ FALSE=FALSE } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ TRUE>FALSE } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ as.double(NA)==2L } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ x<-1+1i; x > FALSE } Error in x > FALSE : invalid comparison with complex values ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ x<-2; f<-function(z=x) { if (z<=x) {z} else {x} } ; f(1.4)} [1] 1.4 ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ z <- TRUE; dim(z) <- c(1) ; dim(z == TRUE) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalars# #{ z <- TRUE; dim(z) <- c(1) ; u <- 1:3 ; dim(u) <- 3 ; u == z } Error in u == z : non-conformable arrays ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(0L,TRUE) ; f(0L,2L) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(0L,TRUE) ; f(2L,TRUE) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(0L,TRUE) ; f(FALSE,2) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1,2L) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2L) ; f(1,2) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2L) ; f(1L,2L) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(1L,2) ; f(1,2) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(1L,2) ; f(1L,2L) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(1L,2L) ; f(1,2) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(1L,2L) ; f(1L,2) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(TRUE,2L) ; f(0L,2L) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(TRUE,2L) ; f(FALSE,2) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(TRUE,FALSE) ; f(1L,2L) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsAsFunction# #{ f <- function(a,b) { a > b } ; f(TRUE,FALSE) ; f(TRUE,2) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsComplex# #{ 1+1i != 1+1i } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsComplex# #{ 1+1i != 1-1i } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsComplex# #{ 1+1i != 2+1i } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsComplex# #{ 1+1i == 1+1i } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsComplex# #{ 1+1i == 1-1i } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsComplex# #{ 1+1i == 2+1i } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1 ; b <- 1L[2] ; a == b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1 ; b <- a[2] ; a == b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1 ; b <- a[2] ; b > a } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1L ; b <- 1[2] ; a == b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1L ; b <- TRUE[2] ; a == b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1L ; b <- a[2] ; a == b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1L ; b <- a[2] ; b > a } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1L[2] ; b <- 1 ; a == b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1L[2] ; b <- 1 ; b > a } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1L[2] ; b <- TRUE ; a != b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- 1[2] ; b <- 1L ; b > a } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- TRUE ; b <- 1L[2] ; a > b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNA# #{ a <- TRUE[2] ; b <- 1L ; a == b } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNAAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) ; f("hello", "hi"[2]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNAAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) ; f("hello"[2], "hi") } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNAAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) ; f(2, 1L[2]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNAAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) ; f(2, 1[2]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNAAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) ; f(2L, 1L[2]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNAAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) ; f(2L, 1[2]) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNAAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) ; f(2L[2], 1) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNAAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) ; f(2L[2], 1L) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNAAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) ; f(2[2], 1) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsNAAsFunction# #{ f <- function(a,b) { a > b } ; f(1,2) ; f(1L,2) ; f(2[2], 1L) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ a <- as.raw(1) ; b <- as.raw(2) ; a < b } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ a <- as.raw(1) ; b <- as.raw(2) ; a == b } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ a <- as.raw(1) ; b <- as.raw(2) ; a > b } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ a <- as.raw(1) ; b <- as.raw(200) ; a < b } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ a <- as.raw(200) ; b <- as.raw(255) ; a < b } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ as.raw(10) <= as.raw(15) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ as.raw(10) >= as.raw(15) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ as.raw(15) != as.raw(10) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ as.raw(15) != as.raw(15) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ as.raw(15) < as.raw(10) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ as.raw(15) <= as.raw(10) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ as.raw(15) == as.raw(10) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ as.raw(15) == as.raw(15) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ as.raw(15) > as.raw(10) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsRaw# #{ as.raw(15) >= as.raw(10) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hello" != "hello" [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hello" < "hi" [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hello" <= "hi" [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hello" == "hello" [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hello" > "hi" [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hello" >= "hi" [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hi" != "hello" [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hi" < "hello" [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hi" <= "hello" [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hi" == "hello" [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hi" > "hello" [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #"hi" >= "hello" [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #{ "2.0" == 2 } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #{ "a" <= "b" } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testScalarsStrings# #{ "a" > "b" } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #as.character(list(c('ahoj'), c('svete'), '!')) == c('ahoj', 'svete', '!') [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #as.character(list(c('ahoj'), c('svete'), '!')) == list('ahoj', 'svete', '!') [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #as.character(list(c('ahoj', 'svete'), '!')) == c('ahoj', 'svete') [1] FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #c('ahoj', 'svete', '!') == list('ahoj', 'svete', '!') [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ "hi" > c("hello", "hi") } [1] TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ "hi" > c("hello", NA) } [1] TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ (1+2i)[0] == c(2+3i, 4+1i) } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ 0/0 == c(1,2,3,4) } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ 1:3 < NA } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ 1:3 < integer() } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ 1:3 == TRUE } [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ 2 != c(1,2,NA,4) } [1] TRUE FALSE NA TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ 2 == c(1,2,NA,4) } [1] FALSE TRUE NA FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ 2L > c(1L,NA,2L) } [1] TRUE NA FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ 3 != 1:2 } [1] TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ NA > 1:3 } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ NA > c("hello", "hi") } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ TRUE == 1:3 } [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ as.raw(c(1,2)) < as.raw(c(2,1,4)) } [1] TRUE FALSE TRUE Warning message: In as.raw(c(1, 2)) < as.raw(c(2, 1, 4)) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ as.raw(c(2,1,4)) < as.raw(c(1,2)) } [1] FALSE TRUE FALSE Warning message: In as.raw(c(2, 1, 4)) < as.raw(c(1, 2)) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ as.raw(c(2,1,4)) < raw() } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ b <- 1:3 ; z <- FALSE ; b[2==2] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c("cau", "ahoj") != c("hi","hello","bye") } [1] TRUE TRUE TRUE Warning message: In c("cau", "ahoj") != c("hi", "hello", "bye") : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c("hello", "hi") < NA } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c("hello", "hi") == character() } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c("hello", NA) < c("hi", NA) } [1] TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c("hello", NA) > c(NA, "hi") } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c("hello", NA) >= "hi" } [1] FALSE NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c("hi","hello","bye") > c("cau", "ahoj") } [1] TRUE TRUE FALSE Warning message: In c("hi", "hello", "bye") > c("cau", "ahoj") : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors#IncludeList.arithmetic# #{ c(0/0+1i,2+1i) == c(1+1i,2+1i) } [1] NA TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors#IncludeList.arithmetic# #{ c(1+1i,2+1i) == c(0/0+1i,2+1i) } [1] NA TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1+1i,2+2i) == c(2+1i,1+2i,1+1i) } [1] FALSE FALSE TRUE Warning message: In c(1 + (0+1i), 2 + (0+2i)) == c(2 + (0+1i), 1 + (0+2i), 1 + (0+1i)) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1+2i, 3+4i) == (1+2i)[0] } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1,2) < c(2,1,4) } [1] TRUE FALSE TRUE Warning message: In c(1, 2) < c(2, 1, 4) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1,2,3) < double() } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1,2,3,4) != c(1,NA) } [1] FALSE NA TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1,2,NA,4) != 2 } [1] TRUE FALSE NA TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1,2,NA,4) == 2 } [1] FALSE TRUE NA FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1:3,4,5)==1:5 } [1] TRUE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1L, NA) > c(NA, 2L) } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1L,2L) < c(2L,1L,4L) } [1] TRUE FALSE TRUE Warning message: In c(1L, 2L) < c(2L, 1L, 4L) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(1L,NA,2L) < 2L } [1] TRUE NA FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(2+1i,1+2i,1+1i) == c(1+1i, 2+2i) } [1] FALSE FALSE TRUE Warning message: In c(2 + (0+1i), 1 + (0+2i), 1 + (0+1i)) == c(1 + (0+1i), 2 + (0+2i)) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(2,1,4) < c(1,2) } [1] FALSE TRUE FALSE Warning message: In c(2, 1, 4) < c(1, 2) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(2L,1L,4L) < c(1L,2L) } [1] FALSE TRUE FALSE Warning message: In c(2L, 1L, 4L) < c(1L, 2L) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(TRUE, NA) > c(NA, FALSE) } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(TRUE,FALSE) < logical() } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(TRUE,FALSE,FALSE) < c(TRUE,TRUE) } [1] FALSE TRUE TRUE Warning message: In c(TRUE, FALSE, FALSE) < c(TRUE, TRUE) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ c(TRUE,TRUE) == c(TRUE,FALSE,FALSE) } [1] TRUE FALSE FALSE Warning message: In c(TRUE, TRUE) == c(TRUE, FALSE, FALSE) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ character() > c("hello", "hi") } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ double() == c(1,2,3) } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ integer() < 1:3 } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ integer() == 2L } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ list(a="1", NULL) == "bbb" } a FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ logical() == c(FALSE, FALSE) } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors#Output.IgnoreErrorContext# #{ m <- matrix(nrow=2, ncol=2, 1:4) ; m == 1:16 } Error: dims [product 4] do not match the length of object [16] ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ raw() < as.raw(c(2,1,4)) } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ x<-1+1i; y<-2+2i; x < y } Error in x < y : invalid comparison with complex values ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ x<-1+1i; y<-2+2i; x <= y } Error in x <= y : invalid comparison with complex values ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ x<-1+1i; y<-2+2i; x > y } Error in x > y : invalid comparison with complex values ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ x<-1+1i; y<-2+2i; x >= y } Error in x >= y : invalid comparison with complex values ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ x<-5;y<-4:6; x<=y } [1] FALSE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleComparison.testVectors# #{ x<-c("0","1");y<-c("a","-1"); x 1) } $x [1] FALSE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testMisc# #val <- c(1:5); deparse(data.frame(val)) [1] "structure(list(val = 1:5), class = \"data.frame\", row.names = c(NA, " [2] "-5L))" ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testMisc# #x <- data.frame(a=1:3,b=factor(c("a","b","c"))); x[2,] a b 2 2 b ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testMisc# #{ y<-data.frame(7); as.logical(y) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testMisc#Output.IgnoreErrorContext# #{ y<-data.frame(c(1,2,3)); as.logical(y) } Error: 'list' object cannot be coerced to type 'logical' ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testMisc# #{ y<-data.frame(c(1,2,3)); length(y) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testMisc# #{ y<-data.frame(integer()); as.logical(y) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testPrint# #{ n = c(2, 3, 5); s = c(TRUE, FALSE, TRUE); df = data.frame(n, s); df } n s 1 2 TRUE 2 3 FALSE 3 5 TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testPrint# #{ x<-c(1,2); class(x)<-"data.frame"; row.names(x)<-integer(); x } NULL <0 rows> (or 0-length row.names) ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testPrint# #{ x<-c(1,2); y<-data.frame(x); y } x 1 1 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testPrint# #{ x<-c(7,42); y<-data.frame(x); y } x 1 7 2 42 ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testPrint# #{ x<-data.frame(n=c("2", "3", "5"), s=c("TRUE", "FALSE", "TRUE"), check.names=FALSE, row.names=c("1", "2", "3")); x } n s 1 2 TRUE 2 3 FALSE 3 5 TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testPrint# #{ x<-integer(); class(x)<-"data.frame"; x } data frame with 0 columns and 0 rows ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testPrint# #{x<-c(1,2); class(x)<-"data.frame"; x} NULL <0 rows> (or 0-length row.names) ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-2; row.names(x)<-NULL; attributes(x) } $dim [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-2; row.names(x)<-NULL; row.names(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-2; row.names(x)<-c(7, 42); attributes(x) } $dim [1] 2 $dimnames $dimnames[[1]] [1] "7" "42" ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-2; row.names(x)<-c(7, 42); row.names(x) } [1] "7" "42" ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-2; row.names(x)<-logical(); attributes(x) } $dim [1] 2 $dimnames $dimnames[[1]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-2; row.names(x)<-logical(); row.names(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(1,2); dimnames(x)<-list(1.1, c(2.2, 3.3)); class(x)<-"data.frame"; row.names(x) } character(0) ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(1,2); dimnames(x)<-list(1.1, c(2.2, 3.3)); class(x)<-"data.frame"; row.names(x)<-"r1"; row.names(x) } [1] "r1" ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(1,2); dimnames(x)<-list(1.1, c(2.2, 3.3)); row.names(x)<-7; attributes(x) } $dim [1] 1 2 $dimnames $dimnames[[1]] [1] "7" $dimnames[[2]] [1] "2.2" "3.3" ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(1,2); dimnames(x)<-list(1.1, c(2.2, 3.3)); row.names(x)<-7; row.names(x) } [1] "7" ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(1,2); dimnames(x)<-list(1.1, c(2.2, 3.3)); row.names(x)<-NULL; attributes(x) } $dim [1] 1 2 $dimnames $dimnames[[1]] NULL $dimnames[[2]] [1] "2.2" "3.3" ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(1,2); dimnames(x)<-list(1.1, c(2.2, 3.3)); row.names(x)<-NULL; row.names(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(1,2); dimnames(x)<-list(1.1, c(2.2, 3.3)); row.names(x)<-logical(); attributes(x) } $dim [1] 1 2 $dimnames $dimnames[[1]] NULL $dimnames[[2]] [1] "2.2" "3.3" ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(1,2); dimnames(x)<-list(1.1, c(2.2, 3.3)); row.names(x)<-logical(); row.names(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(2,1); dimnames(x)<-list(c(2.2, 3.3), 1.1); row.names(x)<-7; attributess(x) } Error in dimnames(x) <- dn : length of 'dimnames' [1] not equal to array extent ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(2,1); dimnames(x)<-list(c(2.2, 3.3), 1.1); row.names(x)<-7; row.names(x) } Error in dimnames(x) <- dn : length of 'dimnames' [1] not equal to array extent ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(2,1); dimnames(x)<-list(c(2.2, 3.3), 1.1); row.names(x)<-c(7, 42); attributes(x) } $dim [1] 2 1 $dimnames $dimnames[[1]] [1] "7" "42" $dimnames[[2]] [1] "1.1" ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); dim(x)<-c(2,1); dimnames(x)<-list(c(2.2, 3.3), 1.1); row.names(x)<-c(7, 42); row.names(x) } [1] "7" "42" ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); row.names(x)<-NULL; attributes(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); row.names(x)<-c(7, 42); attributes(x) } Error in `rownames<-`(x, value) : attempt to set 'rownames' on an object with no dimensions ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2); row.names(x)<-logical(); attributes(x) } Error in `rownames<-`(x, value) : attempt to set 'rownames' on an object with no dimensions ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2,3); y<-c(4,5); z<-list(x, y); class(z)<-"data.frame"; row.names(z)<-NULL; attributes(z) } $class [1] "data.frame" $row.names integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2,3); y<-c(4,5); z<-list(x, y); class(z)<-"data.frame"; row.names(z)<-c("a", "b"); row.names(z)<-NULL; attributes(z) } $class [1] "data.frame" $row.names [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testRowNames# #{ x<-c(1,2,3); y<-c(4,5); z<-list(x, y); class(z)<-"data.frame"; row.names(z)<-c("a", "b", "c"); row.names(z)<-NULL; attributes(z) } $class [1] "data.frame" $row.names [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testUpdate# #{ n = c(2, 3, 5); s = c("aa", "bb", "cc"); df = data.frame(n, s); df[[1]] <- c(22,33,55); df } n s 1 22 aa 2 33 bb 3 55 cc ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testUpdate# #{ x<-data.frame(c(1,2), c(3,4)); x[c(1,2)]<-list(c(11,12), c(13,14)); x } c.1..2. c.3..4. 1 11 13 2 12 14 ##com.oracle.truffle.r.test.library.base.TestSimpleDataFrames.testUpdate# #{ x<-data.frame(c(1,2), c(3,4), c(5,6)); x[c(1,2, 3)]<-list(c(11,12), c(13,14), c(15,16)); x } c.1..2. c.3..4. c.5..6. 1 11 13 15 2 12 14 16 ##com.oracle.truffle.r.test.library.base.TestSimpleErrorHandling.testError# #{ nonExistentVariable } Error: object 'nonExistentVariable' not found ##com.oracle.truffle.r.test.library.base.TestSimpleErrorHandling.testError#Context.NonShared# #{ options(error=quote(cat(23,'\n'))) ; v } Error: object 'v' not found 23 ##com.oracle.truffle.r.test.library.base.TestSimpleErrorHandling.testError#Context.NonShared# #{ x <- 2 ; options(error=quote(cat(x,'\n'))) ; v } Error: object 'v' not found 2 ##com.oracle.truffle.r.test.library.base.TestSimpleFormulae.testCreation# #{ class(a~b) } [1] "formula" ##com.oracle.truffle.r.test.library.base.TestSimpleFormulae.testCreation# #{ typeof(a~b) } [1] "language" ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ f <- function(a) { if (is.na(a)) { 1 } else { 2 } } ; f(5) ; f(1:3)} [1] 2 Warning message: In if (is.na(a)) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ f <- function(cond) { if (cond) { TRUE } else { 2 } } ; f(c(TRUE,FALSE)) ; f(1) } [1] TRUE Warning message: In if (cond) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ f <- function(cond) { if (cond) { TRUE } else { 2 } } ; f(c(TRUE,FALSE)) ; f(FALSE) } [1] 2 Warning message: In if (cond) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ f <- function(cond) { if (cond) { TRUE } else { 2 } } ; f(logical()) } Error in if (cond) { : argument is of length zero ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ f <- function(cond) { if (cond) { TRUE } else { 2 } } ; f(1:3) ; f(2) } [1] TRUE Warning message: In if (cond) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ if (1:3) { TRUE } } [1] TRUE Warning message: In if (1:3) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ if (1[2:1]) { TRUE } } Error in if (1[2:1]) { : argument is not interpretable as logical In addition: Warning message: In if (1[2:1]) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ if (c(0,0,0)) { TRUE } else { 2 } } [1] 2 Warning message: In if (c(0, 0, 0)) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ if (c(0L,0L,0L)) { TRUE } else { 2 } } [1] 2 Warning message: In if (c(0L, 0L, 0L)) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ if (c(1L,0L,0L)) { TRUE } else { 2 } } [1] TRUE Warning message: In if (c(1L, 0L, 0L)) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ if (c(1L[2],0L,0L)) { TRUE } else { 2 } } Error in if (c(1L[2], 0L, 0L)) { : argument is not interpretable as logical In addition: Warning message: In if (c(1L[2], 0L, 0L)) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testCast# #{ if (integer()) { TRUE } } Error in if (integer()) { : argument is of length zero ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ f <- function(v) { if (FALSE==v) TRUE else FALSE } ; f(TRUE) ; f(1) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ f <- function(x) { if (x == 2) 1 else 2 } ; f(1) ; f(NA) } Error in if (x == 2) 1 else 2 : missing value where TRUE/FALSE needed ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ f <- function(x) { if (x) 1 else 2 } ; f(1) ; f("hello") } Error in if (x) 1 else 2 : argument is not interpretable as logical ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ f <- function(x) { if (x) 1 else 2 } ; f(1) ; f(FALSE) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ f <- function(x) { if (x) 1 else 2 } ; f(1) ; f(NA) } Error in if (x) 1 else 2 : missing value where TRUE/FALSE needed ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ f <- function(x) { if (x) 1 else 2 } ; f(1) ; f(TRUE) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ f <- function(x) { if (x) 1 else 2 } ; f(1) ; f(logical()) } Error in if (x) 1 else 2 : argument is of length zero ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ f <- function(x) { if (x) 1 else 2 } ; f(NA) } Error in if (x) 1 else 2 : missing value where TRUE/FALSE needed ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ if (!(7+42i)) TRUE else FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ if (FALSE==1) TRUE else FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ if (FALSE==TRUE) TRUE else FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ if (NA == TRUE) TRUE else FALSE } Error in if (NA == TRUE) TRUE else FALSE : missing value where TRUE/FALSE needed ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ if (TRUE == NA) TRUE else FALSE } Error in if (TRUE == NA) TRUE else FALSE : missing value where TRUE/FALSE needed ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ if (TRUE==FALSE) TRUE else FALSE } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ x <- 2 ; if (1==x) TRUE else 2 } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ x <- 2 ; if (NA) x <- 3 ; x } Error in if (NA) x <- 3 : missing value where TRUE/FALSE needed ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf# #{ x<-list(1,2); if (x) 7 else 42 } Error in if (x) 7 else 42 : argument is not interpretable as logical In addition: Warning message: In if (x) 7 else 42 : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf2# #if(FALSE) 1 else 2 [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIf2# #if(TRUE) 1 else 2 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfDanglingElse# #if(TRUE) if (FALSE) 1 else 2 [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfDanglingElseIgnore# #if(FALSE) if (FALSE) 1 else 2 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfIgnore# #{ f <- function(x) { if (x) 1 else 2 } ; f(1) ; f(1:3) } [1] 1 Warning message: In if (x) 1 else 2 : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfNot1# #if(!FALSE) 1 else 2 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfNot1# #if(!TRUE) 1 else 2 [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfVisibility# #{ if (FALSE) 23 else NULL } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfVisibility# #{ if (FALSE) 23 else invisible(23) } ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfVisibility# #{ if (FALSE) 23 } ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfVisibility# #{ if (TRUE) invisible(23) else 23 } ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfVisibility# #{ if (TRUE) invisible(23) } ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfWithoutElse# #if(TRUE) 1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testIfWithoutElseIgnore# #if(FALSE) 1 ##com.oracle.truffle.r.test.library.base.TestSimpleIfEvaluator.testInvalidCondition# #{ f <- function() TRUE; if (f) 'unexpected' } Error in if (f) "unexpected" : argument is not interpretable as logical ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testAvoidingCopying# #a<-list(); a$x <- c(1,2,3); ident <- function(q)q; invisible(tracemem(a$x)); a$x[[1]] <- ident(a$x[[2]]); a$x [1] 2 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testAvoidingCopying# #a<-list(); a$x <- c(1,2,3); invisible(tracemem(a$x)); a$x[[1]] <- a$x[[2]] * 3; a$x [1] 6 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testAvoidingCopying# #a<-list(); a$x <- c(1,2,3); invisible(tracemem(a$x)); a$y <- 'dummy'; a$x[[1]] <- a$x[[2]] * 3; a$x [1] 6 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testAvoidingCopying# #l <- list(); l$x <- c(NA); length(l$x) <- 10; l$x[1] <- 42; invisible(tracemem(l$x)); l$x[2:9] <- 42; ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testAvoidingCopying# #l <- list(x=c(NA,NA)); l$x[1] <- 42; invisible(tracemem(l$x)); l$x[2] <- 42; ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testAvoidingCopying# #x <- list(c(1,2,3)); invisible(tracemem(x)); x[[1]] <- 42; ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testAvoidingCopying# #z <- c(1,4,8); invisible(tracemem(z)); a<-list(); a$x <- z; ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess#Output.IgnoreErrorContext# #{ a <- list(1,2,3) ; x <- integer() ; a[[x]] } Error in a[[x]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ a <- list(1,2,3) ; x <- integer() ; a[x] } list() ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ a <- list(1,NULL,list()) ; a[3] } [[1]] list() ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ a <- list(1,NULL,list()) ; a[[3]] } list() ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ a <- list(1,NULL,list()) ; typeof(a[3]) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ a <- list(1,NULL,list()) ; typeof(a[[3]]) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; l[-2] } [[1]] [1] 1 [[2]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; l[-5] } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; l[0] } list() ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; l[5] } [[1]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; l[NA] } [[1]] NULL [[2]] NULL [[3]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; l[NaN] } [[1]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess#Output.IgnoreErrorMessage# #{ l <- list(1,2,3) ; l[[-2]] } Error in l[[-2]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess#Output.IgnoreErrorMessage# #{ l <- list(1,2,3) ; l[[-5]] } Error in l[[-5]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess#Output.IgnoreErrorContext# #{ l <- list(1,2,3) ; l[[0]] } Error in l[[0]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; l[[5]] } Error in l[[5]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; l[[NA]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; l[[NaN]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; typeof(l[-2]) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; typeof(l[5]) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; typeof(l[NA]) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; typeof(l[NaN]) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; typeof(l[[NA]]) } [1] "NULL" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(1,2,3) ; typeof(l[[NaN]]) } [1] "NULL" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(c(1,2,3),"eep") ; l[[1]] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListAccess# #{ l <- list(c(1,2,3),"eep") ; l[[2]] } [1] "eep" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListArgumentEvaluation# #{ a <- c(0,0,0) ; f <- function() { g <- function() { a[2] <<- 9 } ; g() } ; u <- function() { a <- c(1,1,1) ; f() ; a } ; list(a,u()) } [[1]] [1] 0 0 0 [[2]] [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCombine# #{ a <- c(1,2,list(3,4),5) ; a } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 [[4]] [1] 4 [[5]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCombine# #{ a <- c(1,2,list(3,4),5) ; a[3] } [[1]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCombine# #{ a <- c(1,2,list(3,4),5) ; a[[3]] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCombine# #{ a <- c(1,2,list(3,4),5) ; typeof(a) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCombine# #{ a <- c(1,2,list(3,4),5) ; typeof(a[3]) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCombine# #{ a <- c(1,2,list(3,4),5) ; typeof(a[[3]]) } [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCombine# #{ a <- c(list(1)) ; typeof(a) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCombine# #{ a <- c(list(1)) ; typeof(a[1]) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCombine# #{ a <- c(list(1)) ; typeof(a[[1]]) } [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCreation# #{ list() } list() ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCreation# #{ list(1,NULL,list()) } [[1]] [1] 1 [[2]] NULL [[3]] list() ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListCreation# #{ list(list(),list()) } [[1]] list() [[2]] list() ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListDuplication# #if (!any(R.version$engine == "FastR")) { FALSE } else { l <- list(x=c(3,4,5)); id <- .fastr.identity(l$x); l$x <- 1:10; id == .fastr.identity(l$x) } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListDuplication# #if (!any(R.version$engine == "FastR")) { TRUE } else { l <- list(x=c(3,4,5)); id <- .fastr.identity(l$x); l$x[2] <- 10; id == .fastr.identity(l$x) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListDuplication# #if (!any(R.version$engine == "FastR")) { TRUE } else { l <- list(x=c(3,4,5)); id <- .fastr.identity(l); l$x[2] <- 10; id == .fastr.identity(l) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #a <- list(); a$x <- c(1,2,3); b <- a; a$x[[1]] <- 4; b $x [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #a <- list(); a$y <- 'dummy'; a$x <- c(1,2,3); b <- a; a$x[[1]] <- 4; b $y [1] "dummy" $x [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #a <- list(); a$y <- 'dummy'; b <- a; a$x <- c(1,2,3); a$x[[1]] <- 4; b $y [1] "dummy" ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #a <- list(x=1); b <- a; a$x[[1]] <- 42; list(a=a,b=b) $a $a$x [1] 42 $b $b$x [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #a <- list(x=c(1,2,10)); b <- list(); b$x <- c(1,42); swap <- a; a <- b; b <- swap; a$x[[2]] <- 3; list(a=a, b=b) $a $a$x [1] 1 3 $b $b$x [1] 1 2 10 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #a <- list(x=c(1,2,3)); b <- a; a$x[[1]] <- 4; b $x [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #a <- list(x=list(y=c(1,2,4))); b <- a$x; b$y[[1]] <- 42; list(a=a,b=b) $a $a$x $a$x$y [1] 1 2 4 $b $b$y [1] 42 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #a <- list(x=list(y=c(1,2,4))); b <- a$x; c <- b; c$y[[1]] <- 42; list(a=a,b=b,c=c) $a $a$x $a$x$y [1] 1 2 4 $b $b$y [1] 1 2 4 $c $c$y [1] 42 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #a <- list(x=list(y=c(1,2,4))); b <- a; b$x$y[[1]] <- 42; list(a=a,b=b) $a $a$x $a$x$y [1] 1 2 4 $b $b$x $b$x$y [1] 42 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #f <- function(l) l$x[[1]]<-42; a <- list(x=c(1,2,4)); b <- a; f(b); list(a=a, b=b) $a $a$x [1] 1 2 4 $b $b$x [1] 1 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #f <- function(l) l$x[[1]]<-42; a <- list(x=c(1,2,4)); f(a); a $x [1] 1 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #f <- function(l) l; a <- list(x=c(1,2,4)); b <- f(a); b$x[[1]] <- 42; list(a=a, b=b) $a $a$x [1] 1 2 4 $b $b$x [1] 42 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #l <- list(k=list()); k <- list(l=list()); l$k <- k; k$l <- l; k$l$x <- 42; list(k=k, l=l) $k $k$l $k$l$k $k$l$k$l list() $k$l$x [1] 42 $l $l$k $l$k$l list() ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #l <- list(k=list()); k <- list(x=c(1,10)); l$k <- k; l$k$x[1] <- 42; list(l_k=l$k$x, k=k$x); $l_k [1] 42 10 $k [1] 1 10 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting#Ignored.Unimplemented# #l <- list(list(list())); l[[1]][[1]] <- l; l [[1]] [[1]][[1]] [[1]][[1]][[1]] [[1]][[1]][[1]][[1]] list() ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #l <- list(x=list()); v <- list(y=42,x=list()); v$x <- l; l$x <- v; l$y <- 44; k <- v; k$y <- 45; list(l=l,v=v,k=k); $l $l$x $l$x$y [1] 42 $l$x$x $l$x$x$x list() $l$y [1] 44 $v $v$y [1] 42 $v$x $v$x$x list() $k $k$y [1] 45 $k$x $k$x$x list() ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #r <- split(1,1); r[[1]] / 2; r; [1] 0.5 $`1` [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #r <- split(1,1); x <- r; r[[1]] <- 42; x; $`1` [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #x <- c(1,2,3); l <- list(x); x[[1]] <- 42; l; [[1]] [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListRefcounting# #z <- c(1,4,8); a<-list(); a$x <- z; a$x[[1]] <- 42; list(a=a, z=z) $a $a$x [1] 42 4 8 $z [1] 1 4 8 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListUpdate# #{ l <- list(42); l[1][1] <- 7; l } [[1]] [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListUpdate# #{ l <- list(c(1,2,3),c(4,5,6)) ; l[[1]] <- c(7,8,9) ; l[[1]] } [1] 7 8 9 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListUpdate# #{ l <- list(c(42)); idx <- TRUE; l[idx] <- list(c(1,2,3)); l } [[1]] [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListUpdate# #{ l <- list(c(42)); l[1][1] <- 7; l } [[1]] [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testListUpdate# #{ l <- list(c(42, 43)); l[[1]][1] <- 7; l } [[1]] [1] 7 43 ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testNullListAssignment# #a<- NULL; a <- `$<-`(a, "a", 1); dput(a) list(a = 1) ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testNullListAssignment# #a<- NULL; a <- `$<-`(a, 1, 1); dput(a) Error in `$<-`(a, 1, 1) : invalid subscript type 'double' ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testNullListAssignment# #a<- NULL; a <- `[[<-`(a, 'a', 1); a <-`[[<-`(a, 'b', 1); dput(a) list(a = 1, b = 1) ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testNullListAssignment# #a<- NULL; a <- `[[<-`(a, 'a', 1); dput(a) list(a = 1) ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testNullListAssignment# #a<- NULL; a <- `[[<-`(a, 1, 1); dput(a) list(1) ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testNullListAssignment# #a<-NULL; a$b<-42L; dput(a) list(b = 42L) ##com.oracle.truffle.r.test.library.base.TestSimpleLists.testNullListAssignment# #a<-NULL; a$b<-print; dput(a) list(b = function (x, ...) UseMethod("print")) ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testDynamic# #{ l <- quote({x <- 0 ; for(i in 1:10) { x <- x + i } ; x}) ; f <- function() { eval(l) } ; x <<- 10 ; f() } [1] 55 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testFactorial# #{ f<-function(i) { if (i<=1) {1} else {r<-i; for(j in 2:(i-1)) {r=r*j}; r} }; f(10) } [1] 3628800 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testFibonacci# #{ f<-function(i) { x<-integer(i); x[1]<-1; x[2]<-1; if (i>2) { for(j in 3:i) { x[j]<-x[j-1]+x[j-2] } }; x[i] } ; f(32) } [1] 2178309 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testForSequenceDescending# #{ sum <- 0; for (i in 3:1) { sum <- sum + i; }; sum; } [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops1# #{ f<-function(r) { x<-0 ; for(i in r) { x<-x+i } ; x } ; f(1:10) ; f(c(1,2,3,4,5)) } [1] 15 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops1# #{ f<-function(r) { x<-0 ; for(i in r) { x<-x+i } ; x } ; f(c(1,2,3,4,5)) ; f(1:10) } [1] 55 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops1# #{ for(i in c(1,2)) { x <- i } ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops1# #{ r <- "" ; for (s in c("Hello", "world")) r <- paste(r, s) ; r } [1] " Hello world" ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops1# #{ x<-1 ; for(i in 1:10) { x<-x+1 } ; x } [1] 11 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops1# #{ x<-1 ; repeat { x <- x + 1 ; if (x <= 11) { next } else { break } ; x <- 1024 } ; x } [1] 12 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops1# #{ x<-1 ; repeat { x <- x + 1 ; if (x > 11) { break } } ; x } [1] 12 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops1# #{ x<-1 ; while(TRUE) { x <- x + 1 ; if (x > 11) { break } } ; x } [1] 12 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops1# #{ x<-1 ; while(x <= 10) { x<-x+1 } ; x } [1] 11 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops1# #{ x<-210 ; repeat { x <- x + 1 ; break } ; x } [1] 211 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops3# #{ l <- quote(for(i in s) { x <- i }) ; s <- 1:3 ; eval(l) ; s <- 2:1 ; eval(l) ; x } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops3# #{ l <- quote(for(i in s) { x <- i }) ; s <- 1:3 ; eval(l) ; s <- NULL ; eval(l) ; x } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops3# #{ l <- quote({ for(i in 1:4) { if (i == 1) { next } ; if (i==3) { break } ; x <- i ; if (i==4) { x <- 10 } } ; x }) ; f <- function() { eval(l) } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops3# #{ l <- quote({ for(i in c(1,2,3,4)) { if (i == 1) { next } ; if (i==3) { break } ; x <- i ; if (i==4) { x <- 10 } } ; x }) ; f <- function() { eval(l) } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops3# #{ l <- quote({for(i in c(1,2)) { x <- i } ; x }) ; f <- function() { eval(l) } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoops3# #{ l <- quote({for(i in c(2,1)) { x <- i } ; x }) ; f <- function() { if (FALSE) i <- 2 ; eval(l) } ; f() } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsBreakNext# #{ f <- function() { for(i in 1:4) { if (i == 1) { next } ; if (i==3) { break } ; x <- i ; if (i==4) { x <- 10 } } ; x } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsBreakNext# #{ f <- function() { for(i in c(1,2,3,4)) { if (i == 1) { next } ; if (i==3) { break } ; x <- i ; if (i==4) { x <- 10 } } ; x } ; f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsBreakNext# #{ f <- function(s) { for(i in s) { if (i == 1) { next } ; if (i==3) { break } ; x <- i ; if (i==4) { x <- 10 } } ; x } ; f(2:1) ; f(c(1,2,3,4)) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsBreakNext# #{ for(i in 1:4) { if (i == 1) { next } ; if (i==3) { break } ; x <- i ; if (i==4) { x <- 10 } } ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsBreakNext# #{ for(i in c(1,2,3,4)) { if (i == 1) { next } ; if (i==3) { break } ; x <- i ; if (i==4) { x <- 10 } } ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsBreakNext# #{ i <- 0L ; while(i < 3L) { i <- i + 1 ; if (i == 1) { next } ; if (i==3) { break } ; x <- i ; if (i==4) { x <- 10 } } ; x } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsBreakNext# #{ x <- repeat tryCatch({break}, handler = function(e) NULL) } ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsErrors# #{ break(); } Error: no loop for break/next, jumping to top level ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsErrors# #{ break(1,2,3); } Error: no loop for break/next, jumping to top level ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsErrors# #{ break; } Error: no loop for break/next, jumping to top level ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsErrors# #{ next(); } Error: no loop for break/next, jumping to top level ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsErrors# #{ next(1,2,$$); } Error: unexpected '$' in "{ next(1,2,$" ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsErrors# #{ next; } Error: no loop for break/next, jumping to top level ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsErrors# #{ while (1 < NA) { 1 } } Error in while (1 < NA) { : missing value where TRUE/FALSE needed ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsErrorsIgnore#Output.IgnoreErrorMessage# #{ l <- function(s) { for(i in s) { x <- i } ; x } ; l(1:3) ; s <- function(){} ; l(s) ; x } Error in for (i in s) { : invalid for() loop sequence ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsErrorsIgnore#Output.IgnoreErrorMessage# #{ l <- quote(for(i in s) { x <- i }) ; s <- 1:3 ; eval(l) ; s <- function(){} ; eval(l) ; x } Error in for (i in s) { : invalid for() loop sequence ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testLoopsErrorsIgnore#Output.IgnoreErrorMessage# #{ l <- quote({ for(i in s) { x <- i } ; x }) ; f <- function(s) { eval(l) } ; f(1:3) ; s <- function(){} ; f(s) ; x } Error in for (i in s) { : invalid for() loop sequence ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testNoLoopIteration# #{ for (loopcontrolvar in numeric(0)) { print('should not reach here') }; print(loopcontrolvar) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testOneIterationLoops# #{ for (a in "xyz") cat(a) } xyz ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testOneIterationLoops# #{ for (a in 1) cat(a) } 1 ##com.oracle.truffle.r.test.library.base.TestSimpleLoop.testOneIterationLoops# #{ for (a in 1L) cat(a) } 1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessDim# #{ x<-1:10; dim(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessDim# #{ x<-1; dim(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessDim# #{ x<-1L; dim(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessDim# #{ x<-FALSE; dim(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessDim# #{ x<-TRUE; dim(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessDim# #{ x<-c(1, 2, 3); dim(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessDim# #{ x<-c(1L, 2L, 3L); dim(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #x<-(1:8); dim(x)<-c(2, 4); x[c(-1, -2),c(-1, -2, -3, -4)] <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2, 4); x[c(-1, -2),c(-1, -2, -3, -4)] <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2, 4); x[c(-1, -2),c(-1, -2, -3, -4)] <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[, 0] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[-1, 0] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, -1] } b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, 1] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, ] } a b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1)] } a a a ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, 0] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, ] } a b c d 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, c(1,3)] } a c 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[c(1,1,1), 0] } z z z ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "d", "e")); x[1, c(1,3)] } a d 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2, 2); x[, -1] } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2, 2); x[, -3] } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2, 2); x[-1, ] } [1] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2, 2); x[-3, ] } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[1, NA] } NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[1, c(1,NA)] } c 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[NA, 1] } NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, 1), c(1,NA)] } c a 1 NA a 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, NA), c(1,NA)] } c a 1 NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1,NA), 1] } a 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); x[,0] } [1,] [2,] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); x[-1, -1] } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); x[0,] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); x[1,1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); x[1,2] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); x[c(1, NA), ] } [,1] [,2] [1,] 1 3 [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); x[c(1, NaN), ] } [,1] [,2] [1,] 1 3 [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); x[c(TRUE, NA), ] } [,1] [,2] [1,] 1 3 [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); dim(x)<-c(2,2); x[c(TRUE, NaN), ] } [,1] [,2] [1,] 1 3 [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); x<-1:4; dim(x)<-c(2,2); x[NA, ] } [,1] [,2] [1,] NA NA [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:4); x<-1:4; dim(x)<-c(2,2); x[NaN, ] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2, 4); x[c(-1, -2),c(-1)] } [,1] [,2] [,3] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2, 4); x[c(-1, -2),c(-1, -2)] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2, 4); x[c(-1, -2),c(-1, -2, -3)] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2, 4); x[c(-1, -2),c(0)] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2, 4); x[c(-1, -2),c(1)] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2, 4); x[c(-1, -2),c(1, 2)] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[,0] } [1,] [2,] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[-1,0] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[-2,0] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[0,-1] } [,1] [,2] [,3] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[0,-2] } [,1] [,2] [,3] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[0,0] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[0,1] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[0,] } [,1] [,2] [,3] [,4] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[1, c(1, NA)] } [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[1, c(NA, NA)] } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(2,4); x[1,0] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(4,2); x[-1, 1] } [1] 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(4,2); x[0,1] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(4,2); x[0,2] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(4,2); x[1, -1] } [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(4,2); x[1,0] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-(1:8); dim(x)<-c(4,2); x[2,0] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:16; dim(x)<-c(4,4); x[-1,-2] } [,1] [,2] [,3] [1,] 2 10 14 [2,] 3 11 15 [3,] 4 12 16 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:16; dim(x)<-c(4,4); x[-1,c(1,1,2,3)] } [,1] [,2] [,3] [,4] [1,] 2 2 6 10 [2,] 3 3 7 11 [3,] 4 4 8 12 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:2; dim(x)<-c(1:2); dimnames(x)<-list("z", c("a", "b")); x["z", 1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:2; dim(x)<-c(1:2); dimnames(x)<-list("z", c("a", "b")); x[c("z", "z"), 1] } z z 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("d", "e")); x["b", 1] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("d", "e")); x["d", 1] } Error in x["d", 1] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("d", "e")); x[1, 1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("d", "e")); x[as.character(NA), 1] } Error in x[as.character(NA), 1] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("d", "e")); x[c("a", "a"), 1] } a a 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("d", "e")); x[c("a", "b"), 1] } a b 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("d", "e")); x[c("b"), 1] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("d", "e")); x[c(1,1), 1] } a a 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("d", "e")); x[c(1,2), 1] } a b 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("d", "e")); x[c(1,2,1), 1] } a b a 1 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(2,2); x[1,3] } Error in x[1, 3] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(4,1); dimnames(x)<-list(c("a", "b", "c", "d"), "z"); x[, 1] } a b c d 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:4; dim(x)<-c(4,1); dimnames(x)<-list(c("a", "b", "c", "d"), "z"); x[c(2,4), 1] } b d 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:8; dim(x)<-c(2, 4); x[c(-1, -2),c(5)] } Error in x[c(-1, -2), c(5)] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:8; dim(x)<-c(2,2,2); x[1, 2] } Error in x[1, 2] : incorrect number of dimensions ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:8; dim(x)<-c(2,4); x[1, FALSE] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:8; dim(x)<-c(2,4); x[1, TRUE] } [1] 1 3 5 7 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:8; dim(x)<-c(2,4); x[1, c(TRUE, FALSE, TRUE)] } [1] 1 5 7 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:8; dim(x)<-c(2,4); x[1, c(TRUE, FALSE, TRUE, FALSE)] } [1] 1 5 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:8; dim(x)<-c(2,4); x[1, c(TRUE, FALSE, TRUE, TRUE, TRUE)] } Error in x[1, c(TRUE, FALSE, TRUE, TRUE, TRUE)] : (subscript) logical subscript too long ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-1:8; x[1, 2] } Error in x[1, 2] : incorrect number of dimensions ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[, 0] } character(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[-1, 0] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, -1] } b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, 1] } character(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, ] } a b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1)] } a a a ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, 0] } character(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, ] } a b c d "a" "b" "c" "d" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, c(1,3)] } a c "a" "c" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[c(1,1,1), 0] } z z z ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "d", "e")); x[1, c(1,3)] } a d "a" "c" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2, 2); x[, -1] } [1] "c" "d" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2, 2); x[, -3] } [,1] [,2] [1,] "a" "c" [2,] "b" "d" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2, 2); x[-1, ] } [1] "b" "d" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2, 2); x[-3, ] } [,1] [,2] [1,] "a" "c" [2,] "b" "d" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2, 2); x[1, 1] } [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[1, c(1,NA)] } c "a" NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, 1), c(1,NA)] } c a "a" NA a "a" NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, NA), c(1,NA)] } c a "a" NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1,NA), 1] } a "a" NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); x[,0] } [1,] [2,] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); x[-1, -1] } [1] "d" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); x[0,] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); x[1,1] } [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); x[1,2] } [1] "c" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); x[c(1, NA), ] } [,1] [,2] [1,] "a" "c" [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); x[c(1, NaN), ] } [,1] [,2] [1,] "a" "c" [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); x[c(TRUE, NA), ] } [,1] [,2] [1,] "a" "c" [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(2,2); x[c(TRUE, NaN), ] } [,1] [,2] [1,] "a" "c" [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); x<-1:4; dim(x)<-c(2,2); x[NA, ] } [,1] [,2] [1,] NA NA [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c("a", "b", "c", "d"); x<-1:4; dim(x)<-c(2,2); x[NaN, ] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[, 0] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[-1, 0] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, -1] } b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, 1] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, ] } a b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1)] } a a a ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, 0] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, ] } a b c d 1+1i 2+2i 3+3i 4+4i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, c(1,3)] } a c 1+1i 3+3i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[c(1,1,1), 0] } z z z ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "d", "e")); x[1, c(1,3)] } a d 1+1i 3+3i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2, 2); x[, -1] } [1] 3+3i 4+4i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2, 2); x[, -3] } [,1] [,2] [1,] 1+1i 3+3i [2,] 2+2i 4+4i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2, 2); x[-1, ] } [1] 2+2i 4+4i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2, 2); x[-3, ] } [,1] [,2] [1,] 1+1i 3+3i [2,] 2+2i 4+4i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2, 2); x[1, 1] } [1] 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[1, c(1,NA)] } c 1+1i NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, 1), c(1,NA)] } c a 1+1i NA a 1+1i NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, NA), c(1,NA)] } c a 1+1i NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1,NA), 1] } a 1+1i NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); x[,0] } [1,] [2,] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); x[-1, -1] } [1] 4+4i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); x[0,] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); x[1,1] } [1] 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); x[1,2] } [1] 3+3i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); x[c(1, NA), ] } [,1] [,2] [1,] 1+1i 3+3i [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); x[c(1, NaN), ] } [,1] [,2] [1,] 1+1i 3+3i [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); x[c(TRUE, NA), ] } [,1] [,2] [1,] 1+1i 3+3i [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(2,2); x[c(TRUE, NaN), ] } [,1] [,2] [1,] 1+1i 3+3i [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); x<-1:4; dim(x)<-c(2,2); x[NA, ] } [,1] [,2] [1,] NA NA [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); x<-1:4; dim(x)<-c(2,2); x[NaN, ] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2, 4); x[c(-1, -2),c(-1)] } [,1] [,2] [,3] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2, 4); x[c(-1, -2),c(-1, -2)] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2, 4); x[c(-1, -2),c(-1, -2, -3)] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2, 4); x[c(-1, -2),c(0)] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2, 4); x[c(-1, -2),c(1)] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2, 4); x[c(-1, -2),c(1, 2)] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2,4); x[,0] } [1,] [2,] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2,4); x[-1,0] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2,4); x[-2,0] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2,4); x[0,-1] } [,1] [,2] [,3] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2,4); x[0,-2] } [,1] [,2] [,3] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2,4); x[0,0] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2,4); x[0,1] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2,4); x[0,] } [,1] [,2] [,3] [,4] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(2,4); x[1,0] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(4,2); x[-1, 1] } [1] 2+2i 3+3i 4+4i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(4,2); x[0,1] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(4,2); x[0,2] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(4,2); x[1, -1] } [1] 5+5i ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(4,2); x[1,0] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i, 5+5i, 6+6i, 7+7i, 8+8i); dim(x)<-c(4,2); x[2,0] } complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1, 2, 3, 4); dim(x)<-c(2, 2); x[1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[, 0] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[-1, 0] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, -1] } b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, 1] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, ] } a b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1)] } a a a ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, 0] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, ] } a b c d 1.1 2.2 3.3 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, c(1,3)] } a c 1.1 3.3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[c(1,1,1), 0] } z z z ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "d", "e")); x[1, c(1,3)] } a d 1.1 3.3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2, 2); x[, -1] } [1] 3.3 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2, 2); x[, -3] } [,1] [,2] [1,] 1.1 3.3 [2,] 2.2 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2, 2); x[-1, ] } [1] 2.2 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2, 2); x[-3, ] } [,1] [,2] [1,] 1.1 3.3 [2,] 2.2 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[1, c(1,NA)] } c 1.1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, 1), c(1,NA)] } c a 1.1 NA a 1.1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, NA), c(1,NA)] } c a 1.1 NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1,NA), 1] } a 1.1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[,0] } [1,] [2,] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[-1, -1] } [1] 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[0,] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[1,1] } [1] 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[1,2] } [1] 3.3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[c(1, NA), ] } [,1] [,2] [1,] 1.1 3.3 [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[c(1, NaN), ] } [,1] [,2] [1,] 1.1 3.3 [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[c(TRUE, NA), ] } [,1] [,2] [1,] 1.1 3.3 [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[c(TRUE, NaN), ] } [,1] [,2] [1,] 1.1 3.3 [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); x<-1:4; dim(x)<-c(2,2); x[NA, ] } [,1] [,2] [1,] NA NA [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); x<-1:4; dim(x)<-c(2,2); x[NaN, ] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2, 4); x[c(-1, -2),c(-1)] } [,1] [,2] [,3] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2, 4); x[c(-1, -2),c(-1, -2)] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2, 4); x[c(-1, -2),c(-1, -2, -3)] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2, 4); x[c(-1, -2),c(0)] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2, 4); x[c(-1, -2),c(1)] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2, 4); x[c(-1, -2),c(1, 2)] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2,4); x[,0] } [1,] [2,] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2,4); x[-1,0] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2,4); x[-2,0] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2,4); x[0,-1] } [,1] [,2] [,3] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2,4); x[0,-2] } [,1] [,2] [,3] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2,4); x[0,0] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2,4); x[0,1] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2,4); x[0,] } [,1] [,2] [,3] [,4] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(2,4); x[1,0] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(4,2); x[-1, 1] } [1] 2.2 3.3 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(4,2); x[0,1] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(4,2); x[0,2] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(4,2); x[1, -1] } [1] 5.5 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(4,2); x[1,0] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4, 5.5, 6.6, 7.7, 8.8); dim(x)<-c(4,2); x[2,0] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1L,2L,3L,4L,5L,6L); dim(x) <- c(2,3); x[1,2] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(1L,2L,3L,4L,5L,6L,7L,8L,9L,10L); dim(x) <- c(2,5); x[2,4] } [1] 8 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(FALSE, TRUE, TRUE, FALSE); dim(x)<-c(2, 2); x[1, 1] } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[, 0] } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[-1, 0] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, -1] } b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, 1] } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, ] } a b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1)] } a a a ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, 0] } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, ] } a b c d TRUE FALSE TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, c(1,3)] } a c TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[c(1,1,1), 0] } z z z ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "d", "e")); x[1, c(1,3)] } a d TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2, 2); x[, -1] } [1] TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2, 2); x[, -3] } [,1] [,2] [1,] TRUE TRUE [2,] FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2, 2); x[-1, ] } [1] FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2, 2); x[-3, ] } [,1] [,2] [1,] TRUE TRUE [2,] FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[1, c(1,NA)] } c TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, 1), c(1,NA)] } c a TRUE NA a TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, NA), c(1,NA)] } c a TRUE NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1,NA), 1] } a TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); x[,0] } [1,] [2,] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); x[-1, -1] } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); x[0,] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); x[1,1] } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); x[1,2] } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); x[c(1, NA), ] } [,1] [,2] [1,] TRUE TRUE [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); x[c(1, NaN), ] } [,1] [,2] [1,] TRUE TRUE [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); x[c(TRUE, NA), ] } [,1] [,2] [1,] TRUE TRUE [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(2,2); x[c(TRUE, NaN), ] } [,1] [,2] [1,] TRUE TRUE [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); x<-1:4; dim(x)<-c(2,2); x[NA, ] } [,1] [,2] [1,] NA NA [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(TRUE, FALSE, TRUE, FALSE); x<-1:4; dim(x)<-c(2,2); x[NaN, ] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[, 0] } raw(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[-1, 0] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, -1] } b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, 1] } raw(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, ] } a b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1)] } a a a ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, 0] } raw(0) ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, ] } a b c d 01 02 03 04 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, c(1,3)] } a c 01 03 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[c(1,1,1), 0] } z z z ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "d", "e")); x[1, c(1,3)] } a d 01 03 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2, 2); x[, -1] } [1] 03 04 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2, 2); x[, -3] } [,1] [,2] [1,] 01 03 [2,] 02 04 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2, 2); x[-1, ] } [1] 02 04 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2, 2); x[-3, ] } [,1] [,2] [1,] 01 03 [2,] 02 04 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[1, c(1,NA)] } c 01 00 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, 1), c(1,NA)] } c a 01 00 a 01 00 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, NA), c(1,NA)] } c a 01 00 00 00 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1,NA), 1] } a 01 00 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); x[,0] } [1,] [2,] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); x[-1, -1] } [1] 04 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); x[0,] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); x[1,1] } [1] 01 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); x[1,2] } [1] 03 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); x[c(1, NA), ] } [,1] [,2] [1,] 01 03 [2,] 00 00 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); x[c(1, NaN), ] } [,1] [,2] [1,] 01 03 [2,] 00 00 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); x[c(TRUE, NA), ] } [,1] [,2] [1,] 01 03 [2,] 00 00 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(2,2); x[c(TRUE, NaN), ] } [,1] [,2] [1,] 01 03 [2,] 00 00 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); x<-1:4; dim(x)<-c(2,2); x[NA, ] } [,1] [,2] [1,] NA NA [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); x<-1:4; dim(x)<-c(2,2); x[NaN, ] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[, 0] } list() ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[-1, 0] } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, -1] } b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, 1] } list() ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, ] } a b c d ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1)] } a a a ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, 0] } list() ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, ] } $a [1] TRUE $b [1] "a" $c [1] 42 $d [1] 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[1, c(1,3)] } $a [1] TRUE $c [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[c(1,1,1), 0] } z z z ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "d", "e")); x[1, c(1,3)] } $a [1] TRUE $d [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2, 2); x[, -1] } [[1]] [1] 42 [[2]] [1] 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2, 2); x[, -3] } [,1] [,2] [1,] TRUE 42 [2,] "a" 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2, 2); x[-1, ] } [[1]] [1] "a" [[2]] [1] 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2, 2); x[-3, ] } [,1] [,2] [1,] TRUE 42 [2,] "a" 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[1, c(1,NA)] } $c [1] TRUE $ NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, 1), c(1,NA)] } c a TRUE NULL a TRUE NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1, NA), c(1,NA)] } c a TRUE NULL NULL NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); dimnames(x)<-list(c("a", "b"), c("c", "d")); x[c(1,NA), 1] } $a [1] TRUE $ NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); x[,0] } [1,] [2,] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); x[-1, -1] } [[1]] [1] 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); x[0,] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); x[1,1] } [[1]] [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); x[1,2] } [[1]] [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); x[c(1, NA), ] } [,1] [,2] [1,] TRUE 42 [2,] NULL NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); x[c(1, NaN), ] } [,1] [,2] [1,] TRUE 42 [2,] NULL NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); x[c(TRUE, NA), ] } [,1] [,2] [1,] TRUE 42 [2,] NULL NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(2,2); x[c(TRUE, NaN), ] } [,1] [,2] [1,] TRUE 42 [2,] NULL NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); x<-1:4; dim(x)<-c(2,2); x[NA, ] } [,1] [,2] [1,] NA NA [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testAccessScalarIndex# #{ x<-list(TRUE, "a", 42, 1.1); x<-1:4; dim(x)<-c(2,2); x[NaN, ] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testMatrixAccessWithScalarAndVector# #{ i <- c(1L,3L,5L) ; m <- 1:10 ; dim(m) <- c(2,5) ; m[2,i] } [1] 2 6 10 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testMatrixAccessWithScalarAndVector# #{ i <- c(1L,3L,5L) ; m <- c("a","b","c","d","e","f","g","h","i","j") ; dim(m) <- c(2,5) ; m[2,i] } [1] "b" "f" "j" ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateDim# #{ x<-c(1,2,3,4,5,6); dim(x) <- c(2L,3L); dim(x) <- NULL; dim(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateDim# #{ x<-c(1,2,3,4,5,6); dim(x) <- c(2L,3L); dim(x) } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateDim# #{ x<-c(1L,2L,3L,4L,5L,6L); dim(x) <- c(2.1,3.9); dim(x) } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateDim# #{ x<-c(1L,2L,3L,4L,5L,6L); dim(x) <- c(2L,3L); dim(x) <- NULL; dim(x) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateDim# #{ x<-c(1L,2L,3L,4L,5L,6L); dim(x) <- c(2L,3L); dim(x) } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[3][1]<-42; x } [,1] [,2] [1,] 1 42 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[3][1][1]<-42; x } [,1] [,2] [1,] 1 42 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[,][1]<-42; x } [,1] [,2] [1,] 42 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[, c(1)] } [1] 1.1 2.2 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[, c(1,2)] } [,1] [,2] [1,] 1.1 3.3 [2,] 2.2 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[c(1), ] } [1] 1.1 3.3 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(2,2); x[c(1,2), ] } [,1] [,2] [1,] 1.1 3.3 [2,] 2.2 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1L,2L,3L,4L); dim(x)<-c(2,2); f<-function() { x[3][1]<-42; x }; f() } [,1] [,2] [1,] 1 42 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1L,2L,3L,4L); dim(x)<-c(2,2); f<-function() { x[3][1]<-42; }; f(); x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1L,2L,3L,4L,5L,6L); dim(x) <- c(2,3); x[1,2] <- 100L; x[1,2] } [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleMatrix.testUpdateScalarIndex# #{ x<-c(1L,2L,3L,4L,5L,6L,7L,8L,9L,10L); dim(x) <- c(2,5); x[2,4] <- 100L; x[2,4] } [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testEscapeSequences# # "\' \"\`" [1] "' \"`" ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testEscapeSequences# # "\011\013\036" [1] "\t\v\036" ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testEscapeSequences# # "\111\413\36f  " [1] "I\v\036f \a " ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testEscapeSequences# # "\a\b\f \v \t \r " [1] "\a\b\f \v \t \r " ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testEscapeSequences# # "\a\b\f \v \t \r \n\' \"\`\011\013\036" [1] "\a\b\f \v \t \r \n' \"`\t\v\036" ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testEscapeSequences# # '\a\b\f \v \t \r \n\' \"\`\011\013\036' [1] "\a\b\f \v \t \r \n' \"`\t\v\036" ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testEscapeSequences# #{ "\U00A0" } [1] " " ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testFieldsAndSlots# #a <- list(a=3, b=9); list(a$'a', a$"b") [[1]] [1] 3 [[2]] [1] 9 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testFieldsAndSlots# #a <- list(a=3, b=9); list(a$a, a$b) [[1]] [1] 3 [[2]] [1] 9 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testFieldsAndSlots# #setClass('Foo', representation(x='numeric')); a <- new('Foo'); a@'x' numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testFieldsAndSlots# #setClass('Foo', representation(x='numeric')); a <- new('Foo'); a@x numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testId# #{ ...7foo <- 42 } ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testId# #{ ..77foo <- 42 } ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testId# #{ ..7foo <- 42 } ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testIncorrectInput# #/ Error: unexpected '/' in "/" ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testNumbers# #-1234.1L > 0 [1] FALSE Warning message: integer literal 1234.1L contains decimal; using numeric value ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testNumbers# #-12340000000000.1L > 0 [1] FALSE Warning message: integer literal 12340000000000.1L contains decimal; using numeric value ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testNumbers# #1234.0L [1] 1234 Warning message: integer literal 1234.0L contains unnecessary decimal point ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testNumbers# #1234.1L > 0 [1] TRUE Warning message: integer literal 1234.1L contains decimal; using numeric value ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testNumbers# #12340000000000.0L > 0 [1] TRUE Warning message: integer literal 12340000000000.0L contains decimal; using numeric value ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testNumbers# #12340000000000.1L > 0 [1] TRUE Warning message: integer literal 12340000000000.1L contains decimal; using numeric value ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testNumbers# #12340000000000L > 0 [1] TRUE Warning message: non-integer value 12340000000000L qualified with L; using numeric value ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testNumbers# #1234L [1] 1234 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #"a" <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #'' <- 123 Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #'a' <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #123 <- 123 Error in 123 <- 123 : invalid (do_set) left-hand side to assignment ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #NULL <- 123 Error in NULL <- 123 : invalid (do_set) left-hand side to assignment ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #`a` <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #a <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #if (FALSE) '' <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #if (FALSE) 123 <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #if (FALSE) NULL <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #if (FALSE) foo() <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #if (FALSE) foo(123) <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #if (FALSE) foo(NULL) <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testReplacement# #if (FALSE) foo(x) <- 123 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testSemicolons# #; Error: unexpected ';' in ";" ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testSemicolons# #;1 Error: unexpected ';' in ";" ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testSemicolons# #;1;; Error: unexpected ';' in ";" ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testSemicolons# #{1;;;;;} [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testSemicolons# #{;;4;;;} [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testSemicolons# #{;;;;;} NULL ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testSemicolons# #{;} NULL ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testSemicolons# #{invisible(1);;;;;} ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testUnaryNotParsing# #x <- 1; y <- 2; !(x < y) [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testUnaryNotParsing# #x <- 1; y <- 2; !(x) < y [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testUnaryNotParsing# #x <- 1; y <- 2; !x < y [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testUnaryNotParsing# #x <- 1; y <- TRUE; !x - !y [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testUnaryNotParsing# #x <- 1; y <- TRUE; (!x) - !y [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testUnaryNotParsing# #x <- 1; y <- TRUE; x - !y [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testUnaryNotParsing# #x <- FALSE; y <- TRUE; !x && !y [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testUnaryNotParsing# #x <- FALSE; y <- TRUE; !x && y [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleParsing.testUnaryNotParsing# #x <- FALSE; y <- TRUE; (!x) && y [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testInteractiveSequences# #1;2;3 [1] 1 [1] 2 [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testInteractiveSequences# #1;invisible(2);3 [1] 1 [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ (0-1.5):(0-12) } [1] -1.5 -2.5 -3.5 -4.5 -5.5 -6.5 -7.5 -8.5 -9.5 -10.5 -11.5 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ (0-12):1.5 } [1] -12 -11 -10 -9 -8 -7 -6 -5 -4 -3 -2 -1 0 1 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ (0-5):(0-9) } [1] -5 -6 -7 -8 -9 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ (0/0):(0/0) } Error in (0/0):(0/0) : NA/NaN argument ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ (0/0):1L } Error in (0/0):1L : NA/NaN argument ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ (1:3):(1:3) } [1] 1 Warning messages: 1: In (1:3):(1:3) : numerical expression has 3 elements: only the first used 2: In (1:3):(1:3) : numerical expression has 3 elements: only the first used ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ (1:3):3 } [1] 1 2 3 Warning message: In (1:3):3 : numerical expression has 3 elements: only the first used ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ -Inf:0 } Error in -Inf:0 : result would be too long a vector ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ -Inf:0L } Error in -Inf:0L : result would be too long a vector ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ -Inf:Inf } Error in -Inf:Inf : result would be too long a vector ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 0:-Inf } Error in 0:-Inf : result would be too long a vector ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 0:Inf } Error in 0:Inf : result would be too long a vector ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 0L:-Inf } Error in 0L:-Inf : result would be too long a vector ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 0L:Inf } Error in 0L:Inf : result would be too long a vector ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1.1:3.1 } [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1.1:5.1 } [1] 1.1 2.1 3.1 4.1 5.1 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1.5:(0-12) } [1] 1.5 0.5 -0.5 -1.5 -2.5 -3.5 -4.5 -5.5 -6.5 -7.5 -8.5 -9.5 [13] -10.5 -11.5 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 10:1 } [1] 10 9 8 7 6 5 4 3 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1:(0-10) } [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1:(0L-10L) } [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1:(1:3) } [1] 1 Warning message: In 1:(1:3) : numerical expression has 3 elements: only the first used ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1:10 } [1] 1 2 3 4 5 6 7 8 9 10 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1:3 } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1:NA } Error in 1:NA : NA/NaN argument ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1L:(0-10) } [1] 1 0 -1 -2 -3 -4 -5 -6 -7 -8 -9 -10 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 1L:(0/0) } Error in 1L:(0/0) : NA/NaN argument ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 3.1:1 } [1] 3.1 2.1 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 3:1 } [1] 3 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 5L:(0L-5L) } [1] 5 4 3 2 1 0 -1 -2 -3 -4 -5 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ 5L:10L } [1] 5 6 7 8 9 10 ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ NA:1 } Error in NA:1 : NA/NaN argument ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ NA:NA } Error in NA:NA : NA/NaN argument ##com.oracle.truffle.r.test.library.base.TestSimpleSequences.testSequenceConstruction# #{ } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function() { 1:5 } ; f(); f() } [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function() { if (1) TRUE } ; f(); f() } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function() { if (if (1) {TRUE} else {FALSE} ) 1 } ; f(); f() } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function() { length(c(1,2)) } ; f(); f() } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function() { logical(0) } ; f(); f() } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function(i) { i ; if (FALSE) { 1 } else { i } } ; f(2) ; f(1) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function(i) { i ; if (TRUE) { 1 } else { i } } ; f(2) ; f(1) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function(i) { if (TRUE) { i } } ; f(2) ; f(1) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function(i) { if(i==1) { 1 } else { i } } ; f(2) ; f(1) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function(i) { if(i==1) { 1 } else { i } } ; f(2) ; f(2) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1# #{ f<-function(i) {i} ; f(1) ; f(2) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1Ignore# #{ f<-function() { if (!1) TRUE } ; f(); f() } ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1Ignore# #{ f<-function() { if (!TRUE) 1 } ; f(); f() } ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1Ignore# #{ f<-function(i) { if (FALSE) { i } } ; f(2) ; f(1) } ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.test1Ignore# #{ f<-function(i) { if(i==1) { i } } ; f(1) ; f(2) } ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.testLoop# #{ f<-function() { x<-1 ; for(i in 1:10) { x<-x+1 } ; x } ; f(); f() } [1] 11 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.testLoop# #{ f<-function() { x<-1 ; repeat { x <- x + 1 ; if (x <= 11) { next } else { break } ; x <- 1024 } ; x } ; f() ; f() } [1] 12 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.testLoop# #{ f<-function() { x<-1 ; repeat { x <- x + 1 ; if (x > 11) { break } } ; x } ; f(); f() } [1] 12 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.testLoop# #{ f<-function() { x<-1 ; while(TRUE) { x <- x + 1 ; if (x > 11) { break } } ; x } ; f(); f() } [1] 12 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.testLoop# #{ f<-function() { x<-1 ; while(x <= 10) { x<-x+1 } ; x } ; f(); f() } [1] 11 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.testLoop# #{ f<-function() { x<-210 ; repeat { x <- x + 1 ; break } ; x } ; f() ; f() } [1] 211 ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.testWarningsAndErrors# #{ (c(1, 2) < c(1, 2, 3)) == (c(1, 2) < c(1, 3, 4)) } [1] TRUE FALSE TRUE Warning messages: 1: In c(1, 2) < c(1, 2, 3) : longer object length is not a multiple of shorter object length 2: In c(1, 2) < c(1, 3, 4) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.testWarningsAndErrors# #{ 1i > ((c(1, 2) < c(1, 2, 3)) == (c(1, 2) < c(1, 3, 4))) } Error in 0+1i > ((c(1, 2) < c(1, 2, 3)) == (c(1, 2) < c(1, 3, 4))) : invalid comparison with complex values In addition: Warning messages: 1: In c(1, 2) < c(1, 2, 3) : longer object length is not a multiple of shorter object length 2: In c(1, 2) < c(1, 3, 4) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleTruffle.testWarningsAndErrors# #{ 1i > (c(1, 2) < c(1, 2, 3)) } Error in 0+1i > (c(1, 2) < c(1, 2, 3)) : invalid comparison with complex values In addition: Warning message: In c(1, 2) < c(1, 2, 3) : longer object length is not a multiple of shorter object length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAmbiguousExpression#IncludeList.arithmetic# #exp(-abs((0+1i)/(0+0i))) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- "hello"; attr(x, "a"); [1] "hello" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- "hello"; names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- ((0/0)+1i); attr(x, "a"); [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- ((0/0)+1i); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (-(0/0)); attr(x, "a"); [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (-(0/0)); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (-(1/0)); attr(x, "a"); [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (-(1/0)); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (-0.0); attr(x, "a"); [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (-0.0); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (0/0); attr(x, "a"); [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (0/0); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (1+NA); attr(x, "a"); [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (1+NA); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (1/0); attr(x, "a"); [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (1/0); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (1i+NA); attr(x, "a"); [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (1i+NA); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (3.4+NA); attr(x, "a"); [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- (3.4+NA); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 0.1234567; attr(x, "a"); [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 0.1234567; names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 123456789000; attr(x, "a"); [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 123456789000; names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 1; attr(x, "a"); [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 1; names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 1L; attr(x, "a"); [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 1L; names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 1i; attr(x, "a"); [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 1i; names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 3.4; attr(x, "a"); [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- 3.4; names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- FALSE; attr(x, "a"); [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- FALSE; names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- NULL; attr(x, "a"); NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- NULL; names(attributes(x)); NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- TRUE; attr(x, "a"); [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- TRUE; names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- as.raw(10); attr(x, "a"); [1] 0a ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- as.raw(10); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c("hello","hello","hello"); attr(x, "a"); [1] "hello" "hello" "hello" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c("hello","hello","hello"); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(0.1234567,0.1234567,0.1234567); attr(x, "a"); [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(0.1234567,0.1234567,0.1234567); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(1,1,1); attr(x, "a"); [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(1,1,1); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(123456789000,123456789000,123456789000); attr(x, "a"); [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(123456789000,123456789000,123456789000); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(1L,1L,1L); attr(x, "a"); [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(1L,1L,1L); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(1i,1i,1i); attr(x, "a"); [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(1i,1i,1i); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(3.4,3.4,3.4); attr(x, "a"); [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(3.4,3.4,3.4); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(FALSE,FALSE,FALSE); attr(x, "a"); [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(FALSE,FALSE,FALSE); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(NULL,NULL,NULL); attr(x, "a"); NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(NULL,NULL,NULL); names(attributes(x)); NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(TRUE,TRUE,TRUE); attr(x, "a"); [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(TRUE,TRUE,TRUE); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(as.raw(10),as.raw(10),as.raw(10)); attr(x, "a"); [1] 0a 0a 0a ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- c(as.raw(10),as.raw(10),as.raw(10)); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- list(1, 2, 3); attr(x, "a"); [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testAttributes# #x <- 1; attr(x, "a") <- list(1, 2, 3); names(attributes(x)); [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%"hello" Error in "hello"%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%((0/0)+1i) Error in "hello"%%((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%(-(0/0)) Error in "hello"%%(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%(-(1/0)) Error in "hello"%%(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%(-0.0) Error in "hello"%%(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%(0/0) Error in "hello"%%(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%(1+NA) Error in "hello"%%(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%(1/0) Error in "hello"%%(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%(1i+NA) Error in "hello"%%(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%(3.4+NA) Error in "hello"%%(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%0.1234567 Error in "hello"%%0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%1 Error in "hello"%%1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%123456789000 Error in "hello"%%123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%1L Error in "hello"%%1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%1i Error in "hello"%%(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%3.4 Error in "hello"%%3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%FALSE Error in "hello"%%FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%NULL Error in "hello"%%NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%TRUE Error in "hello"%%TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%as.raw(10) Error in "hello"%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c("hello","hello","hello") Error in "hello"%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c(0.1234567,0.1234567,0.1234567) Error in "hello"%%c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c(1,1,1) Error in "hello"%%c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c(123456789000,123456789000,123456789000) Error in "hello"%%c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c(1L,1L,1L) Error in "hello"%%c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c(1i,1i,1i) Error in "hello"%%c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c(3.4,3.4,3.4) Error in "hello"%%c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c(FALSE,FALSE,FALSE) Error in "hello"%%c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c(NULL,NULL,NULL) Error in "hello"%%c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c(TRUE,TRUE,TRUE) Error in "hello"%%c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"%%c(as.raw(10),as.raw(10),as.raw(10)) Error in "hello"%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*"hello" Error in "hello" * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*((0/0)+1i) Error in "hello" * ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*(-(0/0)) Error in "hello" * (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*(-(1/0)) Error in "hello" * (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*(-0.0) Error in "hello" * (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*(0/0) Error in "hello" * (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*(1+NA) Error in "hello" * (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*(1/0) Error in "hello" * (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*(1i+NA) Error in "hello" * (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*(3.4+NA) Error in "hello" * (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*0.1234567 Error in "hello" * 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*1 Error in "hello" * 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*123456789000 Error in "hello" * 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*1L Error in "hello" * 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*1i Error in "hello" * (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*3.4 Error in "hello" * 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*FALSE Error in "hello" * FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*NULL Error in "hello" * NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*TRUE Error in "hello" * TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*as.raw(10) Error in "hello" * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c("hello","hello","hello") Error in "hello" * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c(0.1234567,0.1234567,0.1234567) Error in "hello" * c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c(1,1,1) Error in "hello" * c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c(123456789000,123456789000,123456789000) Error in "hello" * c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c(1L,1L,1L) Error in "hello" * c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c(1i,1i,1i) Error in "hello" * c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c(3.4,3.4,3.4) Error in "hello" * c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c(FALSE,FALSE,FALSE) Error in "hello" * c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c(NULL,NULL,NULL) Error in "hello" * c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c(TRUE,TRUE,TRUE) Error in "hello" * c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"*c(as.raw(10),as.raw(10),as.raw(10)) Error in "hello" * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+"hello" Error in "hello" + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+((0/0)+1i) Error in "hello" + ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+(-(0/0)) Error in "hello" + (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+(-(1/0)) Error in "hello" + (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+(-0.0) Error in "hello" + (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+(0/0) Error in "hello" + (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+(1+NA) Error in "hello" + (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+(1/0) Error in "hello" + (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+(1i+NA) Error in "hello" + (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+(3.4+NA) Error in "hello" + (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+0.1234567 Error in "hello" + 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+1 Error in "hello" + 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+123456789000 Error in "hello" + 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+1L Error in "hello" + 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+1i Error in "hello" + (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+3.4 Error in "hello" + 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+FALSE Error in "hello" + FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+NULL Error in "hello" + NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+TRUE Error in "hello" + TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+as.raw(10) Error in "hello" + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c("hello","hello","hello") Error in "hello" + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c(0.1234567,0.1234567,0.1234567) Error in "hello" + c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c(1,1,1) Error in "hello" + c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c(123456789000,123456789000,123456789000) Error in "hello" + c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c(1L,1L,1L) Error in "hello" + c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c(1i,1i,1i) Error in "hello" + c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c(3.4,3.4,3.4) Error in "hello" + c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c(FALSE,FALSE,FALSE) Error in "hello" + c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c(NULL,NULL,NULL) Error in "hello" + c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c(TRUE,TRUE,TRUE) Error in "hello" + c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"+c(as.raw(10),as.raw(10),as.raw(10)) Error in "hello" + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-"hello" Error in "hello" - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-((0/0)+1i) Error in "hello" - ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-(-(0/0)) Error in "hello" - (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-(-(1/0)) Error in "hello" - (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-(-0.0) Error in "hello" - (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-(0/0) Error in "hello" - (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-(1+NA) Error in "hello" - (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-(1/0) Error in "hello" - (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-(1i+NA) Error in "hello" - (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-(3.4+NA) Error in "hello" - (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-0.1234567 Error in "hello" - 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-1 Error in "hello" - 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-123456789000 Error in "hello" - 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-1L Error in "hello" - 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-1i Error in "hello" - (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-3.4 Error in "hello" - 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-FALSE Error in "hello" - FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-NULL Error in "hello" - NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-TRUE Error in "hello" - TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-as.raw(10) Error in "hello" - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c("hello","hello","hello") Error in "hello" - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c(0.1234567,0.1234567,0.1234567) Error in "hello" - c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c(1,1,1) Error in "hello" - c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c(123456789000,123456789000,123456789000) Error in "hello" - c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c(1L,1L,1L) Error in "hello" - c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c(1i,1i,1i) Error in "hello" - c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c(3.4,3.4,3.4) Error in "hello" - c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c(FALSE,FALSE,FALSE) Error in "hello" - c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c(NULL,NULL,NULL) Error in "hello" - c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c(TRUE,TRUE,TRUE) Error in "hello" - c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"-c(as.raw(10),as.raw(10),as.raw(10)) Error in "hello" - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/"hello" Error in "hello"/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/((0/0)+1i) Error in "hello"/((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/(-(0/0)) Error in "hello"/(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/(-(1/0)) Error in "hello"/(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/(-0.0) Error in "hello"/(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/(0/0) Error in "hello"/(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/(1+NA) Error in "hello"/(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/(1/0) Error in "hello"/(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/(1i+NA) Error in "hello"/(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/(3.4+NA) Error in "hello"/(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/0.1234567 Error in "hello"/0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/1 Error in "hello"/1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/123456789000 Error in "hello"/123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/1L Error in "hello"/1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/1i Error in "hello"/(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/3.4 Error in "hello"/3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/FALSE Error in "hello"/FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/NULL Error in "hello"/NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/TRUE Error in "hello"/TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/as.raw(10) Error in "hello"/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c("hello","hello","hello") Error in "hello"/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c(0.1234567,0.1234567,0.1234567) Error in "hello"/c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c(1,1,1) Error in "hello"/c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c(123456789000,123456789000,123456789000) Error in "hello"/c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c(1L,1L,1L) Error in "hello"/c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c(1i,1i,1i) Error in "hello"/c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c(3.4,3.4,3.4) Error in "hello"/c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c(FALSE,FALSE,FALSE) Error in "hello"/c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c(NULL,NULL,NULL) Error in "hello"/c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c(TRUE,TRUE,TRUE) Error in "hello"/c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"/c(as.raw(10),as.raw(10),as.raw(10)) Error in "hello"/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^"hello" Error in "hello"^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^((0/0)+1i) Error in "hello"^((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^(-(0/0)) Error in "hello"^(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^(-(1/0)) Error in "hello"^(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^(-0.0) Error in "hello"^(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^(0/0) Error in "hello"^(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^(1+NA) Error in "hello"^(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^(1/0) Error in "hello"^(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^(1i+NA) Error in "hello"^(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^(3.4+NA) Error in "hello"^(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^0.1234567 Error in "hello"^0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^1 Error in "hello"^1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^123456789000 Error in "hello"^123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^1L Error in "hello"^1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^1i Error in "hello"^(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^3.4 Error in "hello"^3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^FALSE Error in "hello"^FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^NULL Error in "hello"^NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^TRUE Error in "hello"^TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^as.raw(10) Error in "hello"^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c("hello","hello","hello") Error in "hello"^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c(0.1234567,0.1234567,0.1234567) Error in "hello"^c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c(1,1,1) Error in "hello"^c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c(123456789000,123456789000,123456789000) Error in "hello"^c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c(1L,1L,1L) Error in "hello"^c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c(1i,1i,1i) Error in "hello"^c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c(3.4,3.4,3.4) Error in "hello"^c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c(FALSE,FALSE,FALSE) Error in "hello"^c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c(NULL,NULL,NULL) Error in "hello"^c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c(TRUE,TRUE,TRUE) Error in "hello"^c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #"hello"^c(as.raw(10),as.raw(10),as.raw(10)) Error in "hello"^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%"hello" Error in ((0/0) + (0+1i))%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%(-(0/0)) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%(-(1/0)) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%(-0.0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%(0/0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%(1+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%(1/0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%(3.4+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%0.1234567 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%1 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%123456789000 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%1L Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%3.4 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%FALSE Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%TRUE Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%as.raw(10) Error in ((0/0) + (0+1i))%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c("hello","hello","hello") Error in ((0/0) + (0+1i))%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c(0.1234567,0.1234567,0.1234567) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c(1,1,1) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c(123456789000,123456789000,123456789000) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c(1L,1L,1L) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c(3.4,3.4,3.4) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c(FALSE,FALSE,FALSE) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c(TRUE,TRUE,TRUE) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in ((0/0) + (0+1i))%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*"hello" Error in ((0/0) + (0+1i)) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*(-(0/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*(-(1/0)) [1] NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*(-0.0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*(0/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*(1+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*(1/0) [1] NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*(3.4+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*0.1234567 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*1 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*123456789000 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*1L [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*3.4 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*FALSE [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*TRUE [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*as.raw(10) Error in ((0/0) + (0+1i)) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c("hello","hello","hello") Error in ((0/0) + (0+1i)) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c(0.1234567,0.1234567,0.1234567) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c(1,1,1) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c(123456789000,123456789000,123456789000) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c(1L,1L,1L) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c(3.4,3.4,3.4) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c(FALSE,FALSE,FALSE) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c(TRUE,TRUE,TRUE) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)*c(as.raw(10),as.raw(10),as.raw(10)) Error in ((0/0) + (0+1i)) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+"hello" Error in ((0/0) + (0+1i)) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+((0/0)+1i) [1] NaN+2i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+(-(0/0)) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+(-(1/0)) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+(-0.0) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+(0/0) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+(1/0) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+0.1234567 [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+1 [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+123456789000 [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+1L [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+1i [1] NaN+2i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+3.4 [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+FALSE [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+TRUE [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+as.raw(10) Error in ((0/0) + (0+1i)) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c("hello","hello","hello") Error in ((0/0) + (0+1i)) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c(0.1234567,0.1234567,0.1234567) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c(1,1,1) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c(123456789000,123456789000,123456789000) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c(1L,1L,1L) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c(1i,1i,1i) [1] NaN+2i NaN+2i NaN+2i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c(3.4,3.4,3.4) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c(FALSE,FALSE,FALSE) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c(TRUE,TRUE,TRUE) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)+c(as.raw(10),as.raw(10),as.raw(10)) Error in ((0/0) + (0+1i)) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-"hello" Error in ((0/0) + (0+1i)) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-((0/0)+1i) [1] NaN+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-(-(0/0)) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-(-(1/0)) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-(-0.0) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-(0/0) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-(1+NA) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-(1/0) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-(3.4+NA) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-0.1234567 [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-1 [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-123456789000 [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-1L [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-1i [1] NaN+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-3.4 [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-FALSE [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-TRUE [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-as.raw(10) Error in ((0/0) + (0+1i)) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c("hello","hello","hello") Error in ((0/0) + (0+1i)) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c(0.1234567,0.1234567,0.1234567) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c(1,1,1) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c(123456789000,123456789000,123456789000) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c(1L,1L,1L) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c(1i,1i,1i) [1] NaN+0i NaN+0i NaN+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c(3.4,3.4,3.4) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c(FALSE,FALSE,FALSE) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c(TRUE,TRUE,TRUE) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)-c(as.raw(10),as.raw(10),as.raw(10)) Error in ((0/0) + (0+1i)) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/"hello" Error in ((0/0) + (0+1i))/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/(-(0/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/(-(1/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/(-0.0) [1] NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/(0/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/(1/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/0.1234567 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/1 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/123456789000 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/1L [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/3.4 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/FALSE [1] NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/TRUE [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/as.raw(10) Error in ((0/0) + (0+1i))/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c("hello","hello","hello") Error in ((0/0) + (0+1i))/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c(0.1234567,0.1234567,0.1234567) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c(1,1,1) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c(123456789000,123456789000,123456789000) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c(1L,1L,1L) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c(3.4,3.4,3.4) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c(FALSE,FALSE,FALSE) [1] NaN+Infi NaN+Infi NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c(TRUE,TRUE,TRUE) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)/c(as.raw(10),as.raw(10),as.raw(10)) Error in ((0/0) + (0+1i))/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^"hello" Error in ((0/0) + (0+1i))^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^(-(0/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^(-(1/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^(-0.0) [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^(0/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^(1+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^(1/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^(3.4+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^0.1234567 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^1 [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^123456789000 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^1L [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^3.4 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^FALSE [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^TRUE [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^as.raw(10) Error in ((0/0) + (0+1i))^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c("hello","hello","hello") Error in ((0/0) + (0+1i))^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c(0.1234567,0.1234567,0.1234567) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c(1,1,1) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c(123456789000,123456789000,123456789000) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c(1L,1L,1L) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c(3.4,3.4,3.4) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c(FALSE,FALSE,FALSE) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c(TRUE,TRUE,TRUE) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #((0/0)+1i)^c(as.raw(10),as.raw(10),as.raw(10)) Error in ((0/0) + (0+1i))^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%"hello" Error in (-(0/0))%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%as.raw(10) Error in (-(0/0))%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c("hello","hello","hello") Error in (-(0/0))%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))%%c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(0/0))%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*"hello" Error in (-(0/0)) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*(1+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*(3.4+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*as.raw(10) Error in (-(0/0)) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c("hello","hello","hello") Error in (-(0/0)) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))*c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(0/0)) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+"hello" Error in (-(0/0)) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+(1+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+(3.4+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+1i [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+as.raw(10) Error in (-(0/0)) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c("hello","hello","hello") Error in (-(0/0)) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c(1i,1i,1i) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))+c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(0/0)) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-"hello" Error in (-(0/0)) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-(1+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-(3.4+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-1i [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-as.raw(10) Error in (-(0/0)) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c("hello","hello","hello") Error in (-(0/0)) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c(1i,1i,1i) [1] NaN-1i NaN-1i NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))-c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(0/0)) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/"hello" Error in (-(0/0))/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/(1+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/(3.4+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/as.raw(10) Error in (-(0/0))/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c("hello","hello","hello") Error in (-(0/0))/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))/c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(0/0))/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^"hello" Error in (-(0/0))^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^(1+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^(3.4+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^as.raw(10) Error in (-(0/0))^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c("hello","hello","hello") Error in (-(0/0))^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(0/0))^c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(0/0))^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%"hello" Error in (-(1/0))%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%as.raw(10) Error in (-(1/0))%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c("hello","hello","hello") Error in (-(1/0))%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))%%c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(1/0))%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*"hello" Error in (-(1/0)) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*((0/0)+1i) [1] NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*(1/0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*0.1234567 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*1 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*123456789000 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*1L [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*1i [1] NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*3.4 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*TRUE [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*as.raw(10) Error in (-(1/0)) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c("hello","hello","hello") Error in (-(1/0)) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c(0.1234567,0.1234567,0.1234567) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c(1,1,1) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c(123456789000,123456789000,123456789000) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c(1L,1L,1L) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c(1i,1i,1i) [1] NaN-Infi NaN-Infi NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c(3.4,3.4,3.4) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c(TRUE,TRUE,TRUE) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))*c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(1/0)) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+"hello" Error in (-(1/0)) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+(-0.0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+0.1234567 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+1 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+123456789000 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+1L [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+1i [1] -Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+3.4 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+FALSE [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+TRUE [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+as.raw(10) Error in (-(1/0)) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c("hello","hello","hello") Error in (-(1/0)) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c(0.1234567,0.1234567,0.1234567) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c(1,1,1) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c(123456789000,123456789000,123456789000) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c(1L,1L,1L) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c(1i,1i,1i) [1] -Inf+1i -Inf+1i -Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c(3.4,3.4,3.4) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c(FALSE,FALSE,FALSE) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c(TRUE,TRUE,TRUE) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))+c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(1/0)) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-"hello" Error in (-(1/0)) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-(-0.0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-(1/0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-0.1234567 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-1 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-123456789000 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-1L [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-1i [1] -Inf-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-3.4 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-FALSE [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-TRUE [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-as.raw(10) Error in (-(1/0)) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c("hello","hello","hello") Error in (-(1/0)) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c(0.1234567,0.1234567,0.1234567) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c(1,1,1) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c(123456789000,123456789000,123456789000) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c(1L,1L,1L) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c(1i,1i,1i) [1] -Inf-1i -Inf-1i -Inf-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c(3.4,3.4,3.4) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c(FALSE,FALSE,FALSE) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c(TRUE,TRUE,TRUE) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))-c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(1/0)) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/"hello" Error in (-(1/0))/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/(-0.0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/0.1234567 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/1 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/123456789000 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/1L [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/1i [1] NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/3.4 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/FALSE [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/TRUE [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/as.raw(10) Error in (-(1/0))/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c("hello","hello","hello") Error in (-(1/0))/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c(0.1234567,0.1234567,0.1234567) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c(1,1,1) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c(123456789000,123456789000,123456789000) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c(1L,1L,1L) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c(1i,1i,1i) [1] NaN+Infi NaN+Infi NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c(3.4,3.4,3.4) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c(FALSE,FALSE,FALSE) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c(TRUE,TRUE,TRUE) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))/c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(1/0))/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^"hello" Error in (-(1/0))^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^1 [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^123456789000 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^1L [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^TRUE [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^as.raw(10) Error in (-(1/0))^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c("hello","hello","hello") Error in (-(1/0))^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c(1,1,1) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c(123456789000,123456789000,123456789000) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c(1L,1L,1L) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c(TRUE,TRUE,TRUE) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-(1/0))^c(as.raw(10),as.raw(10),as.raw(10)) Error in (-(1/0))^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%"hello" Error in (-0)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%0.1234567 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%3.4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%as.raw(10) Error in (-0)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c("hello","hello","hello") Error in (-0)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in (-0)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*"hello" Error in (-0) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*0.1234567 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*1i [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*3.4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*as.raw(10) Error in (-0) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c("hello","hello","hello") Error in (-0) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c(1i,1i,1i) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)*c(as.raw(10),as.raw(10),as.raw(10)) Error in (-0) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+"hello" Error in (-0) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+0.1234567 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+123456789000 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+1i [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+3.4 [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+as.raw(10) Error in (-0) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c("hello","hello","hello") Error in (-0) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c(0.1234567,0.1234567,0.1234567) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c(1i,1i,1i) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c(3.4,3.4,3.4) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)+c(as.raw(10),as.raw(10),as.raw(10)) Error in (-0) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-"hello" Error in (-0) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-(1/0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-0.1234567 [1] -0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-1 [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-123456789000 [1] -123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-1L [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-1i [1] 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-3.4 [1] -3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-TRUE [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-as.raw(10) Error in (-0) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c("hello","hello","hello") Error in (-0) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c(0.1234567,0.1234567,0.1234567) [1] -0.1234567 -0.1234567 -0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c(1,1,1) [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c(123456789000,123456789000,123456789000) [1] -123456789000 -123456789000 -123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c(1L,1L,1L) [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c(1i,1i,1i) [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c(3.4,3.4,3.4) [1] -3.4 -3.4 -3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c(TRUE,TRUE,TRUE) [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)-c(as.raw(10),as.raw(10),as.raw(10)) Error in (-0) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/"hello" Error in (-0)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/0.1234567 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/1i [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/3.4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/as.raw(10) Error in (-0)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c("hello","hello","hello") Error in (-0)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c(1i,1i,1i) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)/c(as.raw(10),as.raw(10),as.raw(10)) Error in (-0)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^"hello" Error in (-0)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^0.1234567 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^3.4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^as.raw(10) Error in (-0)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c("hello","hello","hello") Error in (-0)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(-0.0)^c(as.raw(10),as.raw(10),as.raw(10)) Error in (-0)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%"hello" Error in (0/0)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%as.raw(10) Error in (0/0)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c("hello","hello","hello") Error in (0/0)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in (0/0)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*"hello" Error in (0/0) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*(1+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*(3.4+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*as.raw(10) Error in (0/0) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c("hello","hello","hello") Error in (0/0) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)*c(as.raw(10),as.raw(10),as.raw(10)) Error in (0/0) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+"hello" Error in (0/0) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+(1+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+(3.4+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+1i [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+as.raw(10) Error in (0/0) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c("hello","hello","hello") Error in (0/0) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c(1i,1i,1i) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)+c(as.raw(10),as.raw(10),as.raw(10)) Error in (0/0) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-"hello" Error in (0/0) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-(1+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-(3.4+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-1i [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-as.raw(10) Error in (0/0) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c("hello","hello","hello") Error in (0/0) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c(1i,1i,1i) [1] NaN-1i NaN-1i NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)-c(as.raw(10),as.raw(10),as.raw(10)) Error in (0/0) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/"hello" Error in (0/0)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/(1+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/(3.4+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/as.raw(10) Error in (0/0)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c("hello","hello","hello") Error in (0/0)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)/c(as.raw(10),as.raw(10),as.raw(10)) Error in (0/0)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^"hello" Error in (0/0)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^(1+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^(3.4+NA) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^as.raw(10) Error in (0/0)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c("hello","hello","hello") Error in (0/0)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(0/0)^c(as.raw(10),as.raw(10),as.raw(10)) Error in (0/0)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%"hello" Error in (1 + NA)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%as.raw(10) Error in (1 + NA)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c("hello","hello","hello") Error in (1 + NA)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in (1 + NA)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*"hello" Error in (1 + NA) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*((0/0)+1i) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*as.raw(10) Error in (1 + NA) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c("hello","hello","hello") Error in (1 + NA) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)*c(as.raw(10),as.raw(10),as.raw(10)) Error in (1 + NA) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+"hello" Error in (1 + NA) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+as.raw(10) Error in (1 + NA) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c("hello","hello","hello") Error in (1 + NA) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)+c(as.raw(10),as.raw(10),as.raw(10)) Error in (1 + NA) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-"hello" Error in (1 + NA) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-((0/0)+1i) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-as.raw(10) Error in (1 + NA) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c("hello","hello","hello") Error in (1 + NA) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)-c(as.raw(10),as.raw(10),as.raw(10)) Error in (1 + NA) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/"hello" Error in (1 + NA)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/as.raw(10) Error in (1 + NA)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c("hello","hello","hello") Error in (1 + NA)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)/c(as.raw(10),as.raw(10),as.raw(10)) Error in (1 + NA)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^"hello" Error in (1 + NA)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^as.raw(10) Error in (1 + NA)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c("hello","hello","hello") Error in (1 + NA)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1+NA)^c(as.raw(10),as.raw(10),as.raw(10)) Error in (1 + NA)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%"hello" Error in (1/0)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%0.1234567 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%1 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%123456789000 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%1L [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%3.4 [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%TRUE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%as.raw(10) Error in (1/0)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c("hello","hello","hello") Error in (1/0)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c(0.1234567,0.1234567,0.1234567) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c(1,1,1) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c(123456789000,123456789000,123456789000) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c(1L,1L,1L) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c(3.4,3.4,3.4) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c(TRUE,TRUE,TRUE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in (1/0)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*"hello" Error in (1/0) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*((0/0)+1i) [1] NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*0.1234567 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*1 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*123456789000 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*1L [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*1i [1] NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*3.4 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*TRUE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*as.raw(10) Error in (1/0) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c("hello","hello","hello") Error in (1/0) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c(0.1234567,0.1234567,0.1234567) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c(1,1,1) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c(123456789000,123456789000,123456789000) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c(1L,1L,1L) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c(1i,1i,1i) [1] NaN+Infi NaN+Infi NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c(3.4,3.4,3.4) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c(TRUE,TRUE,TRUE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)*c(as.raw(10),as.raw(10),as.raw(10)) Error in (1/0) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+"hello" Error in (1/0) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+(-0.0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+0.1234567 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+1 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+123456789000 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+1L [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+1i [1] Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+3.4 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+FALSE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+TRUE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+as.raw(10) Error in (1/0) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c("hello","hello","hello") Error in (1/0) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c(0.1234567,0.1234567,0.1234567) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c(1,1,1) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c(123456789000,123456789000,123456789000) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c(1L,1L,1L) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c(1i,1i,1i) [1] Inf+1i Inf+1i Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c(3.4,3.4,3.4) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c(TRUE,TRUE,TRUE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)+c(as.raw(10),as.raw(10),as.raw(10)) Error in (1/0) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-"hello" Error in (1/0) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-(-0.0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-0.1234567 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-1 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-123456789000 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-1L [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-1i [1] Inf-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-3.4 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-FALSE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-TRUE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-as.raw(10) Error in (1/0) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c("hello","hello","hello") Error in (1/0) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c(0.1234567,0.1234567,0.1234567) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c(1,1,1) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c(123456789000,123456789000,123456789000) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c(1L,1L,1L) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c(1i,1i,1i) [1] Inf-1i Inf-1i Inf-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c(3.4,3.4,3.4) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c(TRUE,TRUE,TRUE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)-c(as.raw(10),as.raw(10),as.raw(10)) Error in (1/0) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/"hello" Error in (1/0)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/(-0.0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/0.1234567 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/1 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/123456789000 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/1L [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/1i [1] NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/3.4 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/FALSE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/TRUE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/as.raw(10) Error in (1/0)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c("hello","hello","hello") Error in (1/0)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c(0.1234567,0.1234567,0.1234567) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c(1,1,1) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c(123456789000,123456789000,123456789000) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c(1L,1L,1L) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c(1i,1i,1i) [1] NaN-Infi NaN-Infi NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c(3.4,3.4,3.4) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c(TRUE,TRUE,TRUE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)/c(as.raw(10),as.raw(10),as.raw(10)) Error in (1/0)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^"hello" Error in (1/0)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^0.1234567 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^1 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^123456789000 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^1L [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^3.4 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^TRUE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^as.raw(10) Error in (1/0)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c("hello","hello","hello") Error in (1/0)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c(0.1234567,0.1234567,0.1234567) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c(1,1,1) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c(123456789000,123456789000,123456789000) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c(1L,1L,1L) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c(3.4,3.4,3.4) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c(TRUE,TRUE,TRUE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1/0)^c(as.raw(10),as.raw(10),as.raw(10)) Error in (1/0)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%"hello" Error in (0+1i + NA)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%(-(0/0)) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%(-(1/0)) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%(-0.0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%(0/0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%(1+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%(1/0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%(3.4+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%0.1234567 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%1 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%123456789000 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%1L Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%3.4 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%FALSE Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%TRUE Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%as.raw(10) Error in (0+1i + NA)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c("hello","hello","hello") Error in (0+1i + NA)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c(0.1234567,0.1234567,0.1234567) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c(1,1,1) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c(123456789000,123456789000,123456789000) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c(1L,1L,1L) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c(3.4,3.4,3.4) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c(FALSE,FALSE,FALSE) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c(TRUE,TRUE,TRUE) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in (0+1i + NA)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*"hello" Error in (0+1i + NA) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*((0/0)+1i) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*(-(1/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*(1/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*as.raw(10) Error in (0+1i + NA) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c("hello","hello","hello") Error in (0+1i + NA) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)*c(as.raw(10),as.raw(10),as.raw(10)) Error in (0+1i + NA) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+"hello" Error in (0+1i + NA) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+((0/0)+1i) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+as.raw(10) Error in (0+1i + NA) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c("hello","hello","hello") Error in (0+1i + NA) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)+c(as.raw(10),as.raw(10),as.raw(10)) Error in (0+1i + NA) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-"hello" Error in (0+1i + NA) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-((0/0)+1i) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-as.raw(10) Error in (0+1i + NA) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c("hello","hello","hello") Error in (0+1i + NA) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)-c(as.raw(10),as.raw(10),as.raw(10)) Error in (0+1i + NA) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/"hello" Error in (0+1i + NA)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/((0/0)+1i) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/as.raw(10) Error in (0+1i + NA)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c("hello","hello","hello") Error in (0+1i + NA)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)/c(as.raw(10),as.raw(10),as.raw(10)) Error in (0+1i + NA)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^"hello" Error in (0+1i + NA)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^(-(0/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^(-(1/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^(-0.0) [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^(0/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^(1+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^(1/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^(3.4+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^0.1234567 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^123456789000 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^3.4 [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^FALSE [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^as.raw(10) Error in (0+1i + NA)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c("hello","hello","hello") Error in (0+1i + NA)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c(0.1234567,0.1234567,0.1234567) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c(123456789000,123456789000,123456789000) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c(3.4,3.4,3.4) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c(FALSE,FALSE,FALSE) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(1i+NA)^c(as.raw(10),as.raw(10),as.raw(10)) Error in (0+1i + NA)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%"hello" Error in (3.4 + NA)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%as.raw(10) Error in (3.4 + NA)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c("hello","hello","hello") Error in (3.4 + NA)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in (3.4 + NA)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*"hello" Error in (3.4 + NA) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*((0/0)+1i) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*as.raw(10) Error in (3.4 + NA) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c("hello","hello","hello") Error in (3.4 + NA) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)*c(as.raw(10),as.raw(10),as.raw(10)) Error in (3.4 + NA) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+"hello" Error in (3.4 + NA) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+as.raw(10) Error in (3.4 + NA) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c("hello","hello","hello") Error in (3.4 + NA) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)+c(as.raw(10),as.raw(10),as.raw(10)) Error in (3.4 + NA) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-"hello" Error in (3.4 + NA) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-((0/0)+1i) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-as.raw(10) Error in (3.4 + NA) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c("hello","hello","hello") Error in (3.4 + NA) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)-c(as.raw(10),as.raw(10),as.raw(10)) Error in (3.4 + NA) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/"hello" Error in (3.4 + NA)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/(-0.0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/1i [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/as.raw(10) Error in (3.4 + NA)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c("hello","hello","hello") Error in (3.4 + NA)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c(1i,1i,1i) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)/c(as.raw(10),as.raw(10),as.raw(10)) Error in (3.4 + NA)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^"hello" Error in (3.4 + NA)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^(-(0/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^(-(1/0)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^(0/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^(1/0) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^0.1234567 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^1 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^123456789000 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^1L [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^3.4 [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^TRUE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^as.raw(10) Error in (3.4 + NA)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c("hello","hello","hello") Error in (3.4 + NA)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c(0.1234567,0.1234567,0.1234567) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c(1,1,1) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c(123456789000,123456789000,123456789000) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c(1L,1L,1L) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c(3.4,3.4,3.4) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c(TRUE,TRUE,TRUE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #(3.4+NA)^c(as.raw(10),as.raw(10),as.raw(10)) Error in (3.4 + NA)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%"hello" Error in 0.1234567%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%(1/0) [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%0.1234567 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%1 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%123456789000 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%1L [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%3.4 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%TRUE [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%as.raw(10) Error in 0.1234567%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c("hello","hello","hello") Error in 0.1234567%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c(1,1,1) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c(123456789000,123456789000,123456789000) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c(1L,1L,1L) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c(3.4,3.4,3.4) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c(TRUE,TRUE,TRUE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567%%c(as.raw(10),as.raw(10),as.raw(10)) Error in 0.1234567%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*"hello" Error in 0.1234567 * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*0.1234567 [1] 0.01524156 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*1 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*123456789000 [1] 15241567763 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*1L [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*1i [1] 0+0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*3.4 [1] 0.4197528 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*TRUE [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*as.raw(10) Error in 0.1234567 * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c("hello","hello","hello") Error in 0.1234567 * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c(0.1234567,0.1234567,0.1234567) [1] 0.01524156 0.01524156 0.01524156 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c(1,1,1) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c(123456789000,123456789000,123456789000) [1] 15241567763 15241567763 15241567763 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c(1L,1L,1L) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c(1i,1i,1i) [1] 0+0.1234567i 0+0.1234567i 0+0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c(3.4,3.4,3.4) [1] 0.4197528 0.4197528 0.4197528 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c(TRUE,TRUE,TRUE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567*c(as.raw(10),as.raw(10),as.raw(10)) Error in 0.1234567 * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+"hello" Error in 0.1234567 + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+(-0.0) [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+0.1234567 [1] 0.2469134 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+1 [1] 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+123456789000 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+1L [1] 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+1i [1] 0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+3.4 [1] 3.523457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+FALSE [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+TRUE [1] 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+as.raw(10) Error in 0.1234567 + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c("hello","hello","hello") Error in 0.1234567 + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c(0.1234567,0.1234567,0.1234567) [1] 0.2469134 0.2469134 0.2469134 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c(1,1,1) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c(1L,1L,1L) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c(1i,1i,1i) [1] 0.123457+1i 0.123457+1i 0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c(3.4,3.4,3.4) [1] 3.523457 3.523457 3.523457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c(FALSE,FALSE,FALSE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c(TRUE,TRUE,TRUE) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567+c(as.raw(10),as.raw(10),as.raw(10)) Error in 0.1234567 + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-"hello" Error in 0.1234567 - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-(-0.0) [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-(1/0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-0.1234567 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-1 [1] -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-123456789000 [1] -123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-1L [1] -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-1i [1] 0.123457-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-3.4 [1] -3.276543 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-FALSE [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-TRUE [1] -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-as.raw(10) Error in 0.1234567 - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c("hello","hello","hello") Error in 0.1234567 - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c(1,1,1) [1] -0.8765433 -0.8765433 -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c(123456789000,123456789000,123456789000) [1] -123456789000 -123456789000 -123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c(1L,1L,1L) [1] -0.8765433 -0.8765433 -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c(1i,1i,1i) [1] 0.123457-1i 0.123457-1i 0.123457-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c(3.4,3.4,3.4) [1] -3.276543 -3.276543 -3.276543 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c(FALSE,FALSE,FALSE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c(TRUE,TRUE,TRUE) [1] -0.8765433 -0.8765433 -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567-c(as.raw(10),as.raw(10),as.raw(10)) Error in 0.1234567 - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/"hello" Error in 0.1234567/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/(-0.0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/0.1234567 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/1 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/123456789000 [1] 9.999993e-13 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/1L [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/1i [1] 0-0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/3.4 [1] 0.03631079 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/FALSE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/TRUE [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/as.raw(10) Error in 0.1234567/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c("hello","hello","hello") Error in 0.1234567/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c(0.1234567,0.1234567,0.1234567) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c(1,1,1) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c(123456789000,123456789000,123456789000) [1] 9.999993e-13 9.999993e-13 9.999993e-13 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c(1L,1L,1L) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c(1i,1i,1i) [1] 0-0.1234567i 0-0.1234567i 0-0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c(3.4,3.4,3.4) [1] 0.03631079 0.03631079 0.03631079 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c(TRUE,TRUE,TRUE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567/c(as.raw(10),as.raw(10),as.raw(10)) Error in 0.1234567/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^"hello" Error in 0.1234567^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^0.1234567 [1] 0.7723985 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^1 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^1L [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^1i [1] -0.4978071-0.8672878i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^3.4 [1] 0.0008149855 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^TRUE [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^as.raw(10) Error in 0.1234567^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c("hello","hello","hello") Error in 0.1234567^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c(0.1234567,0.1234567,0.1234567) [1] 0.7723985 0.7723985 0.7723985 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c(1,1,1) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c(1L,1L,1L) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c(1i,1i,1i) [1] -0.4978071-0.8672878i -0.4978071-0.8672878i -0.4978071-0.8672878i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c(3.4,3.4,3.4) [1] 0.0008149855 0.0008149855 0.0008149855 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c(TRUE,TRUE,TRUE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #0.1234567^c(as.raw(10),as.raw(10),as.raw(10)) Error in 0.1234567^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%"hello" Error in 1%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%(1/0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%0.1234567 [1] 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%123456789000 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%3.4 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%as.raw(10) Error in 1%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c("hello","hello","hello") Error in 1%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c(0.1234567,0.1234567,0.1234567) [1] 0.0123464 0.0123464 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1%%c(as.raw(10),as.raw(10),as.raw(10)) Error in 1%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*"hello" Error in 1 * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*0.1234567 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*123456789000 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*1i [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*3.4 [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*as.raw(10) Error in 1 * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c("hello","hello","hello") Error in 1 * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c(0.1234567,0.1234567,0.1234567) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c(1i,1i,1i) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c(3.4,3.4,3.4) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1*c(as.raw(10),as.raw(10),as.raw(10)) Error in 1 * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+"hello" Error in 1 + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+0.1234567 [1] 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+1 [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+123456789000 [1] 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+1L [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+1i [1] 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+3.4 [1] 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+TRUE [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+as.raw(10) Error in 1 + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c("hello","hello","hello") Error in 1 + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c(0.1234567,0.1234567,0.1234567) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c(1,1,1) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c(123456789000,123456789000,123456789000) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c(1L,1L,1L) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c(1i,1i,1i) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c(3.4,3.4,3.4) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c(TRUE,TRUE,TRUE) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1+c(as.raw(10),as.raw(10),as.raw(10)) Error in 1 + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-"hello" Error in 1 - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-(1/0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-0.1234567 [1] 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-123456789000 [1] -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-1i [1] 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-3.4 [1] -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-as.raw(10) Error in 1 - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c("hello","hello","hello") Error in 1 - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c(0.1234567,0.1234567,0.1234567) [1] 0.8765433 0.8765433 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c(123456789000,123456789000,123456789000) [1] -123456788999 -123456788999 -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c(1i,1i,1i) [1] 1-1i 1-1i 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c(3.4,3.4,3.4) [1] -2.4 -2.4 -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1-c(as.raw(10),as.raw(10),as.raw(10)) Error in 1 - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/"hello" Error in 1/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/(-0.0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/0.1234567 [1] 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/123456789000 [1] 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/1i [1] 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/3.4 [1] 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/FALSE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/as.raw(10) Error in 1/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c("hello","hello","hello") Error in 1/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c(0.1234567,0.1234567,0.1234567) [1] 8.100006 8.100006 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c(123456789000,123456789000,123456789000) [1] 8.1e-12 8.1e-12 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c(1i,1i,1i) [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c(3.4,3.4,3.4) [1] 0.2941176 0.2941176 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1/c(as.raw(10),as.raw(10),as.raw(10)) Error in 1/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%"hello" Error in 123456789000%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%(1/0) [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%0.1234567 [1] 0.06496745 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%3.4 [1] 0.4000032 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%as.raw(10) Error in 123456789000%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c("hello","hello","hello") Error in 123456789000%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c(0.1234567,0.1234567,0.1234567) [1] 0.06496745 0.06496745 0.06496745 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c(3.4,3.4,3.4) [1] 0.4000032 0.4000032 0.4000032 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000%%c(as.raw(10),as.raw(10),as.raw(10)) Error in 123456789000%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*"hello" Error in 123456789000 * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*0.1234567 [1] 15241567763 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*1 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*123456789000 [1] 1.524158e+22 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*1L [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*1i [1] 0+123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*3.4 [1] 419753082600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*TRUE [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*as.raw(10) Error in 123456789000 * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c("hello","hello","hello") Error in 123456789000 * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c(0.1234567,0.1234567,0.1234567) [1] 15241567763 15241567763 15241567763 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c(1,1,1) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c(123456789000,123456789000,123456789000) [1] 1.524158e+22 1.524158e+22 1.524158e+22 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c(1L,1L,1L) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c(1i,1i,1i) [1] 0+123456789000i 0+123456789000i 0+123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c(3.4,3.4,3.4) [1] 419753082600 419753082600 419753082600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c(TRUE,TRUE,TRUE) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000*c(as.raw(10),as.raw(10),as.raw(10)) Error in 123456789000 * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+"hello" Error in 123456789000 + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+(-0.0) [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+0.1234567 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+1 [1] 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+123456789000 [1] 246913578000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+1L [1] 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+1i [1] 123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+3.4 [1] 123456789003 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+FALSE [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+TRUE [1] 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+as.raw(10) Error in 123456789000 + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c("hello","hello","hello") Error in 123456789000 + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c(0.1234567,0.1234567,0.1234567) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c(1,1,1) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c(123456789000,123456789000,123456789000) [1] 246913578000 246913578000 246913578000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c(1L,1L,1L) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c(1i,1i,1i) [1] 123456789000+0i 123456789000+0i 123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c(3.4,3.4,3.4) [1] 123456789003 123456789003 123456789003 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c(FALSE,FALSE,FALSE) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c(TRUE,TRUE,TRUE) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000+c(as.raw(10),as.raw(10),as.raw(10)) Error in 123456789000 + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-"hello" Error in 123456789000 - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-(-0.0) [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-(1/0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-0.1234567 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-1 [1] 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-1L [1] 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-1i [1] 123456789000-0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-3.4 [1] 123456788997 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-FALSE [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-TRUE [1] 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-as.raw(10) Error in 123456789000 - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c("hello","hello","hello") Error in 123456789000 - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c(0.1234567,0.1234567,0.1234567) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c(1,1,1) [1] 123456788999 123456788999 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c(1L,1L,1L) [1] 123456788999 123456788999 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c(1i,1i,1i) [1] 123456789000-0i 123456789000-0i 123456789000-0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c(3.4,3.4,3.4) [1] 123456788997 123456788997 123456788997 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c(FALSE,FALSE,FALSE) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c(TRUE,TRUE,TRUE) [1] 123456788999 123456788999 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000-c(as.raw(10),as.raw(10),as.raw(10)) Error in 123456789000 - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/"hello" Error in 123456789000/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/(-0.0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/0.1234567 [1] 1.000001e+12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/1 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/123456789000 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/1L [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/1i [1] 0-123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/3.4 [1] 36310820294 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/FALSE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/TRUE [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/as.raw(10) Error in 123456789000/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c("hello","hello","hello") Error in 123456789000/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c(0.1234567,0.1234567,0.1234567) [1] 1.000001e+12 1.000001e+12 1.000001e+12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c(1,1,1) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c(1L,1L,1L) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c(1i,1i,1i) [1] 0-123456789000i 0-123456789000i 0-123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c(3.4,3.4,3.4) [1] 36310820294 36310820294 36310820294 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c(TRUE,TRUE,TRUE) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000/c(as.raw(10),as.raw(10),as.raw(10)) Error in 123456789000/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^"hello" Error in 123456789000^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^0.1234567 [1] 23.40571 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^1 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^123456789000 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^1L [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^1i [1] 0.9185436+0.3953196i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^3.4 [1] 5.142223e+37 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^TRUE [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^as.raw(10) Error in 123456789000^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c("hello","hello","hello") Error in 123456789000^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c(0.1234567,0.1234567,0.1234567) [1] 23.40571 23.40571 23.40571 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c(1,1,1) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c(123456789000,123456789000,123456789000) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c(1L,1L,1L) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c(1i,1i,1i) [1] 0.9185436+0.3953196i 0.9185436+0.3953196i 0.9185436+0.3953196i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c(3.4,3.4,3.4) [1] 5.142223e+37 5.142223e+37 5.142223e+37 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c(TRUE,TRUE,TRUE) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #123456789000^c(as.raw(10),as.raw(10),as.raw(10)) Error in 123456789000^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%"hello" Error in 1L%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%(1/0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%0.1234567 [1] 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%123456789000 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%3.4 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%as.raw(10) Error in 1L%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c("hello","hello","hello") Error in 1L%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c(0.1234567,0.1234567,0.1234567) [1] 0.0123464 0.0123464 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L%%c(as.raw(10),as.raw(10),as.raw(10)) Error in 1L%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*"hello" Error in 1L * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*0.1234567 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*123456789000 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*1i [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*3.4 [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*as.raw(10) Error in 1L * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c("hello","hello","hello") Error in 1L * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c(0.1234567,0.1234567,0.1234567) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c(1i,1i,1i) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c(3.4,3.4,3.4) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L*c(as.raw(10),as.raw(10),as.raw(10)) Error in 1L * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+"hello" Error in 1L + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+0.1234567 [1] 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+1 [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+123456789000 [1] 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+1L [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+1i [1] 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+3.4 [1] 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+TRUE [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+as.raw(10) Error in 1L + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c("hello","hello","hello") Error in 1L + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c(0.1234567,0.1234567,0.1234567) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c(1,1,1) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c(123456789000,123456789000,123456789000) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c(1L,1L,1L) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c(1i,1i,1i) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c(3.4,3.4,3.4) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c(TRUE,TRUE,TRUE) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L+c(as.raw(10),as.raw(10),as.raw(10)) Error in 1L + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-"hello" Error in 1L - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-(1/0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-0.1234567 [1] 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-123456789000 [1] -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-1i [1] 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-3.4 [1] -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-as.raw(10) Error in 1L - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c("hello","hello","hello") Error in 1L - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c(0.1234567,0.1234567,0.1234567) [1] 0.8765433 0.8765433 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c(123456789000,123456789000,123456789000) [1] -123456788999 -123456788999 -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c(1i,1i,1i) [1] 1-1i 1-1i 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c(3.4,3.4,3.4) [1] -2.4 -2.4 -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L-c(as.raw(10),as.raw(10),as.raw(10)) Error in 1L - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/"hello" Error in 1L/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/(-0.0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/0.1234567 [1] 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/123456789000 [1] 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/1i [1] 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/3.4 [1] 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/FALSE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/as.raw(10) Error in 1L/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c("hello","hello","hello") Error in 1L/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c(0.1234567,0.1234567,0.1234567) [1] 8.100006 8.100006 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c(123456789000,123456789000,123456789000) [1] 8.1e-12 8.1e-12 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c(1i,1i,1i) [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c(3.4,3.4,3.4) [1] 0.2941176 0.2941176 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L/c(as.raw(10),as.raw(10),as.raw(10)) Error in 1L/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^"hello" Error in 1L^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^(-(0/0)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^(-(1/0)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^(0/0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^(1+NA) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^(1/0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^(3.4+NA) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^0.1234567 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^123456789000 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^1i [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^3.4 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^as.raw(10) Error in 1L^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c("hello","hello","hello") Error in 1L^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c(0.1234567,0.1234567,0.1234567) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c(1i,1i,1i) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1L^c(as.raw(10),as.raw(10),as.raw(10)) Error in 1L^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^"hello" Error in 1^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^(-(0/0)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^(-(1/0)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^(0/0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^(1+NA) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^(1/0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^(3.4+NA) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^0.1234567 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^123456789000 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^1i [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^3.4 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^as.raw(10) Error in 1^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c("hello","hello","hello") Error in 1^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c(0.1234567,0.1234567,0.1234567) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c(1i,1i,1i) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1^c(as.raw(10),as.raw(10),as.raw(10)) Error in 1^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%"hello" Error in (0+1i)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%(-(0/0)) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%(-(1/0)) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%(-0.0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%(0/0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%(1+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%(1/0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%(3.4+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%0.1234567 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%1 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%123456789000 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%1L Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%3.4 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%FALSE Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%TRUE Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%as.raw(10) Error in (0+1i)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c("hello","hello","hello") Error in (0+1i)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c(0.1234567,0.1234567,0.1234567) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c(1,1,1) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c(123456789000,123456789000,123456789000) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c(1L,1L,1L) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c(3.4,3.4,3.4) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c(FALSE,FALSE,FALSE) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c(TRUE,TRUE,TRUE) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i%%c(as.raw(10),as.raw(10),as.raw(10)) Error in (0+1i)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*"hello" Error in (0+1i) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*(-(0/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*(-(1/0)) [1] NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*(-0.0) [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*(0/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*(1/0) [1] NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*0.1234567 [1] 0+0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*1 [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*123456789000 [1] 0+123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*1L [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*1i [1] -1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*3.4 [1] 0+3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*FALSE [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*TRUE [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*as.raw(10) Error in (0+1i) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c("hello","hello","hello") Error in (0+1i) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c(0.1234567,0.1234567,0.1234567) [1] 0+0.1234567i 0+0.1234567i 0+0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c(1,1,1) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c(123456789000,123456789000,123456789000) [1] 0+123456789000i 0+123456789000i 0+123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c(1L,1L,1L) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c(1i,1i,1i) [1] -1+0i -1+0i -1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c(3.4,3.4,3.4) [1] 0+3.4i 0+3.4i 0+3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c(FALSE,FALSE,FALSE) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c(TRUE,TRUE,TRUE) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i*c(as.raw(10),as.raw(10),as.raw(10)) Error in (0+1i) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+"hello" Error in 0+1i + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+((0/0)+1i) [1] NaN+2i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+(-(0/0)) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+(-(1/0)) [1] -Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+(-0.0) [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+(0/0) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+(1/0) [1] Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+0.1234567 [1] 0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+1 [1] 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+123456789000 [1] 123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+1L [1] 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+1i [1] 0+2i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+3.4 [1] 3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+FALSE [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+TRUE [1] 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+as.raw(10) Error in 0+1i + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c("hello","hello","hello") Error in 0+1i + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c(0.1234567,0.1234567,0.1234567) [1] 0.123457+1i 0.123457+1i 0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c(1,1,1) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c(123456789000,123456789000,123456789000) [1] 123456789000+0i 123456789000+0i 123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c(1L,1L,1L) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c(1i,1i,1i) [1] 0+2i 0+2i 0+2i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c(3.4,3.4,3.4) [1] 3.4+1i 3.4+1i 3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c(FALSE,FALSE,FALSE) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c(TRUE,TRUE,TRUE) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i+c(as.raw(10),as.raw(10),as.raw(10)) Error in 0+1i + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-"hello" Error in 0+1i - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-((0/0)+1i) [1] NaN+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-(-(0/0)) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-(-(1/0)) [1] Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-(-0.0) [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-(0/0) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-(1/0) [1] -Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-0.1234567 [1] -0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-1 [1] -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-123456789000 [1] -123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-1L [1] -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-1i [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-3.4 [1] -3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-FALSE [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-TRUE [1] -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-as.raw(10) Error in 0+1i - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c("hello","hello","hello") Error in 0+1i - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c(0.1234567,0.1234567,0.1234567) [1] -0.123457+1i -0.123457+1i -0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c(1,1,1) [1] -1+1i -1+1i -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c(123456789000,123456789000,123456789000) [1] -123456789000+0i -123456789000+0i -123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c(1L,1L,1L) [1] -1+1i -1+1i -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c(1i,1i,1i) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c(3.4,3.4,3.4) [1] -3.4+1i -3.4+1i -3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c(FALSE,FALSE,FALSE) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c(TRUE,TRUE,TRUE) [1] -1+1i -1+1i -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i-c(as.raw(10),as.raw(10),as.raw(10)) Error in 0+1i - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/"hello" Error in (0+1i)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/(-(0/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/(-(1/0)) [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/(-0.0) [1] NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/(0/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/(1/0) [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/0.1234567 [1] 0+8.100006i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/1 [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/123456789000 [1] 0+8.1e-12i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/1L [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/1i [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/3.4 [1] 0+0.2941176i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/FALSE [1] NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/TRUE [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/as.raw(10) Error in (0+1i)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c("hello","hello","hello") Error in (0+1i)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c(0.1234567,0.1234567,0.1234567) [1] 0+8.100006i 0+8.100006i 0+8.100006i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c(1,1,1) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c(123456789000,123456789000,123456789000) [1] 0+8.1e-12i 0+8.1e-12i 0+8.1e-12i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c(1L,1L,1L) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c(1i,1i,1i) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c(3.4,3.4,3.4) [1] 0+0.2941176i 0+0.2941176i 0+0.2941176i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c(FALSE,FALSE,FALSE) [1] NaN+Infi NaN+Infi NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c(TRUE,TRUE,TRUE) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i/c(as.raw(10),as.raw(10),as.raw(10)) Error in (0+1i)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^"hello" Error in (0+1i)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^(-(0/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^(-(1/0)) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^(-0.0) [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^(0/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^(1+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^(1/0) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^(3.4+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^0.1234567 [1] 0.9812553+0.1927121i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^1 [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^123456789000 [1] 1-0.0000079i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^1L [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^1i [1] 0.2078796+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^3.4 [1] 0.5877853-0.809017i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^FALSE [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^TRUE [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^as.raw(10) Error in (0+1i)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c("hello","hello","hello") Error in (0+1i)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c(0.1234567,0.1234567,0.1234567) [1] 0.9812553+0.1927121i 0.9812553+0.1927121i 0.9812553+0.1927121i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c(1,1,1) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c(123456789000,123456789000,123456789000) [1] 1-0.0000079i 1-0.0000079i 1-0.0000079i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c(1L,1L,1L) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c(1i,1i,1i) [1] 0.2078796+0i 0.2078796+0i 0.2078796+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c(3.4,3.4,3.4) [1] 0.5877853-0.809017i 0.5877853-0.809017i 0.5877853-0.809017i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c(FALSE,FALSE,FALSE) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c(TRUE,TRUE,TRUE) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #1i^c(as.raw(10),as.raw(10),as.raw(10)) Error in (0+1i)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%"hello" Error in 3.4%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%(1/0) [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%0.1234567 [1] 0.0666691 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%1 [1] 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%123456789000 [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%1L [1] 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%3.4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%TRUE [1] 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%as.raw(10) Error in 3.4%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c("hello","hello","hello") Error in 3.4%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c(0.1234567,0.1234567,0.1234567) [1] 0.0666691 0.0666691 0.0666691 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c(1,1,1) [1] 0.4 0.4 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c(123456789000,123456789000,123456789000) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c(1L,1L,1L) [1] 0.4 0.4 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c(TRUE,TRUE,TRUE) [1] 0.4 0.4 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4%%c(as.raw(10),as.raw(10),as.raw(10)) Error in 3.4%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*"hello" Error in 3.4 * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*0.1234567 [1] 0.4197528 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*1 [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*123456789000 [1] 419753082600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*1L [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*1i [1] 0+3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*3.4 [1] 11.56 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*TRUE [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*as.raw(10) Error in 3.4 * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c("hello","hello","hello") Error in 3.4 * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c(0.1234567,0.1234567,0.1234567) [1] 0.4197528 0.4197528 0.4197528 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c(1,1,1) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c(123456789000,123456789000,123456789000) [1] 419753082600 419753082600 419753082600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c(1L,1L,1L) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c(1i,1i,1i) [1] 0+3.4i 0+3.4i 0+3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c(3.4,3.4,3.4) [1] 11.56 11.56 11.56 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c(TRUE,TRUE,TRUE) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4*c(as.raw(10),as.raw(10),as.raw(10)) Error in 3.4 * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+"hello" Error in 3.4 + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+(-0.0) [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+0.1234567 [1] 3.523457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+1 [1] 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+123456789000 [1] 123456789003 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+1L [1] 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+1i [1] 3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+3.4 [1] 6.8 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+FALSE [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+TRUE [1] 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+as.raw(10) Error in 3.4 + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c("hello","hello","hello") Error in 3.4 + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c(0.1234567,0.1234567,0.1234567) [1] 3.523457 3.523457 3.523457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c(1,1,1) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c(123456789000,123456789000,123456789000) [1] 123456789003 123456789003 123456789003 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c(1L,1L,1L) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c(1i,1i,1i) [1] 3.4+1i 3.4+1i 3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c(3.4,3.4,3.4) [1] 6.8 6.8 6.8 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c(FALSE,FALSE,FALSE) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c(TRUE,TRUE,TRUE) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4+c(as.raw(10),as.raw(10),as.raw(10)) Error in 3.4 + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-"hello" Error in 3.4 - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-(-0.0) [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-(1/0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-0.1234567 [1] 3.276543 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-1 [1] 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-123456789000 [1] -123456788997 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-1L [1] 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-1i [1] 3.4-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-3.4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-FALSE [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-TRUE [1] 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-as.raw(10) Error in 3.4 - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c("hello","hello","hello") Error in 3.4 - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c(0.1234567,0.1234567,0.1234567) [1] 3.276543 3.276543 3.276543 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c(1,1,1) [1] 2.4 2.4 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c(123456789000,123456789000,123456789000) [1] -123456788997 -123456788997 -123456788997 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c(1L,1L,1L) [1] 2.4 2.4 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c(1i,1i,1i) [1] 3.4-1i 3.4-1i 3.4-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c(FALSE,FALSE,FALSE) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c(TRUE,TRUE,TRUE) [1] 2.4 2.4 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4-c(as.raw(10),as.raw(10),as.raw(10)) Error in 3.4 - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/"hello" Error in 3.4/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/(-0.0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/0.1234567 [1] 27.54002 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/1 [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/123456789000 [1] 2.754e-11 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/1L [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/1i [1] 0-3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/3.4 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/FALSE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/TRUE [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/as.raw(10) Error in 3.4/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c("hello","hello","hello") Error in 3.4/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c(0.1234567,0.1234567,0.1234567) [1] 27.54002 27.54002 27.54002 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c(1,1,1) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c(123456789000,123456789000,123456789000) [1] 2.754e-11 2.754e-11 2.754e-11 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c(1L,1L,1L) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c(1i,1i,1i) [1] 0-3.4i 0-3.4i 0-3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c(TRUE,TRUE,TRUE) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4/c(as.raw(10),as.raw(10),as.raw(10)) Error in 3.4/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^"hello" Error in 3.4^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^0.1234567 [1] 1.163094 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^1 [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^123456789000 [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^1L [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^1i [1] 0.3400978+0.9403901i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^3.4 [1] 64.12514 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^TRUE [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^as.raw(10) Error in 3.4^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c("hello","hello","hello") Error in 3.4^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c(0.1234567,0.1234567,0.1234567) [1] 1.163094 1.163094 1.163094 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c(1,1,1) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c(123456789000,123456789000,123456789000) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c(1L,1L,1L) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c(1i,1i,1i) [1] 0.3400978+0.9403901i 0.3400978+0.9403901i 0.3400978+0.9403901i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c(3.4,3.4,3.4) [1] 64.12514 64.12514 64.12514 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c(TRUE,TRUE,TRUE) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #3.4^c(as.raw(10),as.raw(10),as.raw(10)) Error in 3.4^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%"hello" Error in FALSE%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%0.1234567 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%3.4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%as.raw(10) Error in FALSE%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c("hello","hello","hello") Error in FALSE%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE%%c(as.raw(10),as.raw(10),as.raw(10)) Error in FALSE%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*"hello" Error in FALSE * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*(-(1/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*(1/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*0.1234567 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*1i [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*3.4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*as.raw(10) Error in FALSE * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c("hello","hello","hello") Error in FALSE * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c(1i,1i,1i) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE*c(as.raw(10),as.raw(10),as.raw(10)) Error in FALSE * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+"hello" Error in FALSE + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+0.1234567 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+123456789000 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+1i [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+3.4 [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+as.raw(10) Error in FALSE + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c("hello","hello","hello") Error in FALSE + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c(0.1234567,0.1234567,0.1234567) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c(1i,1i,1i) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c(3.4,3.4,3.4) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE+c(as.raw(10),as.raw(10),as.raw(10)) Error in FALSE + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-"hello" Error in FALSE - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-(1/0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-0.1234567 [1] -0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-1 [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-123456789000 [1] -123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-1L [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-1i [1] 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-3.4 [1] -3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-TRUE [1] -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-as.raw(10) Error in FALSE - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c("hello","hello","hello") Error in FALSE - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c(0.1234567,0.1234567,0.1234567) [1] -0.1234567 -0.1234567 -0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c(1,1,1) [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c(123456789000,123456789000,123456789000) [1] -123456789000 -123456789000 -123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c(1L,1L,1L) [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c(1i,1i,1i) [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c(3.4,3.4,3.4) [1] -3.4 -3.4 -3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c(TRUE,TRUE,TRUE) [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE-c(as.raw(10),as.raw(10),as.raw(10)) Error in FALSE - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/"hello" Error in FALSE/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/0.1234567 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/1i [1] 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/3.4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/FALSE [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/as.raw(10) Error in FALSE/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c("hello","hello","hello") Error in FALSE/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c(1i,1i,1i) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE/c(as.raw(10),as.raw(10),as.raw(10)) Error in FALSE/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^"hello" Error in FALSE^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic# #FALSE^(-3) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^0.1234567 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^123456789000 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^1i [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^3.4 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^as.raw(10) Error in FALSE^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c("hello","hello","hello") Error in FALSE^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #FALSE^c(as.raw(10),as.raw(10),as.raw(10)) Error in FALSE^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%"hello" Error in NULL%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%1L integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%FALSE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%TRUE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%as.raw(10) Error in NULL%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c("hello","hello","hello") Error in NULL%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c(1L,1L,1L) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c(FALSE,FALSE,FALSE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c(TRUE,TRUE,TRUE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL%%c(as.raw(10),as.raw(10),as.raw(10)) Error in NULL%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*"hello" Error in NULL * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*1L integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*FALSE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*TRUE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*as.raw(10) Error in NULL * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c("hello","hello","hello") Error in NULL * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c(1L,1L,1L) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c(FALSE,FALSE,FALSE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c(TRUE,TRUE,TRUE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL*c(as.raw(10),as.raw(10),as.raw(10)) Error in NULL * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+"hello" Error in NULL + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+1L integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+FALSE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+TRUE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+as.raw(10) Error in NULL + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c("hello","hello","hello") Error in NULL + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c(1L,1L,1L) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c(FALSE,FALSE,FALSE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c(TRUE,TRUE,TRUE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL+c(as.raw(10),as.raw(10),as.raw(10)) Error in NULL + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-"hello" Error in NULL - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-1L integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-FALSE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-TRUE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-as.raw(10) Error in NULL - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c("hello","hello","hello") Error in NULL - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c(1L,1L,1L) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c(FALSE,FALSE,FALSE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c(TRUE,TRUE,TRUE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL-c(as.raw(10),as.raw(10),as.raw(10)) Error in NULL - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/"hello" Error in NULL/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/1L numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/FALSE numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/TRUE numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/as.raw(10) Error in NULL/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c("hello","hello","hello") Error in NULL/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c(1L,1L,1L) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c(FALSE,FALSE,FALSE) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c(TRUE,TRUE,TRUE) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL/c(as.raw(10),as.raw(10),as.raw(10)) Error in NULL/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^"hello" Error in NULL^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^1L numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^FALSE numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^TRUE numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^as.raw(10) Error in NULL^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c("hello","hello","hello") Error in NULL^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c(1L,1L,1L) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c(FALSE,FALSE,FALSE) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c(TRUE,TRUE,TRUE) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #NULL^c(as.raw(10),as.raw(10),as.raw(10)) Error in NULL^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%"hello" Error in TRUE%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%(-0.0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%(1/0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%0.1234567 [1] 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%123456789000 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%3.4 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%FALSE [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%as.raw(10) Error in TRUE%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c("hello","hello","hello") Error in TRUE%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c(0.1234567,0.1234567,0.1234567) [1] 0.0123464 0.0123464 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE%%c(as.raw(10),as.raw(10),as.raw(10)) Error in TRUE%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*"hello" Error in TRUE * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*0.1234567 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*123456789000 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*1i [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*3.4 [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*FALSE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*as.raw(10) Error in TRUE * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c("hello","hello","hello") Error in TRUE * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c(0.1234567,0.1234567,0.1234567) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c(1i,1i,1i) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c(3.4,3.4,3.4) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE*c(as.raw(10),as.raw(10),as.raw(10)) Error in TRUE * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+"hello" Error in TRUE + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+0.1234567 [1] 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+1 [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+123456789000 [1] 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+1L [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+1i [1] 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+3.4 [1] 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+TRUE [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+as.raw(10) Error in TRUE + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c("hello","hello","hello") Error in TRUE + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c(0.1234567,0.1234567,0.1234567) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c(1,1,1) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c(123456789000,123456789000,123456789000) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c(1L,1L,1L) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c(1i,1i,1i) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c(3.4,3.4,3.4) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c(TRUE,TRUE,TRUE) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE+c(as.raw(10),as.raw(10),as.raw(10)) Error in TRUE + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-"hello" Error in TRUE - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-((0/0)+1i) [1] NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-(-(1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-(1/0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-0.1234567 [1] 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-1 [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-123456789000 [1] -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-1L [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-1i [1] 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-3.4 [1] -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-TRUE [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-as.raw(10) Error in TRUE - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c("hello","hello","hello") Error in TRUE - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c(0.1234567,0.1234567,0.1234567) [1] 0.8765433 0.8765433 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c(123456789000,123456789000,123456789000) [1] -123456788999 -123456788999 -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c(1i,1i,1i) [1] 1-1i 1-1i 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c(3.4,3.4,3.4) [1] -2.4 -2.4 -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE-c(as.raw(10),as.raw(10),as.raw(10)) Error in TRUE - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/"hello" Error in TRUE/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/(-(1/0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/(-0.0) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/(1/0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/0.1234567 [1] 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/123456789000 [1] 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/1i [1] 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/3.4 [1] 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/FALSE [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/as.raw(10) Error in TRUE/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c("hello","hello","hello") Error in TRUE/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c(0.1234567,0.1234567,0.1234567) [1] 8.100006 8.100006 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c(123456789000,123456789000,123456789000) [1] 8.1e-12 8.1e-12 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c(1i,1i,1i) [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c(3.4,3.4,3.4) [1] 0.2941176 0.2941176 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE/c(as.raw(10),as.raw(10),as.raw(10)) Error in TRUE/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^"hello" Error in TRUE^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^((0/0)+1i) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^(-(0/0)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^(-(1/0)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^(-0.0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^(0/0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^(1+NA) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^(1/0) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^(1i+NA) [1] NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^(3.4+NA) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^0.1234567 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^123456789000 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^1i [1] 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^3.4 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^FALSE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^TRUE [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^as.raw(10) Error in TRUE^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c("hello","hello","hello") Error in TRUE^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c(0.1234567,0.1234567,0.1234567) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c(1i,1i,1i) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #TRUE^c(as.raw(10),as.raw(10),as.raw(10)) Error in TRUE^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%"hello" Error in as.raw(10)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%((0/0)+1i) Error in as.raw(10)%%((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%(-(0/0)) Error in as.raw(10)%%(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%(-(1/0)) Error in as.raw(10)%%(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%(-0.0) Error in as.raw(10)%%(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%(0/0) Error in as.raw(10)%%(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%(1+NA) Error in as.raw(10)%%(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%(1/0) Error in as.raw(10)%%(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%(1i+NA) Error in as.raw(10)%%(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%(3.4+NA) Error in as.raw(10)%%(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%0.1234567 Error in as.raw(10)%%0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%1 Error in as.raw(10)%%1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%123456789000 Error in as.raw(10)%%123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%1L Error in as.raw(10)%%1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%1i Error in as.raw(10)%%(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%3.4 Error in as.raw(10)%%3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%FALSE Error in as.raw(10)%%FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%NULL Error in as.raw(10)%%NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%TRUE Error in as.raw(10)%%TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%as.raw(10) Error in as.raw(10)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c("hello","hello","hello") Error in as.raw(10)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c(0.1234567,0.1234567,0.1234567) Error in as.raw(10)%%c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c(1,1,1) Error in as.raw(10)%%c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c(123456789000,123456789000,123456789000) Error in as.raw(10)%%c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c(1L,1L,1L) Error in as.raw(10)%%c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c(1i,1i,1i) Error in as.raw(10)%%c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c(3.4,3.4,3.4) Error in as.raw(10)%%c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c(FALSE,FALSE,FALSE) Error in as.raw(10)%%c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c(NULL,NULL,NULL) Error in as.raw(10)%%c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c(TRUE,TRUE,TRUE) Error in as.raw(10)%%c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in as.raw(10)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*"hello" Error in as.raw(10) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*((0/0)+1i) Error in as.raw(10) * ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*(-(0/0)) Error in as.raw(10) * (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*(-(1/0)) Error in as.raw(10) * (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*(-0.0) Error in as.raw(10) * (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*(0/0) Error in as.raw(10) * (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*(1+NA) Error in as.raw(10) * (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*(1/0) Error in as.raw(10) * (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*(1i+NA) Error in as.raw(10) * (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*(3.4+NA) Error in as.raw(10) * (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*0.1234567 Error in as.raw(10) * 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*1 Error in as.raw(10) * 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*123456789000 Error in as.raw(10) * 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*1L Error in as.raw(10) * 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*1i Error in as.raw(10) * (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*3.4 Error in as.raw(10) * 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*FALSE Error in as.raw(10) * FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*NULL Error in as.raw(10) * NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*TRUE Error in as.raw(10) * TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*as.raw(10) Error in as.raw(10) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c("hello","hello","hello") Error in as.raw(10) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c(0.1234567,0.1234567,0.1234567) Error in as.raw(10) * c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c(1,1,1) Error in as.raw(10) * c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c(123456789000,123456789000,123456789000) Error in as.raw(10) * c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c(1L,1L,1L) Error in as.raw(10) * c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c(1i,1i,1i) Error in as.raw(10) * c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c(3.4,3.4,3.4) Error in as.raw(10) * c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c(FALSE,FALSE,FALSE) Error in as.raw(10) * c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c(NULL,NULL,NULL) Error in as.raw(10) * c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c(TRUE,TRUE,TRUE) Error in as.raw(10) * c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)*c(as.raw(10),as.raw(10),as.raw(10)) Error in as.raw(10) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+"hello" Error in as.raw(10) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+((0/0)+1i) Error in as.raw(10) + ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+(-(0/0)) Error in as.raw(10) + (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+(-(1/0)) Error in as.raw(10) + (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+(-0.0) Error in as.raw(10) + (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+(0/0) Error in as.raw(10) + (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+(1+NA) Error in as.raw(10) + (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+(1/0) Error in as.raw(10) + (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+(1i+NA) Error in as.raw(10) + (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+(3.4+NA) Error in as.raw(10) + (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+0.1234567 Error in as.raw(10) + 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+1 Error in as.raw(10) + 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+123456789000 Error in as.raw(10) + 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+1L Error in as.raw(10) + 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+1i Error in as.raw(10) + (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+3.4 Error in as.raw(10) + 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+FALSE Error in as.raw(10) + FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+NULL Error in as.raw(10) + NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+TRUE Error in as.raw(10) + TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+as.raw(10) Error in as.raw(10) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c("hello","hello","hello") Error in as.raw(10) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c(0.1234567,0.1234567,0.1234567) Error in as.raw(10) + c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c(1,1,1) Error in as.raw(10) + c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c(123456789000,123456789000,123456789000) Error in as.raw(10) + c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c(1L,1L,1L) Error in as.raw(10) + c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c(1i,1i,1i) Error in as.raw(10) + c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c(3.4,3.4,3.4) Error in as.raw(10) + c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c(FALSE,FALSE,FALSE) Error in as.raw(10) + c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c(NULL,NULL,NULL) Error in as.raw(10) + c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c(TRUE,TRUE,TRUE) Error in as.raw(10) + c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)+c(as.raw(10),as.raw(10),as.raw(10)) Error in as.raw(10) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-"hello" Error in as.raw(10) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-((0/0)+1i) Error in as.raw(10) - ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-(-(0/0)) Error in as.raw(10) - (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-(-(1/0)) Error in as.raw(10) - (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-(-0.0) Error in as.raw(10) - (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-(0/0) Error in as.raw(10) - (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-(1+NA) Error in as.raw(10) - (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-(1/0) Error in as.raw(10) - (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-(1i+NA) Error in as.raw(10) - (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-(3.4+NA) Error in as.raw(10) - (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-0.1234567 Error in as.raw(10) - 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-1 Error in as.raw(10) - 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-123456789000 Error in as.raw(10) - 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-1L Error in as.raw(10) - 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-1i Error in as.raw(10) - (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-3.4 Error in as.raw(10) - 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-FALSE Error in as.raw(10) - FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-NULL Error in as.raw(10) - NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-TRUE Error in as.raw(10) - TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-as.raw(10) Error in as.raw(10) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c("hello","hello","hello") Error in as.raw(10) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c(0.1234567,0.1234567,0.1234567) Error in as.raw(10) - c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c(1,1,1) Error in as.raw(10) - c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c(123456789000,123456789000,123456789000) Error in as.raw(10) - c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c(1L,1L,1L) Error in as.raw(10) - c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c(1i,1i,1i) Error in as.raw(10) - c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c(3.4,3.4,3.4) Error in as.raw(10) - c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c(FALSE,FALSE,FALSE) Error in as.raw(10) - c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c(NULL,NULL,NULL) Error in as.raw(10) - c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c(TRUE,TRUE,TRUE) Error in as.raw(10) - c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)-c(as.raw(10),as.raw(10),as.raw(10)) Error in as.raw(10) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/"hello" Error in as.raw(10)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/((0/0)+1i) Error in as.raw(10)/((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/(-(0/0)) Error in as.raw(10)/(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/(-(1/0)) Error in as.raw(10)/(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/(-0.0) Error in as.raw(10)/(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/(0/0) Error in as.raw(10)/(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/(1+NA) Error in as.raw(10)/(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/(1/0) Error in as.raw(10)/(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/(1i+NA) Error in as.raw(10)/(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/(3.4+NA) Error in as.raw(10)/(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/0.1234567 Error in as.raw(10)/0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/1 Error in as.raw(10)/1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/123456789000 Error in as.raw(10)/123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/1L Error in as.raw(10)/1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/1i Error in as.raw(10)/(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/3.4 Error in as.raw(10)/3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/FALSE Error in as.raw(10)/FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/NULL Error in as.raw(10)/NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/TRUE Error in as.raw(10)/TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/as.raw(10) Error in as.raw(10)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c("hello","hello","hello") Error in as.raw(10)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c(0.1234567,0.1234567,0.1234567) Error in as.raw(10)/c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c(1,1,1) Error in as.raw(10)/c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c(123456789000,123456789000,123456789000) Error in as.raw(10)/c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c(1L,1L,1L) Error in as.raw(10)/c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c(1i,1i,1i) Error in as.raw(10)/c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c(3.4,3.4,3.4) Error in as.raw(10)/c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c(FALSE,FALSE,FALSE) Error in as.raw(10)/c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c(NULL,NULL,NULL) Error in as.raw(10)/c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c(TRUE,TRUE,TRUE) Error in as.raw(10)/c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)/c(as.raw(10),as.raw(10),as.raw(10)) Error in as.raw(10)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^"hello" Error in as.raw(10)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^((0/0)+1i) Error in as.raw(10)^((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^(-(0/0)) Error in as.raw(10)^(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^(-(1/0)) Error in as.raw(10)^(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^(-0.0) Error in as.raw(10)^(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^(0/0) Error in as.raw(10)^(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^(1+NA) Error in as.raw(10)^(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^(1/0) Error in as.raw(10)^(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^(1i+NA) Error in as.raw(10)^(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^(3.4+NA) Error in as.raw(10)^(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^0.1234567 Error in as.raw(10)^0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^1 Error in as.raw(10)^1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^123456789000 Error in as.raw(10)^123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^1L Error in as.raw(10)^1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^1i Error in as.raw(10)^(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^3.4 Error in as.raw(10)^3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^FALSE Error in as.raw(10)^FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^NULL Error in as.raw(10)^NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^TRUE Error in as.raw(10)^TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^as.raw(10) Error in as.raw(10)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c("hello","hello","hello") Error in as.raw(10)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c(0.1234567,0.1234567,0.1234567) Error in as.raw(10)^c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c(1,1,1) Error in as.raw(10)^c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c(123456789000,123456789000,123456789000) Error in as.raw(10)^c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c(1L,1L,1L) Error in as.raw(10)^c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c(1i,1i,1i) Error in as.raw(10)^c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c(3.4,3.4,3.4) Error in as.raw(10)^c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c(FALSE,FALSE,FALSE) Error in as.raw(10)^c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c(NULL,NULL,NULL) Error in as.raw(10)^c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c(TRUE,TRUE,TRUE) Error in as.raw(10)^c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #as.raw(10)^c(as.raw(10),as.raw(10),as.raw(10)) Error in as.raw(10)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%"hello" Error in c("hello", "hello", "hello")%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%((0/0)+1i) Error in c("hello", "hello", "hello")%%((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%(-(0/0)) Error in c("hello", "hello", "hello")%%(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%(-(1/0)) Error in c("hello", "hello", "hello")%%(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%(-0.0) Error in c("hello", "hello", "hello")%%(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%(0/0) Error in c("hello", "hello", "hello")%%(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%(1+NA) Error in c("hello", "hello", "hello")%%(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%(1/0) Error in c("hello", "hello", "hello")%%(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%(1i+NA) Error in c("hello", "hello", "hello")%%(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%(3.4+NA) Error in c("hello", "hello", "hello")%%(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%0.1234567 Error in c("hello", "hello", "hello")%%0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%1 Error in c("hello", "hello", "hello")%%1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%123456789000 Error in c("hello", "hello", "hello")%%123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%1L Error in c("hello", "hello", "hello")%%1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%1i Error in c("hello", "hello", "hello")%%(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%3.4 Error in c("hello", "hello", "hello")%%3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%FALSE Error in c("hello", "hello", "hello")%%FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%NULL Error in c("hello", "hello", "hello")%%NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%TRUE Error in c("hello", "hello", "hello")%%TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%as.raw(10) Error in c("hello", "hello", "hello")%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c("hello","hello","hello") Error in c("hello", "hello", "hello")%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c(0.1234567,0.1234567,0.1234567) Error in c("hello", "hello", "hello")%%c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c(1,1,1) Error in c("hello", "hello", "hello")%%c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c(123456789000,123456789000,123456789000) Error in c("hello", "hello", "hello")%%c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c(1L,1L,1L) Error in c("hello", "hello", "hello")%%c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c(1i,1i,1i) Error in c("hello", "hello", "hello")%%c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c(3.4,3.4,3.4) Error in c("hello", "hello", "hello")%%c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c(FALSE,FALSE,FALSE) Error in c("hello", "hello", "hello")%%c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c(NULL,NULL,NULL) Error in c("hello", "hello", "hello")%%c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c(TRUE,TRUE,TRUE) Error in c("hello", "hello", "hello")%%c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c("hello", "hello", "hello")%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*"hello" Error in c("hello", "hello", "hello") * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*((0/0)+1i) Error in c("hello", "hello", "hello") * ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*(-(0/0)) Error in c("hello", "hello", "hello") * (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*(-(1/0)) Error in c("hello", "hello", "hello") * (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*(-0.0) Error in c("hello", "hello", "hello") * (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*(0/0) Error in c("hello", "hello", "hello") * (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*(1+NA) Error in c("hello", "hello", "hello") * (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*(1/0) Error in c("hello", "hello", "hello") * (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*(1i+NA) Error in c("hello", "hello", "hello") * (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*(3.4+NA) Error in c("hello", "hello", "hello") * (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*0.1234567 Error in c("hello", "hello", "hello") * 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*1 Error in c("hello", "hello", "hello") * 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*123456789000 Error in c("hello", "hello", "hello") * 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*1L Error in c("hello", "hello", "hello") * 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*1i Error in c("hello", "hello", "hello") * (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*3.4 Error in c("hello", "hello", "hello") * 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*FALSE Error in c("hello", "hello", "hello") * FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*NULL Error in c("hello", "hello", "hello") * NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*TRUE Error in c("hello", "hello", "hello") * TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*as.raw(10) Error in c("hello", "hello", "hello") * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c("hello","hello","hello") Error in c("hello", "hello", "hello") * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c(0.1234567,0.1234567,0.1234567) Error in c("hello", "hello", "hello") * c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c(1,1,1) Error in c("hello", "hello", "hello") * c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c(123456789000,123456789000,123456789000) Error in c("hello", "hello", "hello") * c(123456789000, 123456789000, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c(1L,1L,1L) Error in c("hello", "hello", "hello") * c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c(1i,1i,1i) Error in c("hello", "hello", "hello") * c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c(3.4,3.4,3.4) Error in c("hello", "hello", "hello") * c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c(FALSE,FALSE,FALSE) Error in c("hello", "hello", "hello") * c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c(NULL,NULL,NULL) Error in c("hello", "hello", "hello") * c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c(TRUE,TRUE,TRUE) Error in c("hello", "hello", "hello") * c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")*c(as.raw(10),as.raw(10),as.raw(10)) Error in c("hello", "hello", "hello") * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+"hello" Error in c("hello", "hello", "hello") + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+((0/0)+1i) Error in c("hello", "hello", "hello") + ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+(-(0/0)) Error in c("hello", "hello", "hello") + (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+(-(1/0)) Error in c("hello", "hello", "hello") + (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+(-0.0) Error in c("hello", "hello", "hello") + (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+(0/0) Error in c("hello", "hello", "hello") + (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+(1+NA) Error in c("hello", "hello", "hello") + (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+(1/0) Error in c("hello", "hello", "hello") + (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+(1i+NA) Error in c("hello", "hello", "hello") + (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+(3.4+NA) Error in c("hello", "hello", "hello") + (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+0.1234567 Error in c("hello", "hello", "hello") + 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+1 Error in c("hello", "hello", "hello") + 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+123456789000 Error in c("hello", "hello", "hello") + 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+1L Error in c("hello", "hello", "hello") + 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+1i Error in c("hello", "hello", "hello") + (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+3.4 Error in c("hello", "hello", "hello") + 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+FALSE Error in c("hello", "hello", "hello") + FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+NULL Error in c("hello", "hello", "hello") + NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+TRUE Error in c("hello", "hello", "hello") + TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+as.raw(10) Error in c("hello", "hello", "hello") + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c("hello","hello","hello") Error in c("hello", "hello", "hello") + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c(0.1234567,0.1234567,0.1234567) Error in c("hello", "hello", "hello") + c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c(1,1,1) Error in c("hello", "hello", "hello") + c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c(123456789000,123456789000,123456789000) Error in c("hello", "hello", "hello") + c(123456789000, 123456789000, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c(1L,1L,1L) Error in c("hello", "hello", "hello") + c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c(1i,1i,1i) Error in c("hello", "hello", "hello") + c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c(3.4,3.4,3.4) Error in c("hello", "hello", "hello") + c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c(FALSE,FALSE,FALSE) Error in c("hello", "hello", "hello") + c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c(NULL,NULL,NULL) Error in c("hello", "hello", "hello") + c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c(TRUE,TRUE,TRUE) Error in c("hello", "hello", "hello") + c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")+c(as.raw(10),as.raw(10),as.raw(10)) Error in c("hello", "hello", "hello") + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-"hello" Error in c("hello", "hello", "hello") - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-((0/0)+1i) Error in c("hello", "hello", "hello") - ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-(-(0/0)) Error in c("hello", "hello", "hello") - (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-(-(1/0)) Error in c("hello", "hello", "hello") - (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-(-0.0) Error in c("hello", "hello", "hello") - (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-(0/0) Error in c("hello", "hello", "hello") - (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-(1+NA) Error in c("hello", "hello", "hello") - (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-(1/0) Error in c("hello", "hello", "hello") - (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-(1i+NA) Error in c("hello", "hello", "hello") - (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-(3.4+NA) Error in c("hello", "hello", "hello") - (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-0.1234567 Error in c("hello", "hello", "hello") - 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-1 Error in c("hello", "hello", "hello") - 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-123456789000 Error in c("hello", "hello", "hello") - 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-1L Error in c("hello", "hello", "hello") - 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-1i Error in c("hello", "hello", "hello") - (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-3.4 Error in c("hello", "hello", "hello") - 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-FALSE Error in c("hello", "hello", "hello") - FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-NULL Error in c("hello", "hello", "hello") - NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-TRUE Error in c("hello", "hello", "hello") - TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-as.raw(10) Error in c("hello", "hello", "hello") - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c("hello","hello","hello") Error in c("hello", "hello", "hello") - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c(0.1234567,0.1234567,0.1234567) Error in c("hello", "hello", "hello") - c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c(1,1,1) Error in c("hello", "hello", "hello") - c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c(123456789000,123456789000,123456789000) Error in c("hello", "hello", "hello") - c(123456789000, 123456789000, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c(1L,1L,1L) Error in c("hello", "hello", "hello") - c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c(1i,1i,1i) Error in c("hello", "hello", "hello") - c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c(3.4,3.4,3.4) Error in c("hello", "hello", "hello") - c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c(FALSE,FALSE,FALSE) Error in c("hello", "hello", "hello") - c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c(NULL,NULL,NULL) Error in c("hello", "hello", "hello") - c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c(TRUE,TRUE,TRUE) Error in c("hello", "hello", "hello") - c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")-c(as.raw(10),as.raw(10),as.raw(10)) Error in c("hello", "hello", "hello") - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/"hello" Error in c("hello", "hello", "hello")/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/((0/0)+1i) Error in c("hello", "hello", "hello")/((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/(-(0/0)) Error in c("hello", "hello", "hello")/(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/(-(1/0)) Error in c("hello", "hello", "hello")/(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/(-0.0) Error in c("hello", "hello", "hello")/(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/(0/0) Error in c("hello", "hello", "hello")/(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/(1+NA) Error in c("hello", "hello", "hello")/(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/(1/0) Error in c("hello", "hello", "hello")/(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/(1i+NA) Error in c("hello", "hello", "hello")/(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/(3.4+NA) Error in c("hello", "hello", "hello")/(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/0.1234567 Error in c("hello", "hello", "hello")/0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/1 Error in c("hello", "hello", "hello")/1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/123456789000 Error in c("hello", "hello", "hello")/123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/1L Error in c("hello", "hello", "hello")/1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/1i Error in c("hello", "hello", "hello")/(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/3.4 Error in c("hello", "hello", "hello")/3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/FALSE Error in c("hello", "hello", "hello")/FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/NULL Error in c("hello", "hello", "hello")/NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/TRUE Error in c("hello", "hello", "hello")/TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/as.raw(10) Error in c("hello", "hello", "hello")/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c("hello","hello","hello") Error in c("hello", "hello", "hello")/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c(0.1234567,0.1234567,0.1234567) Error in c("hello", "hello", "hello")/c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c(1,1,1) Error in c("hello", "hello", "hello")/c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c(123456789000,123456789000,123456789000) Error in c("hello", "hello", "hello")/c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c(1L,1L,1L) Error in c("hello", "hello", "hello")/c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c(1i,1i,1i) Error in c("hello", "hello", "hello")/c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c(3.4,3.4,3.4) Error in c("hello", "hello", "hello")/c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c(FALSE,FALSE,FALSE) Error in c("hello", "hello", "hello")/c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c(NULL,NULL,NULL) Error in c("hello", "hello", "hello")/c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c(TRUE,TRUE,TRUE) Error in c("hello", "hello", "hello")/c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")/c(as.raw(10),as.raw(10),as.raw(10)) Error in c("hello", "hello", "hello")/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^"hello" Error in c("hello", "hello", "hello")^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^((0/0)+1i) Error in c("hello", "hello", "hello")^((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^(-(0/0)) Error in c("hello", "hello", "hello")^(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^(-(1/0)) Error in c("hello", "hello", "hello")^(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^(-0.0) Error in c("hello", "hello", "hello")^(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^(0/0) Error in c("hello", "hello", "hello")^(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^(1+NA) Error in c("hello", "hello", "hello")^(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^(1/0) Error in c("hello", "hello", "hello")^(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^(1i+NA) Error in c("hello", "hello", "hello")^(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^(3.4+NA) Error in c("hello", "hello", "hello")^(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^0.1234567 Error in c("hello", "hello", "hello")^0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^1 Error in c("hello", "hello", "hello")^1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^123456789000 Error in c("hello", "hello", "hello")^123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^1L Error in c("hello", "hello", "hello")^1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^1i Error in c("hello", "hello", "hello")^(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^3.4 Error in c("hello", "hello", "hello")^3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^FALSE Error in c("hello", "hello", "hello")^FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^NULL Error in c("hello", "hello", "hello")^NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^TRUE Error in c("hello", "hello", "hello")^TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^as.raw(10) Error in c("hello", "hello", "hello")^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c("hello","hello","hello") Error in c("hello", "hello", "hello")^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c(0.1234567,0.1234567,0.1234567) Error in c("hello", "hello", "hello")^c(0.1234567, 0.1234567, 0.1234567) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c(1,1,1) Error in c("hello", "hello", "hello")^c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c(123456789000,123456789000,123456789000) Error in c("hello", "hello", "hello")^c(123456789000, 123456789000, 123456789000) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c(1L,1L,1L) Error in c("hello", "hello", "hello")^c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c(1i,1i,1i) Error in c("hello", "hello", "hello")^c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c(3.4,3.4,3.4) Error in c("hello", "hello", "hello")^c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c(FALSE,FALSE,FALSE) Error in c("hello", "hello", "hello")^c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c(NULL,NULL,NULL) Error in c("hello", "hello", "hello")^c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c(TRUE,TRUE,TRUE) Error in c("hello", "hello", "hello")^c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c("hello","hello","hello")^c(as.raw(10),as.raw(10),as.raw(10)) Error in c("hello", "hello", "hello")^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%"hello" Error in c(0.1234567, 0.1234567, 0.1234567)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%(-0.0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%(1/0) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%0.1234567 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%1 [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%123456789000 [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%1L [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%3.4 [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%FALSE [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%TRUE [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%as.raw(10) Error in c(0.1234567, 0.1234567, 0.1234567)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c("hello","hello","hello") Error in c(0.1234567, 0.1234567, 0.1234567)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c(1,1,1) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c(123456789000,123456789000,123456789000) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c(1L,1L,1L) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c(3.4,3.4,3.4) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c(TRUE,TRUE,TRUE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0.1234567, 0.1234567, 0.1234567)%%c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*"hello" Error in c(0.1234567, 0.1234567, 0.1234567) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*(-0.0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*0.1234567 [1] 0.01524156 0.01524156 0.01524156 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*1 [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*123456789000 [1] 15241567763 15241567763 15241567763 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*1L [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*1i [1] 0+0.1234567i 0+0.1234567i 0+0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*3.4 [1] 0.4197528 0.4197528 0.4197528 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*FALSE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*TRUE [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*as.raw(10) Error in c(0.1234567, 0.1234567, 0.1234567) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c("hello","hello","hello") Error in c(0.1234567, 0.1234567, 0.1234567) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c(0.1234567,0.1234567,0.1234567) [1] 0.01524156 0.01524156 0.01524156 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c(1,1,1) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c(123456789000,123456789000,123456789000) [1] 15241567763 15241567763 15241567763 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c(1L,1L,1L) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c(1i,1i,1i) [1] 0+0.1234567i 0+0.1234567i 0+0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c(3.4,3.4,3.4) [1] 0.4197528 0.4197528 0.4197528 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c(TRUE,TRUE,TRUE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)*c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0.1234567, 0.1234567, 0.1234567) * c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+"hello" Error in c(0.1234567, 0.1234567, 0.1234567) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+((0/0)+1i) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+(-0.0) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+0.1234567 [1] 0.2469134 0.2469134 0.2469134 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+1 [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+123456789000 [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+1L [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+1i [1] 0.123457+1i 0.123457+1i 0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+3.4 [1] 3.523457 3.523457 3.523457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+FALSE [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+TRUE [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+as.raw(10) Error in c(0.1234567, 0.1234567, 0.1234567) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c("hello","hello","hello") Error in c(0.1234567, 0.1234567, 0.1234567) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c(0.1234567,0.1234567,0.1234567) [1] 0.2469134 0.2469134 0.2469134 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c(1,1,1) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c(1L,1L,1L) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c(1i,1i,1i) [1] 0.123457+1i 0.123457+1i 0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c(3.4,3.4,3.4) [1] 3.523457 3.523457 3.523457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c(FALSE,FALSE,FALSE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c(TRUE,TRUE,TRUE) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)+c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0.1234567, 0.1234567, 0.1234567) + c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-"hello" Error in c(0.1234567, 0.1234567, 0.1234567) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-((0/0)+1i) [1] NaN-1i NaN-1i NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-(-(1/0)) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-(-0.0) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-(1/0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-0.1234567 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-1 [1] -0.8765433 -0.8765433 -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-123456789000 [1] -123456789000 -123456789000 -123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-1L [1] -0.8765433 -0.8765433 -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-1i [1] 0.123457-1i 0.123457-1i 0.123457-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-3.4 [1] -3.276543 -3.276543 -3.276543 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-FALSE [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-TRUE [1] -0.8765433 -0.8765433 -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-as.raw(10) Error in c(0.1234567, 0.1234567, 0.1234567) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c("hello","hello","hello") Error in c(0.1234567, 0.1234567, 0.1234567) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c(1,1,1) [1] -0.8765433 -0.8765433 -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c(123456789000,123456789000,123456789000) [1] -123456789000 -123456789000 -123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c(1L,1L,1L) [1] -0.8765433 -0.8765433 -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c(1i,1i,1i) [1] 0.123457-1i 0.123457-1i 0.123457-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c(3.4,3.4,3.4) [1] -3.276543 -3.276543 -3.276543 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c(FALSE,FALSE,FALSE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c(TRUE,TRUE,TRUE) [1] -0.8765433 -0.8765433 -0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)-c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0.1234567, 0.1234567, 0.1234567) - c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/"hello" Error in c(0.1234567, 0.1234567, 0.1234567)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/(-(1/0)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/(-0.0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/(1/0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/0.1234567 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/1 [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/123456789000 [1] 9.999993e-13 9.999993e-13 9.999993e-13 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/1L [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/1i [1] 0-0.1234567i 0-0.1234567i 0-0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/3.4 [1] 0.03631079 0.03631079 0.03631079 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/FALSE [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/TRUE [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/as.raw(10) Error in c(0.1234567, 0.1234567, 0.1234567)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c("hello","hello","hello") Error in c(0.1234567, 0.1234567, 0.1234567)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c(0.1234567,0.1234567,0.1234567) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c(1,1,1) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c(123456789000,123456789000,123456789000) [1] 9.999993e-13 9.999993e-13 9.999993e-13 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c(1L,1L,1L) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c(1i,1i,1i) [1] 0-0.1234567i 0-0.1234567i 0-0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c(3.4,3.4,3.4) [1] 0.03631079 0.03631079 0.03631079 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c(TRUE,TRUE,TRUE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)/c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0.1234567, 0.1234567, 0.1234567)/c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^"hello" Error in c(0.1234567, 0.1234567, 0.1234567)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^(-(1/0)) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^(1/0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^(1i+NA) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^0.1234567 [1] 0.7723985 0.7723985 0.7723985 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^1 [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^123456789000 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^1L [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^1i [1] -0.4978071-0.8672878i -0.4978071-0.8672878i -0.4978071-0.8672878i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^3.4 [1] 0.0008149855 0.0008149855 0.0008149855 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^TRUE [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^as.raw(10) Error in c(0.1234567, 0.1234567, 0.1234567)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c("hello","hello","hello") Error in c(0.1234567, 0.1234567, 0.1234567)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c(0.1234567,0.1234567,0.1234567) [1] 0.7723985 0.7723985 0.7723985 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c(1,1,1) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c(1L,1L,1L) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c(1i,1i,1i) [1] -0.4978071-0.8672878i -0.4978071-0.8672878i -0.4978071-0.8672878i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c(3.4,3.4,3.4) [1] 0.0008149855 0.0008149855 0.0008149855 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c(TRUE,TRUE,TRUE) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(0.1234567,0.1234567,0.1234567)^c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0.1234567, 0.1234567, 0.1234567)^c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%"hello" Error in c(1, 1, 1)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%(-0.0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%(1/0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%0.1234567 [1] 0.0123464 0.0123464 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%123456789000 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%3.4 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%FALSE [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%as.raw(10) Error in c(1, 1, 1)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c("hello","hello","hello") Error in c(1, 1, 1)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c(0.1234567,0.1234567,0.1234567) [1] 0.0123464 0.0123464 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1, 1, 1)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*"hello" Error in c(1, 1, 1) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*(-0.0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*0.1234567 [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*1 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*123456789000 [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*1L [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*1i [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*3.4 [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*FALSE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*TRUE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*as.raw(10) Error in c(1, 1, 1) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c("hello","hello","hello") Error in c(1, 1, 1) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c(0.1234567,0.1234567,0.1234567) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c(1i,1i,1i) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c(3.4,3.4,3.4) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)*c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1, 1, 1) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+"hello" Error in c(1, 1, 1) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+((0/0)+1i) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+0.1234567 [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+1 [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+123456789000 [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+1L [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+1i [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+3.4 [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+TRUE [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+as.raw(10) Error in c(1, 1, 1) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c("hello","hello","hello") Error in c(1, 1, 1) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c(0.1234567,0.1234567,0.1234567) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c(1,1,1) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c(123456789000,123456789000,123456789000) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c(1L,1L,1L) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c(1i,1i,1i) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c(3.4,3.4,3.4) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c(TRUE,TRUE,TRUE) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)+c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1, 1, 1) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-"hello" Error in c(1, 1, 1) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-((0/0)+1i) [1] NaN-1i NaN-1i NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-(-(1/0)) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-(1/0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-0.1234567 [1] 0.8765433 0.8765433 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-123456789000 [1] -123456788999 -123456788999 -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-1i [1] 1-1i 1-1i 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-3.4 [1] -2.4 -2.4 -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-as.raw(10) Error in c(1, 1, 1) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c("hello","hello","hello") Error in c(1, 1, 1) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c(0.1234567,0.1234567,0.1234567) [1] 0.8765433 0.8765433 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c(123456789000,123456789000,123456789000) [1] -123456788999 -123456788999 -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c(1i,1i,1i) [1] 1-1i 1-1i 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c(3.4,3.4,3.4) [1] -2.4 -2.4 -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)-c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1, 1, 1) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/"hello" Error in c(1, 1, 1)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/(-(1/0)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/(-0.0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/(1/0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/0.1234567 [1] 8.100006 8.100006 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/1 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/123456789000 [1] 8.1e-12 8.1e-12 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/1L [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/1i [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/3.4 [1] 0.2941176 0.2941176 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/FALSE [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/TRUE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/as.raw(10) Error in c(1, 1, 1)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c("hello","hello","hello") Error in c(1, 1, 1)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c(0.1234567,0.1234567,0.1234567) [1] 8.100006 8.100006 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c(123456789000,123456789000,123456789000) [1] 8.1e-12 8.1e-12 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c(1i,1i,1i) [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c(3.4,3.4,3.4) [1] 0.2941176 0.2941176 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)/c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1, 1, 1)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^"hello" Error in c(1, 1, 1)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^(-(0/0)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^(-(1/0)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^(0/0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^(1+NA) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^(1/0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^(1i+NA) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^(3.4+NA) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^0.1234567 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^1 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^123456789000 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^1L [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^1i [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^3.4 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^TRUE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^as.raw(10) Error in c(1, 1, 1)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c("hello","hello","hello") Error in c(1, 1, 1)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c(0.1234567,0.1234567,0.1234567) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c(1i,1i,1i) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1,1,1)^c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1, 1, 1)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%"hello" Error in c(123456789000, 123456789000, 123456789000)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%(-0.0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%(1/0) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%0.1234567 [1] 0.06496745 0.06496745 0.06496745 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%123456789000 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%3.4 [1] 0.4000032 0.4000032 0.4000032 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%FALSE [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%as.raw(10) Error in c(123456789000, 123456789000, 123456789000)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c("hello","hello","hello") Error in c(123456789000, 123456789000, 123456789000)%%c("hello", "hello", : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c(0.1234567,0.1234567,0.1234567) [1] 0.06496745 0.06496745 0.06496745 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c(3.4,3.4,3.4) [1] 0.4000032 0.4000032 0.4000032 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c(123456789000, 123456789000, 123456789000)%%c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*"hello" Error in c(123456789000, 123456789000, 123456789000) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*(-0.0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*0.1234567 [1] 15241567763 15241567763 15241567763 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*1 [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*123456789000 [1] 1.524158e+22 1.524158e+22 1.524158e+22 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*1L [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*1i [1] 0+123456789000i 0+123456789000i 0+123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*3.4 [1] 419753082600 419753082600 419753082600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*FALSE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*TRUE [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*as.raw(10) Error in c(123456789000, 123456789000, 123456789000) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c("hello","hello","hello") Error in c(123456789000, 123456789000, 123456789000) * c("hello", "hello", : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c(0.1234567,0.1234567,0.1234567) [1] 15241567763 15241567763 15241567763 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c(1,1,1) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c(123456789000,123456789000,123456789000) [1] 1.524158e+22 1.524158e+22 1.524158e+22 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c(1L,1L,1L) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c(1i,1i,1i) [1] 0+123456789000i 0+123456789000i 0+123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c(3.4,3.4,3.4) [1] 419753082600 419753082600 419753082600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c(TRUE,TRUE,TRUE) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)*c(as.raw(10),as.raw(10),as.raw(10)) Error in c(123456789000, 123456789000, 123456789000) * c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+"hello" Error in c(123456789000, 123456789000, 123456789000) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+((0/0)+1i) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+(-0.0) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+0.1234567 [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+1 [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+123456789000 [1] 246913578000 246913578000 246913578000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+1L [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+1i [1] 123456789000+0i 123456789000+0i 123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+3.4 [1] 123456789003 123456789003 123456789003 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+FALSE [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+TRUE [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+as.raw(10) Error in c(123456789000, 123456789000, 123456789000) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c("hello","hello","hello") Error in c(123456789000, 123456789000, 123456789000) + c("hello", "hello", : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c(0.1234567,0.1234567,0.1234567) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c(1,1,1) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c(123456789000,123456789000,123456789000) [1] 246913578000 246913578000 246913578000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c(1L,1L,1L) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c(1i,1i,1i) [1] 123456789000+0i 123456789000+0i 123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c(3.4,3.4,3.4) [1] 123456789003 123456789003 123456789003 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c(FALSE,FALSE,FALSE) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c(TRUE,TRUE,TRUE) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)+c(as.raw(10),as.raw(10),as.raw(10)) Error in c(123456789000, 123456789000, 123456789000) + c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-"hello" Error in c(123456789000, 123456789000, 123456789000) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-((0/0)+1i) [1] NaN-1i NaN-1i NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-(-(1/0)) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-(-0.0) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-(1/0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-0.1234567 [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-1 [1] 123456788999 123456788999 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-123456789000 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-1L [1] 123456788999 123456788999 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-1i [1] 123456789000-0i 123456789000-0i 123456789000-0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-3.4 [1] 123456788997 123456788997 123456788997 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-FALSE [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-TRUE [1] 123456788999 123456788999 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-as.raw(10) Error in c(123456789000, 123456789000, 123456789000) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c("hello","hello","hello") Error in c(123456789000, 123456789000, 123456789000) - c("hello", "hello", : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c(0.1234567,0.1234567,0.1234567) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c(1,1,1) [1] 123456788999 123456788999 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c(1L,1L,1L) [1] 123456788999 123456788999 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c(1i,1i,1i) [1] 123456789000-0i 123456789000-0i 123456789000-0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c(3.4,3.4,3.4) [1] 123456788997 123456788997 123456788997 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c(FALSE,FALSE,FALSE) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c(TRUE,TRUE,TRUE) [1] 123456788999 123456788999 123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)-c(as.raw(10),as.raw(10),as.raw(10)) Error in c(123456789000, 123456789000, 123456789000) - c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/"hello" Error in c(123456789000, 123456789000, 123456789000)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/(-(1/0)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/(-0.0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/(1/0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/0.1234567 [1] 1.000001e+12 1.000001e+12 1.000001e+12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/1 [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/123456789000 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/1L [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/1i [1] 0-123456789000i 0-123456789000i 0-123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/3.4 [1] 36310820294 36310820294 36310820294 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/FALSE [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/TRUE [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/as.raw(10) Error in c(123456789000, 123456789000, 123456789000)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c("hello","hello","hello") Error in c(123456789000, 123456789000, 123456789000)/c("hello", "hello", : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c(0.1234567,0.1234567,0.1234567) [1] 1.000001e+12 1.000001e+12 1.000001e+12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c(1,1,1) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c(1L,1L,1L) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c(1i,1i,1i) [1] 0-123456789000i 0-123456789000i 0-123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c(3.4,3.4,3.4) [1] 36310820294 36310820294 36310820294 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c(TRUE,TRUE,TRUE) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)/c(as.raw(10),as.raw(10),as.raw(10)) Error in c(123456789000, 123456789000, 123456789000)/c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^"hello" Error in c(123456789000, 123456789000, 123456789000)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^(-(1/0)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^(1i+NA) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^0.1234567 [1] 23.40571 23.40571 23.40571 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^1 [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^123456789000 [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^1L [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^1i [1] 0.9185436+0.3953196i 0.9185436+0.3953196i 0.9185436+0.3953196i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^3.4 [1] 5.142223e+37 5.142223e+37 5.142223e+37 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^TRUE [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^as.raw(10) Error in c(123456789000, 123456789000, 123456789000)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c("hello","hello","hello") Error in c(123456789000, 123456789000, 123456789000)^c("hello", "hello", : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c(0.1234567,0.1234567,0.1234567) [1] 23.40571 23.40571 23.40571 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c(1,1,1) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c(123456789000,123456789000,123456789000) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c(1L,1L,1L) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c(1i,1i,1i) [1] 0.9185436+0.3953196i 0.9185436+0.3953196i 0.9185436+0.3953196i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c(3.4,3.4,3.4) [1] 5.142223e+37 5.142223e+37 5.142223e+37 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c(TRUE,TRUE,TRUE) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(123456789000,123456789000,123456789000)^c(as.raw(10),as.raw(10),as.raw(10)) Error in c(123456789000, 123456789000, 123456789000)^c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%"hello" Error in c(1L, 1L, 1L)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%(-0.0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%(1/0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%0.1234567 [1] 0.0123464 0.0123464 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%123456789000 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%3.4 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%FALSE [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%as.raw(10) Error in c(1L, 1L, 1L)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c("hello","hello","hello") Error in c(1L, 1L, 1L)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c(0.1234567,0.1234567,0.1234567) [1] 0.0123464 0.0123464 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1L, 1L, 1L)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*"hello" Error in c(1L, 1L, 1L) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*(-0.0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*0.1234567 [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*1 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*123456789000 [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*1L [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*1i [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*3.4 [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*FALSE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*TRUE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*as.raw(10) Error in c(1L, 1L, 1L) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c("hello","hello","hello") Error in c(1L, 1L, 1L) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c(0.1234567,0.1234567,0.1234567) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c(1i,1i,1i) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c(3.4,3.4,3.4) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)*c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1L, 1L, 1L) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+"hello" Error in c(1L, 1L, 1L) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+((0/0)+1i) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+0.1234567 [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+1 [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+123456789000 [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+1L [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+1i [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+3.4 [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+TRUE [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+as.raw(10) Error in c(1L, 1L, 1L) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c("hello","hello","hello") Error in c(1L, 1L, 1L) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c(0.1234567,0.1234567,0.1234567) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c(1,1,1) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c(123456789000,123456789000,123456789000) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c(1L,1L,1L) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c(1i,1i,1i) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c(3.4,3.4,3.4) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c(TRUE,TRUE,TRUE) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)+c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1L, 1L, 1L) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-"hello" Error in c(1L, 1L, 1L) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-((0/0)+1i) [1] NaN-1i NaN-1i NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-(-(1/0)) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-(1/0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-0.1234567 [1] 0.8765433 0.8765433 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-123456789000 [1] -123456788999 -123456788999 -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-1i [1] 1-1i 1-1i 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-3.4 [1] -2.4 -2.4 -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-as.raw(10) Error in c(1L, 1L, 1L) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c("hello","hello","hello") Error in c(1L, 1L, 1L) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c(0.1234567,0.1234567,0.1234567) [1] 0.8765433 0.8765433 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c(123456789000,123456789000,123456789000) [1] -123456788999 -123456788999 -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c(1i,1i,1i) [1] 1-1i 1-1i 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c(3.4,3.4,3.4) [1] -2.4 -2.4 -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)-c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1L, 1L, 1L) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/"hello" Error in c(1L, 1L, 1L)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/(-(1/0)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/(-0.0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/(1/0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/0.1234567 [1] 8.100006 8.100006 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/1 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/123456789000 [1] 8.1e-12 8.1e-12 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/1L [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/1i [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/3.4 [1] 0.2941176 0.2941176 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/FALSE [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/TRUE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/as.raw(10) Error in c(1L, 1L, 1L)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c("hello","hello","hello") Error in c(1L, 1L, 1L)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c(0.1234567,0.1234567,0.1234567) [1] 8.100006 8.100006 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c(123456789000,123456789000,123456789000) [1] 8.1e-12 8.1e-12 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c(1i,1i,1i) [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c(3.4,3.4,3.4) [1] 0.2941176 0.2941176 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)/c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1L, 1L, 1L)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^"hello" Error in c(1L, 1L, 1L)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^(-(0/0)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^(-(1/0)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^(0/0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^(1+NA) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^(1/0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^(1i+NA) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^(3.4+NA) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^0.1234567 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^1 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^123456789000 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^1L [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^1i [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^3.4 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^TRUE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^as.raw(10) Error in c(1L, 1L, 1L)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c("hello","hello","hello") Error in c(1L, 1L, 1L)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c(0.1234567,0.1234567,0.1234567) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c(1i,1i,1i) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1L,1L,1L)^c(as.raw(10),as.raw(10),as.raw(10)) Error in c(1L, 1L, 1L)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%"hello" Error in c(0+1i, 0+1i, 0+1i)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%(-(0/0)) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%(-(1/0)) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%(-0.0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%(0/0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%(1+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%(1/0) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%(3.4+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%0.1234567 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%1 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%123456789000 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%1L Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%3.4 Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%FALSE Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%TRUE Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%as.raw(10) Error in c(0+1i, 0+1i, 0+1i)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c("hello","hello","hello") Error in c(0+1i, 0+1i, 0+1i)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c(0.1234567,0.1234567,0.1234567) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c(1,1,1) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c(123456789000,123456789000,123456789000) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c(1L,1L,1L) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c(3.4,3.4,3.4) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c(FALSE,FALSE,FALSE) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c(TRUE,TRUE,TRUE) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0+1i, 0+1i, 0+1i)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*"hello" Error in c(0+1i, 0+1i, 0+1i) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*(-(0/0)) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*(-(1/0)) [1] NaN-Infi NaN-Infi NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*(-0.0) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*(0/0) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*(1/0) [1] NaN+Infi NaN+Infi NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*0.1234567 [1] 0+0.1234567i 0+0.1234567i 0+0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*1 [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*123456789000 [1] 0+123456789000i 0+123456789000i 0+123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*1L [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*1i [1] -1+0i -1+0i -1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*3.4 [1] 0+3.4i 0+3.4i 0+3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*FALSE [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*TRUE [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*as.raw(10) Error in c(0+1i, 0+1i, 0+1i) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c("hello","hello","hello") Error in c(0+1i, 0+1i, 0+1i) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c(0.1234567,0.1234567,0.1234567) [1] 0+0.1234567i 0+0.1234567i 0+0.1234567i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c(1,1,1) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c(123456789000,123456789000,123456789000) [1] 0+123456789000i 0+123456789000i 0+123456789000i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c(1L,1L,1L) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c(1i,1i,1i) [1] -1+0i -1+0i -1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c(3.4,3.4,3.4) [1] 0+3.4i 0+3.4i 0+3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c(FALSE,FALSE,FALSE) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c(TRUE,TRUE,TRUE) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)*c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0+1i, 0+1i, 0+1i) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+"hello" Error in c(0+1i, 0+1i, 0+1i) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+((0/0)+1i) [1] NaN+2i NaN+2i NaN+2i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+(-(0/0)) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+(-(1/0)) [1] -Inf+1i -Inf+1i -Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+(-0.0) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+(0/0) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+(1/0) [1] Inf+1i Inf+1i Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+0.1234567 [1] 0.123457+1i 0.123457+1i 0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+1 [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+123456789000 [1] 123456789000+0i 123456789000+0i 123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+1L [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+1i [1] 0+2i 0+2i 0+2i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+3.4 [1] 3.4+1i 3.4+1i 3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+FALSE [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+TRUE [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+as.raw(10) Error in c(0+1i, 0+1i, 0+1i) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c("hello","hello","hello") Error in c(0+1i, 0+1i, 0+1i) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c(0.1234567,0.1234567,0.1234567) [1] 0.123457+1i 0.123457+1i 0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c(1,1,1) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c(123456789000,123456789000,123456789000) [1] 123456789000+0i 123456789000+0i 123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c(1L,1L,1L) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c(1i,1i,1i) [1] 0+2i 0+2i 0+2i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c(3.4,3.4,3.4) [1] 3.4+1i 3.4+1i 3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c(FALSE,FALSE,FALSE) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c(TRUE,TRUE,TRUE) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)+c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0+1i, 0+1i, 0+1i) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-"hello" Error in c(0+1i, 0+1i, 0+1i) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-((0/0)+1i) [1] NaN+0i NaN+0i NaN+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-(-(0/0)) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-(-(1/0)) [1] Inf+1i Inf+1i Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-(-0.0) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-(0/0) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-(1/0) [1] -Inf+1i -Inf+1i -Inf+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-0.1234567 [1] -0.123457+1i -0.123457+1i -0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-1 [1] -1+1i -1+1i -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-123456789000 [1] -123456789000+0i -123456789000+0i -123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-1L [1] -1+1i -1+1i -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-1i [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-3.4 [1] -3.4+1i -3.4+1i -3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-FALSE [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-TRUE [1] -1+1i -1+1i -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-as.raw(10) Error in c(0+1i, 0+1i, 0+1i) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c("hello","hello","hello") Error in c(0+1i, 0+1i, 0+1i) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c(0.1234567,0.1234567,0.1234567) [1] -0.123457+1i -0.123457+1i -0.123457+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c(1,1,1) [1] -1+1i -1+1i -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c(123456789000,123456789000,123456789000) [1] -123456789000+0i -123456789000+0i -123456789000+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c(1L,1L,1L) [1] -1+1i -1+1i -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c(1i,1i,1i) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c(3.4,3.4,3.4) [1] -3.4+1i -3.4+1i -3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c(FALSE,FALSE,FALSE) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c(TRUE,TRUE,TRUE) [1] -1+1i -1+1i -1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)-c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0+1i, 0+1i, 0+1i) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/"hello" Error in c(0+1i, 0+1i, 0+1i)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/(-(0/0)) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/(-(1/0)) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/(-0.0) [1] NaN-Infi NaN-Infi NaN-Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/(0/0) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/(1/0) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/0.1234567 [1] 0+8.100006i 0+8.100006i 0+8.100006i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/1 [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/123456789000 [1] 0+8.1e-12i 0+8.1e-12i 0+8.1e-12i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/1L [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/1i [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/3.4 [1] 0+0.2941176i 0+0.2941176i 0+0.2941176i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/FALSE [1] NaN+Infi NaN+Infi NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/TRUE [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/as.raw(10) Error in c(0+1i, 0+1i, 0+1i)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c("hello","hello","hello") Error in c(0+1i, 0+1i, 0+1i)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c(0.1234567,0.1234567,0.1234567) [1] 0+8.100006i 0+8.100006i 0+8.100006i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c(1,1,1) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c(123456789000,123456789000,123456789000) [1] 0+8.1e-12i 0+8.1e-12i 0+8.1e-12i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c(1L,1L,1L) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c(1i,1i,1i) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c(3.4,3.4,3.4) [1] 0+0.2941176i 0+0.2941176i 0+0.2941176i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c(FALSE,FALSE,FALSE) [1] NaN+Infi NaN+Infi NaN+Infi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c(TRUE,TRUE,TRUE) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)/c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0+1i, 0+1i, 0+1i)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^"hello" Error in c(0+1i, 0+1i, 0+1i)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^(-(0/0)) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^(-(1/0)) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^(-0.0) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^(0/0) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^(1+NA) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^(1/0) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^(1i+NA) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^(3.4+NA) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^0.1234567 [1] 0.9812553+0.1927121i 0.9812553+0.1927121i 0.9812553+0.1927121i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^1 [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^123456789000 [1] 1-0.0000079i 1-0.0000079i 1-0.0000079i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^1L [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^1i [1] 0.2078796+0i 0.2078796+0i 0.2078796+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^3.4 [1] 0.5877853-0.809017i 0.5877853-0.809017i 0.5877853-0.809017i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^FALSE [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^NULL complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^TRUE [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^as.raw(10) Error in c(0+1i, 0+1i, 0+1i)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c("hello","hello","hello") Error in c(0+1i, 0+1i, 0+1i)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c(0.1234567,0.1234567,0.1234567) [1] 0.9812553+0.1927121i 0.9812553+0.1927121i 0.9812553+0.1927121i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c(1,1,1) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c(123456789000,123456789000,123456789000) [1] 1-0.0000079i 1-0.0000079i 1-0.0000079i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c(1L,1L,1L) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c(1i,1i,1i) [1] 0.2078796+0i 0.2078796+0i 0.2078796+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c(3.4,3.4,3.4) [1] 0.5877853-0.809017i 0.5877853-0.809017i 0.5877853-0.809017i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c(FALSE,FALSE,FALSE) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c(NULL,NULL,NULL) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c(TRUE,TRUE,TRUE) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(1i,1i,1i)^c(as.raw(10),as.raw(10),as.raw(10)) Error in c(0+1i, 0+1i, 0+1i)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%"hello" Error in c(3.4, 3.4, 3.4)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%(-0.0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%(1/0) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%0.1234567 [1] 0.0666691 0.0666691 0.0666691 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%1 [1] 0.4 0.4 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%123456789000 [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%1L [1] 0.4 0.4 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%3.4 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%FALSE [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%TRUE [1] 0.4 0.4 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%as.raw(10) Error in c(3.4, 3.4, 3.4)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c("hello","hello","hello") Error in c(3.4, 3.4, 3.4)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c(0.1234567,0.1234567,0.1234567) [1] 0.0666691 0.0666691 0.0666691 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c(1,1,1) [1] 0.4 0.4 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c(123456789000,123456789000,123456789000) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c(1L,1L,1L) [1] 0.4 0.4 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c(TRUE,TRUE,TRUE) [1] 0.4 0.4 0.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c(3.4, 3.4, 3.4)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*"hello" Error in c(3.4, 3.4, 3.4) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*(-0.0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*0.1234567 [1] 0.4197528 0.4197528 0.4197528 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*1 [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*123456789000 [1] 419753082600 419753082600 419753082600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*1L [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*1i [1] 0+3.4i 0+3.4i 0+3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*3.4 [1] 11.56 11.56 11.56 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*FALSE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*TRUE [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*as.raw(10) Error in c(3.4, 3.4, 3.4) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c("hello","hello","hello") Error in c(3.4, 3.4, 3.4) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c(0.1234567,0.1234567,0.1234567) [1] 0.4197528 0.4197528 0.4197528 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c(1,1,1) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c(123456789000,123456789000,123456789000) [1] 419753082600 419753082600 419753082600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c(1L,1L,1L) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c(1i,1i,1i) [1] 0+3.4i 0+3.4i 0+3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c(3.4,3.4,3.4) [1] 11.56 11.56 11.56 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c(TRUE,TRUE,TRUE) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)*c(as.raw(10),as.raw(10),as.raw(10)) Error in c(3.4, 3.4, 3.4) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+"hello" Error in c(3.4, 3.4, 3.4) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+((0/0)+1i) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+(-0.0) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+0.1234567 [1] 3.523457 3.523457 3.523457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+1 [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+123456789000 [1] 123456789003 123456789003 123456789003 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+1L [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+1i [1] 3.4+1i 3.4+1i 3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+3.4 [1] 6.8 6.8 6.8 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+FALSE [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+TRUE [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+as.raw(10) Error in c(3.4, 3.4, 3.4) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c("hello","hello","hello") Error in c(3.4, 3.4, 3.4) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c(0.1234567,0.1234567,0.1234567) [1] 3.523457 3.523457 3.523457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c(1,1,1) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c(123456789000,123456789000,123456789000) [1] 123456789003 123456789003 123456789003 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c(1L,1L,1L) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c(1i,1i,1i) [1] 3.4+1i 3.4+1i 3.4+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c(3.4,3.4,3.4) [1] 6.8 6.8 6.8 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c(FALSE,FALSE,FALSE) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c(TRUE,TRUE,TRUE) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)+c(as.raw(10),as.raw(10),as.raw(10)) Error in c(3.4, 3.4, 3.4) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-"hello" Error in c(3.4, 3.4, 3.4) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-((0/0)+1i) [1] NaN-1i NaN-1i NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-(-(1/0)) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-(-0.0) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-(1/0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-0.1234567 [1] 3.276543 3.276543 3.276543 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-1 [1] 2.4 2.4 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-123456789000 [1] -123456788997 -123456788997 -123456788997 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-1L [1] 2.4 2.4 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-1i [1] 3.4-1i 3.4-1i 3.4-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-3.4 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-FALSE [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-TRUE [1] 2.4 2.4 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-as.raw(10) Error in c(3.4, 3.4, 3.4) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c("hello","hello","hello") Error in c(3.4, 3.4, 3.4) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c(0.1234567,0.1234567,0.1234567) [1] 3.276543 3.276543 3.276543 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c(1,1,1) [1] 2.4 2.4 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c(123456789000,123456789000,123456789000) [1] -123456788997 -123456788997 -123456788997 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c(1L,1L,1L) [1] 2.4 2.4 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c(1i,1i,1i) [1] 3.4-1i 3.4-1i 3.4-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c(FALSE,FALSE,FALSE) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c(TRUE,TRUE,TRUE) [1] 2.4 2.4 2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)-c(as.raw(10),as.raw(10),as.raw(10)) Error in c(3.4, 3.4, 3.4) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/"hello" Error in c(3.4, 3.4, 3.4)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/(-(1/0)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/(-0.0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/(1/0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/0.1234567 [1] 27.54002 27.54002 27.54002 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/1 [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/123456789000 [1] 2.754e-11 2.754e-11 2.754e-11 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/1L [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/1i [1] 0-3.4i 0-3.4i 0-3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/3.4 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/FALSE [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/TRUE [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/as.raw(10) Error in c(3.4, 3.4, 3.4)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c("hello","hello","hello") Error in c(3.4, 3.4, 3.4)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c(0.1234567,0.1234567,0.1234567) [1] 27.54002 27.54002 27.54002 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c(1,1,1) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c(123456789000,123456789000,123456789000) [1] 2.754e-11 2.754e-11 2.754e-11 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c(1L,1L,1L) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c(1i,1i,1i) [1] 0-3.4i 0-3.4i 0-3.4i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c(TRUE,TRUE,TRUE) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)/c(as.raw(10),as.raw(10),as.raw(10)) Error in c(3.4, 3.4, 3.4)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^"hello" Error in c(3.4, 3.4, 3.4)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^(-(1/0)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^(1i+NA) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^0.1234567 [1] 1.163094 1.163094 1.163094 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^1 [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^123456789000 [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^1L [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^1i [1] 0.3400978+0.9403901i 0.3400978+0.9403901i 0.3400978+0.9403901i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^3.4 [1] 64.12514 64.12514 64.12514 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^TRUE [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^as.raw(10) Error in c(3.4, 3.4, 3.4)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c("hello","hello","hello") Error in c(3.4, 3.4, 3.4)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c(0.1234567,0.1234567,0.1234567) [1] 1.163094 1.163094 1.163094 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c(1,1,1) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c(123456789000,123456789000,123456789000) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c(1L,1L,1L) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c(1i,1i,1i) [1] 0.3400978+0.9403901i 0.3400978+0.9403901i 0.3400978+0.9403901i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c(3.4,3.4,3.4) [1] 64.12514 64.12514 64.12514 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c(TRUE,TRUE,TRUE) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(3.4,3.4,3.4)^c(as.raw(10),as.raw(10),as.raw(10)) Error in c(3.4, 3.4, 3.4)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%"hello" Error in c(FALSE, FALSE, FALSE)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%(-(1/0)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%(-0.0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%(1/0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%0.1234567 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%123456789000 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%3.4 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%FALSE [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%as.raw(10) Error in c(FALSE, FALSE, FALSE)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c("hello","hello","hello") Error in c(FALSE, FALSE, FALSE)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c(FALSE, FALSE, FALSE)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*"hello" Error in c(FALSE, FALSE, FALSE) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*(-(1/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*(-0.0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*(1/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*0.1234567 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*123456789000 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*1i [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*3.4 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*FALSE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*as.raw(10) Error in c(FALSE, FALSE, FALSE) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c("hello","hello","hello") Error in c(FALSE, FALSE, FALSE) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c(1i,1i,1i) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)*c(as.raw(10),as.raw(10),as.raw(10)) Error in c(FALSE, FALSE, FALSE) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+"hello" Error in c(FALSE, FALSE, FALSE) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+((0/0)+1i) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+(-0.0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+0.1234567 [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+1 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+123456789000 [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+1L [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+1i [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+3.4 [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+FALSE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+TRUE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+as.raw(10) Error in c(FALSE, FALSE, FALSE) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c("hello","hello","hello") Error in c(FALSE, FALSE, FALSE) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c(0.1234567,0.1234567,0.1234567) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c(1i,1i,1i) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c(3.4,3.4,3.4) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)+c(as.raw(10),as.raw(10),as.raw(10)) Error in c(FALSE, FALSE, FALSE) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-"hello" Error in c(FALSE, FALSE, FALSE) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-((0/0)+1i) [1] NaN-1i NaN-1i NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-(-(1/0)) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-(-0.0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-(1/0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-0.1234567 [1] -0.1234567 -0.1234567 -0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-1 [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-123456789000 [1] -123456789000 -123456789000 -123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-1L [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-1i [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-3.4 [1] -3.4 -3.4 -3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-FALSE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-TRUE [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-as.raw(10) Error in c(FALSE, FALSE, FALSE) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c("hello","hello","hello") Error in c(FALSE, FALSE, FALSE) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c(0.1234567,0.1234567,0.1234567) [1] -0.1234567 -0.1234567 -0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c(1,1,1) [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c(123456789000,123456789000,123456789000) [1] -123456789000 -123456789000 -123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c(1L,1L,1L) [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c(1i,1i,1i) [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c(3.4,3.4,3.4) [1] -3.4 -3.4 -3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c(TRUE,TRUE,TRUE) [1] -1 -1 -1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)-c(as.raw(10),as.raw(10),as.raw(10)) Error in c(FALSE, FALSE, FALSE) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/"hello" Error in c(FALSE, FALSE, FALSE)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/(-(1/0)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/(-0.0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/(1/0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/0.1234567 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/123456789000 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/1i [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/3.4 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/FALSE [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/as.raw(10) Error in c(FALSE, FALSE, FALSE)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c("hello","hello","hello") Error in c(FALSE, FALSE, FALSE)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c(1i,1i,1i) [1] 0+0i 0+0i 0+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c(FALSE,FALSE,FALSE) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)/c(as.raw(10),as.raw(10),as.raw(10)) Error in c(FALSE, FALSE, FALSE)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^"hello" Error in c(FALSE, FALSE, FALSE)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^(-(1/0)) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^(1/0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^(1i+NA) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^0.1234567 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^123456789000 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^1i [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^3.4 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^as.raw(10) Error in c(FALSE, FALSE, FALSE)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c("hello","hello","hello") Error in c(FALSE, FALSE, FALSE)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c(0.1234567,0.1234567,0.1234567) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c(123456789000,123456789000,123456789000) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c(1i,1i,1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c(3.4,3.4,3.4) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(FALSE,FALSE,FALSE)^c(as.raw(10),as.raw(10),as.raw(10)) Error in c(FALSE, FALSE, FALSE)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%"hello" Error in c(NULL, NULL, NULL)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%1L integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%FALSE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%TRUE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%as.raw(10) Error in c(NULL, NULL, NULL)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c("hello","hello","hello") Error in c(NULL, NULL, NULL)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c(1L,1L,1L) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c(FALSE,FALSE,FALSE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c(TRUE,TRUE,TRUE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c(NULL, NULL, NULL)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*"hello" Error in c(NULL, NULL, NULL) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*1L integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*FALSE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*TRUE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*as.raw(10) Error in c(NULL, NULL, NULL) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c("hello","hello","hello") Error in c(NULL, NULL, NULL) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c(1L,1L,1L) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c(FALSE,FALSE,FALSE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c(TRUE,TRUE,TRUE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)*c(as.raw(10),as.raw(10),as.raw(10)) Error in c(NULL, NULL, NULL) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+"hello" Error in c(NULL, NULL, NULL) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+1L integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+FALSE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+TRUE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+as.raw(10) Error in c(NULL, NULL, NULL) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c("hello","hello","hello") Error in c(NULL, NULL, NULL) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c(1L,1L,1L) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c(FALSE,FALSE,FALSE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c(TRUE,TRUE,TRUE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)+c(as.raw(10),as.raw(10),as.raw(10)) Error in c(NULL, NULL, NULL) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-"hello" Error in c(NULL, NULL, NULL) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-1L integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-FALSE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-TRUE integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-as.raw(10) Error in c(NULL, NULL, NULL) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c("hello","hello","hello") Error in c(NULL, NULL, NULL) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c(1L,1L,1L) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c(FALSE,FALSE,FALSE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c(TRUE,TRUE,TRUE) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)-c(as.raw(10),as.raw(10),as.raw(10)) Error in c(NULL, NULL, NULL) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/"hello" Error in c(NULL, NULL, NULL)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/1L numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/FALSE numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/TRUE numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/as.raw(10) Error in c(NULL, NULL, NULL)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c("hello","hello","hello") Error in c(NULL, NULL, NULL)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c(1L,1L,1L) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c(FALSE,FALSE,FALSE) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c(TRUE,TRUE,TRUE) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)/c(as.raw(10),as.raw(10),as.raw(10)) Error in c(NULL, NULL, NULL)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^"hello" Error in c(NULL, NULL, NULL)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^((0/0)+1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^(-(0/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^(-(1/0)) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^(-0.0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^(0/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^(1+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^(1/0) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^(1i+NA) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^(3.4+NA) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^0.1234567 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^1 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^123456789000 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^1L numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^1i complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^3.4 numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^FALSE numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^TRUE numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^as.raw(10) Error in c(NULL, NULL, NULL)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c("hello","hello","hello") Error in c(NULL, NULL, NULL)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c(0.1234567,0.1234567,0.1234567) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c(1,1,1) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c(123456789000,123456789000,123456789000) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c(1L,1L,1L) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c(1i,1i,1i) complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c(3.4,3.4,3.4) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c(FALSE,FALSE,FALSE) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c(TRUE,TRUE,TRUE) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(NULL,NULL,NULL)^c(as.raw(10),as.raw(10),as.raw(10)) Error in c(NULL, NULL, NULL)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%"hello" Error in c(TRUE, TRUE, TRUE)%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%((0/0)+1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%(-0.0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%(1/0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%(1i+NA) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%0.1234567 [1] 0.0123464 0.0123464 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%123456789000 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%1i Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%3.4 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%FALSE [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%as.raw(10) Error in c(TRUE, TRUE, TRUE)%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c("hello","hello","hello") Error in c(TRUE, TRUE, TRUE)%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c(0.1234567,0.1234567,0.1234567) [1] 0.0123464 0.0123464 0.0123464 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c(1i,1i,1i) Error: unimplemented complex operation ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c(FALSE,FALSE,FALSE) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c(TRUE, TRUE, TRUE)%%c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*"hello" Error in c(TRUE, TRUE, TRUE) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*(-0.0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*0.1234567 [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*1 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*123456789000 [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*1L [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*1i [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*3.4 [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*FALSE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*TRUE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*as.raw(10) Error in c(TRUE, TRUE, TRUE) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c("hello","hello","hello") Error in c(TRUE, TRUE, TRUE) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c(0.1234567,0.1234567,0.1234567) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c(1i,1i,1i) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c(3.4,3.4,3.4) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c(FALSE,FALSE,FALSE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)*c(as.raw(10),as.raw(10),as.raw(10)) Error in c(TRUE, TRUE, TRUE) * c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+"hello" Error in c(TRUE, TRUE, TRUE) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+((0/0)+1i) [1] NaN+1i NaN+1i NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+(-(1/0)) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+(1/0) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+0.1234567 [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+1 [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+123456789000 [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+1L [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+1i [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+3.4 [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+TRUE [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+as.raw(10) Error in c(TRUE, TRUE, TRUE) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c("hello","hello","hello") Error in c(TRUE, TRUE, TRUE) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c(0.1234567,0.1234567,0.1234567) [1] 1.123457 1.123457 1.123457 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c(1,1,1) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c(123456789000,123456789000,123456789000) [1] 123456789001 123456789001 123456789001 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c(1L,1L,1L) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c(1i,1i,1i) [1] 1+1i 1+1i 1+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c(3.4,3.4,3.4) [1] 4.4 4.4 4.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c(TRUE,TRUE,TRUE) [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)+c(as.raw(10),as.raw(10),as.raw(10)) Error in c(TRUE, TRUE, TRUE) + c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-"hello" Error in c(TRUE, TRUE, TRUE) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-((0/0)+1i) [1] NaN-1i NaN-1i NaN-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-(-(1/0)) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-(1/0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-0.1234567 [1] 0.8765433 0.8765433 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-1 [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-123456789000 [1] -123456788999 -123456788999 -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-1L [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-1i [1] 1-1i 1-1i 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-3.4 [1] -2.4 -2.4 -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-NULL integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-TRUE [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-as.raw(10) Error in c(TRUE, TRUE, TRUE) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c("hello","hello","hello") Error in c(TRUE, TRUE, TRUE) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c(0.1234567,0.1234567,0.1234567) [1] 0.8765433 0.8765433 0.8765433 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c(1,1,1) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c(123456789000,123456789000,123456789000) [1] -123456788999 -123456788999 -123456788999 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c(1L,1L,1L) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c(1i,1i,1i) [1] 1-1i 1-1i 1-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c(3.4,3.4,3.4) [1] -2.4 -2.4 -2.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c(NULL,NULL,NULL) integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c(TRUE,TRUE,TRUE) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)-c(as.raw(10),as.raw(10),as.raw(10)) Error in c(TRUE, TRUE, TRUE) - c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/"hello" Error in c(TRUE, TRUE, TRUE)/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/(-(0/0)) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/(-(1/0)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/(-0.0) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/(0/0) [1] NaN NaN NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/(1+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/(1/0) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/(1i+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/(3.4+NA) [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/0.1234567 [1] 8.100006 8.100006 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/1 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/123456789000 [1] 8.1e-12 8.1e-12 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/1L [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/1i [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/3.4 [1] 0.2941176 0.2941176 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/FALSE [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/TRUE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/as.raw(10) Error in c(TRUE, TRUE, TRUE)/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c("hello","hello","hello") Error in c(TRUE, TRUE, TRUE)/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c(0.1234567,0.1234567,0.1234567) [1] 8.100006 8.100006 8.100006 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c(123456789000,123456789000,123456789000) [1] 8.1e-12 8.1e-12 8.1e-12 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c(1i,1i,1i) [1] 0-1i 0-1i 0-1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c(3.4,3.4,3.4) [1] 0.2941176 0.2941176 0.2941176 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c(FALSE,FALSE,FALSE) [1] Inf Inf Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)/c(as.raw(10),as.raw(10),as.raw(10)) Error in c(TRUE, TRUE, TRUE)/c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^"hello" Error in c(TRUE, TRUE, TRUE)^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^((0/0)+1i) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^(-(0/0)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^(-(1/0)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^(-0.0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^(0/0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^(1+NA) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^(1/0) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^(1i+NA) [1] NaN+NaNi NaN+NaNi NaN+NaNi ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^(3.4+NA) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^0.1234567 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^1 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^123456789000 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^1L [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^1i [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^3.4 [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^FALSE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^NULL numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^TRUE [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^as.raw(10) Error in c(TRUE, TRUE, TRUE)^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c("hello","hello","hello") Error in c(TRUE, TRUE, TRUE)^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c(0.1234567,0.1234567,0.1234567) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c(123456789000,123456789000,123456789000) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c(1i,1i,1i) [1] 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c(3.4,3.4,3.4) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c(FALSE,FALSE,FALSE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c(NULL,NULL,NULL) numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c(TRUE,TRUE,TRUE) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(TRUE,TRUE,TRUE)^c(as.raw(10),as.raw(10),as.raw(10)) Error in c(TRUE, TRUE, TRUE)^c(as.raw(10), as.raw(10), as.raw(10)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%"hello" Error in c(as.raw(10), as.raw(10), as.raw(10))%%"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%((0/0)+1i) Error in c(as.raw(10), as.raw(10), as.raw(10))%%((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%(-(0/0)) Error in c(as.raw(10), as.raw(10), as.raw(10))%%(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%(-(1/0)) Error in c(as.raw(10), as.raw(10), as.raw(10))%%(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%(-0.0) Error in c(as.raw(10), as.raw(10), as.raw(10))%%(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%(0/0) Error in c(as.raw(10), as.raw(10), as.raw(10))%%(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%(1+NA) Error in c(as.raw(10), as.raw(10), as.raw(10))%%(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%(1/0) Error in c(as.raw(10), as.raw(10), as.raw(10))%%(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%(1i+NA) Error in c(as.raw(10), as.raw(10), as.raw(10))%%(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%(3.4+NA) Error in c(as.raw(10), as.raw(10), as.raw(10))%%(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%0.1234567 Error in c(as.raw(10), as.raw(10), as.raw(10))%%0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%1 Error in c(as.raw(10), as.raw(10), as.raw(10))%%1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%123456789000 Error in c(as.raw(10), as.raw(10), as.raw(10))%%123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%1L Error in c(as.raw(10), as.raw(10), as.raw(10))%%1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%1i Error in c(as.raw(10), as.raw(10), as.raw(10))%%(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%3.4 Error in c(as.raw(10), as.raw(10), as.raw(10))%%3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%FALSE Error in c(as.raw(10), as.raw(10), as.raw(10))%%FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%NULL Error in c(as.raw(10), as.raw(10), as.raw(10))%%NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%TRUE Error in c(as.raw(10), as.raw(10), as.raw(10))%%TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%as.raw(10) Error in c(as.raw(10), as.raw(10), as.raw(10))%%as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c("hello","hello","hello") Error in c(as.raw(10), as.raw(10), as.raw(10))%%c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c(0.1234567,0.1234567,0.1234567) Error in c(as.raw(10), as.raw(10), as.raw(10))%%c(0.1234567, 0.1234567, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c(1,1,1) Error in c(as.raw(10), as.raw(10), as.raw(10))%%c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c(123456789000,123456789000,123456789000) Error in c(as.raw(10), as.raw(10), as.raw(10))%%c(123456789000, 123456789000, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c(1L,1L,1L) Error in c(as.raw(10), as.raw(10), as.raw(10))%%c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c(1i,1i,1i) Error in c(as.raw(10), as.raw(10), as.raw(10))%%c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c(3.4,3.4,3.4) Error in c(as.raw(10), as.raw(10), as.raw(10))%%c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c(FALSE,FALSE,FALSE) Error in c(as.raw(10), as.raw(10), as.raw(10))%%c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c(NULL,NULL,NULL) Error in c(as.raw(10), as.raw(10), as.raw(10))%%c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c(TRUE,TRUE,TRUE) Error in c(as.raw(10), as.raw(10), as.raw(10))%%c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))%%c(as.raw(10),as.raw(10),as.raw(10)) Error in c(as.raw(10), as.raw(10), as.raw(10))%%c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*"hello" Error in c(as.raw(10), as.raw(10), as.raw(10)) * "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*((0/0)+1i) Error in c(as.raw(10), as.raw(10), as.raw(10)) * ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*(-(0/0)) Error in c(as.raw(10), as.raw(10), as.raw(10)) * (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*(-(1/0)) Error in c(as.raw(10), as.raw(10), as.raw(10)) * (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*(-0.0) Error in c(as.raw(10), as.raw(10), as.raw(10)) * (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*(0/0) Error in c(as.raw(10), as.raw(10), as.raw(10)) * (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*(1+NA) Error in c(as.raw(10), as.raw(10), as.raw(10)) * (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*(1/0) Error in c(as.raw(10), as.raw(10), as.raw(10)) * (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*(1i+NA) Error in c(as.raw(10), as.raw(10), as.raw(10)) * (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*(3.4+NA) Error in c(as.raw(10), as.raw(10), as.raw(10)) * (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*0.1234567 Error in c(as.raw(10), as.raw(10), as.raw(10)) * 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*1 Error in c(as.raw(10), as.raw(10), as.raw(10)) * 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*123456789000 Error in c(as.raw(10), as.raw(10), as.raw(10)) * 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*1L Error in c(as.raw(10), as.raw(10), as.raw(10)) * 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*1i Error in c(as.raw(10), as.raw(10), as.raw(10)) * (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*3.4 Error in c(as.raw(10), as.raw(10), as.raw(10)) * 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*FALSE Error in c(as.raw(10), as.raw(10), as.raw(10)) * FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*NULL Error in c(as.raw(10), as.raw(10), as.raw(10)) * NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*TRUE Error in c(as.raw(10), as.raw(10), as.raw(10)) * TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*as.raw(10) Error in c(as.raw(10), as.raw(10), as.raw(10)) * as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c("hello","hello","hello") Error in c(as.raw(10), as.raw(10), as.raw(10)) * c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c(0.1234567,0.1234567,0.1234567) Error in c(as.raw(10), as.raw(10), as.raw(10)) * c(0.1234567, 0.1234567, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c(1,1,1) Error in c(as.raw(10), as.raw(10), as.raw(10)) * c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c(123456789000,123456789000,123456789000) Error in c(as.raw(10), as.raw(10), as.raw(10)) * c(123456789000, 123456789000, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c(1L,1L,1L) Error in c(as.raw(10), as.raw(10), as.raw(10)) * c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c(1i,1i,1i) Error in c(as.raw(10), as.raw(10), as.raw(10)) * c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c(3.4,3.4,3.4) Error in c(as.raw(10), as.raw(10), as.raw(10)) * c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c(FALSE,FALSE,FALSE) Error in c(as.raw(10), as.raw(10), as.raw(10)) * c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c(NULL,NULL,NULL) Error in c(as.raw(10), as.raw(10), as.raw(10)) * c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c(TRUE,TRUE,TRUE) Error in c(as.raw(10), as.raw(10), as.raw(10)) * c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))*c(as.raw(10),as.raw(10),as.raw(10)) Error in c(as.raw(10), as.raw(10), as.raw(10)) * c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+"hello" Error in c(as.raw(10), as.raw(10), as.raw(10)) + "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+((0/0)+1i) Error in c(as.raw(10), as.raw(10), as.raw(10)) + ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+(-(0/0)) Error in c(as.raw(10), as.raw(10), as.raw(10)) + (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+(-(1/0)) Error in c(as.raw(10), as.raw(10), as.raw(10)) + (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+(-0.0) Error in c(as.raw(10), as.raw(10), as.raw(10)) + (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+(0/0) Error in c(as.raw(10), as.raw(10), as.raw(10)) + (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+(1+NA) Error in c(as.raw(10), as.raw(10), as.raw(10)) + (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+(1/0) Error in c(as.raw(10), as.raw(10), as.raw(10)) + (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+(1i+NA) Error in c(as.raw(10), as.raw(10), as.raw(10)) + (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+(3.4+NA) Error in c(as.raw(10), as.raw(10), as.raw(10)) + (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+0.1234567 Error in c(as.raw(10), as.raw(10), as.raw(10)) + 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+1 Error in c(as.raw(10), as.raw(10), as.raw(10)) + 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+123456789000 Error in c(as.raw(10), as.raw(10), as.raw(10)) + 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+1L Error in c(as.raw(10), as.raw(10), as.raw(10)) + 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+1i Error in c(as.raw(10), as.raw(10), as.raw(10)) + (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+3.4 Error in c(as.raw(10), as.raw(10), as.raw(10)) + 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+FALSE Error in c(as.raw(10), as.raw(10), as.raw(10)) + FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+NULL Error in c(as.raw(10), as.raw(10), as.raw(10)) + NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+TRUE Error in c(as.raw(10), as.raw(10), as.raw(10)) + TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+as.raw(10) Error in c(as.raw(10), as.raw(10), as.raw(10)) + as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c("hello","hello","hello") Error in c(as.raw(10), as.raw(10), as.raw(10)) + c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c(0.1234567,0.1234567,0.1234567) Error in c(as.raw(10), as.raw(10), as.raw(10)) + c(0.1234567, 0.1234567, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c(1,1,1) Error in c(as.raw(10), as.raw(10), as.raw(10)) + c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c(123456789000,123456789000,123456789000) Error in c(as.raw(10), as.raw(10), as.raw(10)) + c(123456789000, 123456789000, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c(1L,1L,1L) Error in c(as.raw(10), as.raw(10), as.raw(10)) + c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c(1i,1i,1i) Error in c(as.raw(10), as.raw(10), as.raw(10)) + c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c(3.4,3.4,3.4) Error in c(as.raw(10), as.raw(10), as.raw(10)) + c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c(FALSE,FALSE,FALSE) Error in c(as.raw(10), as.raw(10), as.raw(10)) + c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c(NULL,NULL,NULL) Error in c(as.raw(10), as.raw(10), as.raw(10)) + c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c(TRUE,TRUE,TRUE) Error in c(as.raw(10), as.raw(10), as.raw(10)) + c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))+c(as.raw(10),as.raw(10),as.raw(10)) Error in c(as.raw(10), as.raw(10), as.raw(10)) + c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-"hello" Error in c(as.raw(10), as.raw(10), as.raw(10)) - "hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-((0/0)+1i) Error in c(as.raw(10), as.raw(10), as.raw(10)) - ((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-(-(0/0)) Error in c(as.raw(10), as.raw(10), as.raw(10)) - (-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-(-(1/0)) Error in c(as.raw(10), as.raw(10), as.raw(10)) - (-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-(-0.0) Error in c(as.raw(10), as.raw(10), as.raw(10)) - (-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-(0/0) Error in c(as.raw(10), as.raw(10), as.raw(10)) - (0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-(1+NA) Error in c(as.raw(10), as.raw(10), as.raw(10)) - (1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-(1/0) Error in c(as.raw(10), as.raw(10), as.raw(10)) - (1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-(1i+NA) Error in c(as.raw(10), as.raw(10), as.raw(10)) - (0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-(3.4+NA) Error in c(as.raw(10), as.raw(10), as.raw(10)) - (3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-0.1234567 Error in c(as.raw(10), as.raw(10), as.raw(10)) - 0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-1 Error in c(as.raw(10), as.raw(10), as.raw(10)) - 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-123456789000 Error in c(as.raw(10), as.raw(10), as.raw(10)) - 123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-1L Error in c(as.raw(10), as.raw(10), as.raw(10)) - 1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-1i Error in c(as.raw(10), as.raw(10), as.raw(10)) - (0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-3.4 Error in c(as.raw(10), as.raw(10), as.raw(10)) - 3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-FALSE Error in c(as.raw(10), as.raw(10), as.raw(10)) - FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-NULL Error in c(as.raw(10), as.raw(10), as.raw(10)) - NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-TRUE Error in c(as.raw(10), as.raw(10), as.raw(10)) - TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-as.raw(10) Error in c(as.raw(10), as.raw(10), as.raw(10)) - as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c("hello","hello","hello") Error in c(as.raw(10), as.raw(10), as.raw(10)) - c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c(0.1234567,0.1234567,0.1234567) Error in c(as.raw(10), as.raw(10), as.raw(10)) - c(0.1234567, 0.1234567, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c(1,1,1) Error in c(as.raw(10), as.raw(10), as.raw(10)) - c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c(123456789000,123456789000,123456789000) Error in c(as.raw(10), as.raw(10), as.raw(10)) - c(123456789000, 123456789000, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c(1L,1L,1L) Error in c(as.raw(10), as.raw(10), as.raw(10)) - c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c(1i,1i,1i) Error in c(as.raw(10), as.raw(10), as.raw(10)) - c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c(3.4,3.4,3.4) Error in c(as.raw(10), as.raw(10), as.raw(10)) - c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c(FALSE,FALSE,FALSE) Error in c(as.raw(10), as.raw(10), as.raw(10)) - c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c(NULL,NULL,NULL) Error in c(as.raw(10), as.raw(10), as.raw(10)) - c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c(TRUE,TRUE,TRUE) Error in c(as.raw(10), as.raw(10), as.raw(10)) - c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))-c(as.raw(10),as.raw(10),as.raw(10)) Error in c(as.raw(10), as.raw(10), as.raw(10)) - c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/"hello" Error in c(as.raw(10), as.raw(10), as.raw(10))/"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/((0/0)+1i) Error in c(as.raw(10), as.raw(10), as.raw(10))/((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/(-(0/0)) Error in c(as.raw(10), as.raw(10), as.raw(10))/(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/(-(1/0)) Error in c(as.raw(10), as.raw(10), as.raw(10))/(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/(-0.0) Error in c(as.raw(10), as.raw(10), as.raw(10))/(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/(0/0) Error in c(as.raw(10), as.raw(10), as.raw(10))/(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/(1+NA) Error in c(as.raw(10), as.raw(10), as.raw(10))/(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/(1/0) Error in c(as.raw(10), as.raw(10), as.raw(10))/(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/(1i+NA) Error in c(as.raw(10), as.raw(10), as.raw(10))/(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/(3.4+NA) Error in c(as.raw(10), as.raw(10), as.raw(10))/(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/0.1234567 Error in c(as.raw(10), as.raw(10), as.raw(10))/0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/1 Error in c(as.raw(10), as.raw(10), as.raw(10))/1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/123456789000 Error in c(as.raw(10), as.raw(10), as.raw(10))/123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/1L Error in c(as.raw(10), as.raw(10), as.raw(10))/1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/1i Error in c(as.raw(10), as.raw(10), as.raw(10))/(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/3.4 Error in c(as.raw(10), as.raw(10), as.raw(10))/3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/FALSE Error in c(as.raw(10), as.raw(10), as.raw(10))/FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/NULL Error in c(as.raw(10), as.raw(10), as.raw(10))/NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/TRUE Error in c(as.raw(10), as.raw(10), as.raw(10))/TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/as.raw(10) Error in c(as.raw(10), as.raw(10), as.raw(10))/as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c("hello","hello","hello") Error in c(as.raw(10), as.raw(10), as.raw(10))/c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c(0.1234567,0.1234567,0.1234567) Error in c(as.raw(10), as.raw(10), as.raw(10))/c(0.1234567, 0.1234567, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c(1,1,1) Error in c(as.raw(10), as.raw(10), as.raw(10))/c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c(123456789000,123456789000,123456789000) Error in c(as.raw(10), as.raw(10), as.raw(10))/c(123456789000, 123456789000, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c(1L,1L,1L) Error in c(as.raw(10), as.raw(10), as.raw(10))/c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c(1i,1i,1i) Error in c(as.raw(10), as.raw(10), as.raw(10))/c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c(3.4,3.4,3.4) Error in c(as.raw(10), as.raw(10), as.raw(10))/c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c(FALSE,FALSE,FALSE) Error in c(as.raw(10), as.raw(10), as.raw(10))/c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c(NULL,NULL,NULL) Error in c(as.raw(10), as.raw(10), as.raw(10))/c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c(TRUE,TRUE,TRUE) Error in c(as.raw(10), as.raw(10), as.raw(10))/c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))/c(as.raw(10),as.raw(10),as.raw(10)) Error in c(as.raw(10), as.raw(10), as.raw(10))/c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^"hello" Error in c(as.raw(10), as.raw(10), as.raw(10))^"hello" : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^((0/0)+1i) Error in c(as.raw(10), as.raw(10), as.raw(10))^((0/0) + (0+1i)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^(-(0/0)) Error in c(as.raw(10), as.raw(10), as.raw(10))^(-(0/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^(-(1/0)) Error in c(as.raw(10), as.raw(10), as.raw(10))^(-(1/0)) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^(-0.0) Error in c(as.raw(10), as.raw(10), as.raw(10))^(-0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^(0/0) Error in c(as.raw(10), as.raw(10), as.raw(10))^(0/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^(1+NA) Error in c(as.raw(10), as.raw(10), as.raw(10))^(1 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^(1/0) Error in c(as.raw(10), as.raw(10), as.raw(10))^(1/0) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^(1i+NA) Error in c(as.raw(10), as.raw(10), as.raw(10))^(0+1i + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^(3.4+NA) Error in c(as.raw(10), as.raw(10), as.raw(10))^(3.4 + NA) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^0.1234567 Error in c(as.raw(10), as.raw(10), as.raw(10))^0.1234567 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^1 Error in c(as.raw(10), as.raw(10), as.raw(10))^1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^123456789000 Error in c(as.raw(10), as.raw(10), as.raw(10))^123456789000 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^1L Error in c(as.raw(10), as.raw(10), as.raw(10))^1L : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^1i Error in c(as.raw(10), as.raw(10), as.raw(10))^(0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^3.4 Error in c(as.raw(10), as.raw(10), as.raw(10))^3.4 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^FALSE Error in c(as.raw(10), as.raw(10), as.raw(10))^FALSE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^NULL Error in c(as.raw(10), as.raw(10), as.raw(10))^NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^TRUE Error in c(as.raw(10), as.raw(10), as.raw(10))^TRUE : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^as.raw(10) Error in c(as.raw(10), as.raw(10), as.raw(10))^as.raw(10) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c("hello","hello","hello") Error in c(as.raw(10), as.raw(10), as.raw(10))^c("hello", "hello", "hello") : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c(0.1234567,0.1234567,0.1234567) Error in c(as.raw(10), as.raw(10), as.raw(10))^c(0.1234567, 0.1234567, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c(1,1,1) Error in c(as.raw(10), as.raw(10), as.raw(10))^c(1, 1, 1) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c(123456789000,123456789000,123456789000) Error in c(as.raw(10), as.raw(10), as.raw(10))^c(123456789000, 123456789000, : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c(1L,1L,1L) Error in c(as.raw(10), as.raw(10), as.raw(10))^c(1L, 1L, 1L) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c(1i,1i,1i) Error in c(as.raw(10), as.raw(10), as.raw(10))^c(0+1i, 0+1i, 0+1i) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c(3.4,3.4,3.4) Error in c(as.raw(10), as.raw(10), as.raw(10))^c(3.4, 3.4, 3.4) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c(FALSE,FALSE,FALSE) Error in c(as.raw(10), as.raw(10), as.raw(10))^c(FALSE, FALSE, FALSE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c(NULL,NULL,NULL) Error in c(as.raw(10), as.raw(10), as.raw(10))^c(NULL, NULL, NULL) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c(TRUE,TRUE,TRUE) Error in c(as.raw(10), as.raw(10), as.raw(10))^c(TRUE, TRUE, TRUE) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testBinaryArithmetic#Ignored.ImplementationError#Output.MayIgnoreErrorContext#IncludeList.arithmetic# #c(as.raw(10),as.raw(10),as.raw(10))^c(as.raw(10),as.raw(10),as.raw(10)) Error in c(as.raw(10), as.raw(10), as.raw(10))^c(as.raw(10), as.raw(10), : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testComplex# #{ 1i } [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testDefaultVariables# #{ .Platform$endian } [1] "little" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testFunctionCall# #f <- function(x) { x[1] = 2; }; x <- (1:3)+0.1; f(x); x[1] [1] 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testFunctionCall# #f <- function(x) { x[1] = 2; }; x <- 1:3; f(x); x[1] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testFunctionCall# #f <- function(x) { x[1] = 2; }; x <- 1; f(x); x[1] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testFunctionCall# #f <- function(x) { x[1] = 2; }; x <- 1L; f(x); x[1] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testFunctionCall# #f <- function(x) { x[1] = 2; }; x <- c(1, 2, 3); f(x); x[1] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testFunctionCall# #f <- function(x) { x[1] = 2; }; x <- c(1L, 2L, 3L); f(x); x[1] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testLanguage# #quote(1==1)[[c(2,1)]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testMatrixAccess# #x <- matrix(c(1,2,3,4),2) ; x[,2] [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testMatrixAccess# #x <- matrix(c(1,2,3,4),2) ; x[,] [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testMatrixAccess# #x <- matrix(c(1,2,3,4),2) ; x[2,] [1] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #"hello" [1] "hello" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #((0/0)+1i) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #(-(0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #(-(1/0)) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #(-0.0) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #(0/0) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #(1+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #(1/0) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #(1i+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #(3.4+NA) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #0.1234567 [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #1 [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #123456789000 [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #1L [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #1i [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #3.4 [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #FALSE [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #NULL NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #TRUE [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #as.raw(10) [1] 0a ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c("hello","hello","hello") [1] "hello" "hello" "hello" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c(0.1234567,0.1234567,0.1234567) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c(1,1,1) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c(123456789000,123456789000,123456789000) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c(1L,1L,1L) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c(1i,1i,1i) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c(3.4,3.4,3.4) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c(FALSE,FALSE,FALSE) [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c(NULL,NULL,NULL) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c(TRUE,TRUE,TRUE) [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #c(as.raw(10),as.raw(10),as.raw(10)) [1] 0a 0a 0a ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testPrintValues# #list(1, 2, 3) [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testSpecial# #{ Inf } [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testSpecial# #{ NA } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testSpecial# #{ NULL } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testSpecial# #{ NaN } [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testStrings# #{ "hello" } [1] "hello" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTranspose# #x <- c(1, 2, 3, 4, 5, 6, 7, 8, 9, 10); dim(x) <- c(2L,5L); x <- t(x); dim(x) <- NULL; x [1] 1 3 5 7 9 2 4 6 8 10 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTranspose# #x <- c(1L, 2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L); dim(x) <- c(2L,5L); x <- t(x); dim(x) <- NULL; x [1] 1 3 5 7 9 2 4 6 8 10 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof("hello") [1] "character" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(((0/0)+1i)) [1] "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof((-(0/0))) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof((-(1/0))) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof((-0.0)) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof((0/0)) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof((1+NA)) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof((1/0)) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof((1i+NA)) [1] "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof((3.4+NA)) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(0.1234567) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(1) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(123456789000) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(1L) [1] "integer" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(1i) [1] "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(3.4) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(FALSE) [1] "logical" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(NULL) [1] "NULL" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(TRUE) [1] "logical" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(as.raw(10)) [1] "raw" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c("hello","hello","hello")) [1] "character" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c(0.1234567,0.1234567,0.1234567)) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c(1,1,1)) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c(123456789000,123456789000,123456789000)) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c(1L,1L,1L)) [1] "integer" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c(1i,1i,1i)) [1] "complex" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c(3.4,3.4,3.4)) [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c(FALSE,FALSE,FALSE)) [1] "logical" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c(NULL,NULL,NULL)) [1] "NULL" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c(TRUE,TRUE,TRUE)) [1] "logical" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(c(as.raw(10),as.raw(10),as.raw(10))) [1] "raw" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testTypeofValues# #typeof(list(1, 2, 3)) [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs("hello") Error in abs("hello") : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(((0/0)+1i)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs((-(0/0))) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs((-(1/0))) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs((-0.0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs((0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs((1+NA)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs((1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs((1i+NA)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs((3.4+NA)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(0.1234567) [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(1) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(123456789000) [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(1L) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(1i) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(3.4) [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(FALSE) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(NULL) Error in abs(NULL) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(TRUE) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(as.raw(10)) Error in abs(as.raw(10)) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c("hello","hello","hello")) Error in abs(c("hello", "hello", "hello")) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c(0.1234567,0.1234567,0.1234567)) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c(1,1,1)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c(123456789000,123456789000,123456789000)) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c(1L,1L,1L)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c(1i,1i,1i)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c(3.4,3.4,3.4)) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c(FALSE,FALSE,FALSE)) [1] 0 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c(NULL,NULL,NULL)) Error in abs(c(NULL, NULL, NULL)) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c(TRUE,TRUE,TRUE)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #abs(c(as.raw(10),as.raw(10),as.raw(10))) Error in abs(c(as.raw(10), as.raw(10), as.raw(10))) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length("hello") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(((0/0)+1i)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length((-(0/0))) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length((-(1/0))) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length((-0.0)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length((0/0)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length((1+NA)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length((1/0)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length((1i+NA)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length((3.4+NA)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(0.1234567) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(1) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(123456789000) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(1L) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(1i) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(3.4) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(FALSE) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(NULL) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(TRUE) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(as.raw(10)) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c("hello","hello","hello")) [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c(0.1234567,0.1234567,0.1234567)) [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c(1,1,1)) [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c(123456789000,123456789000,123456789000)) [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c(1L,1L,1L)) [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c(1i,1i,1i)) [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c(3.4,3.4,3.4)) [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c(FALSE,FALSE,FALSE)) [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c(NULL,NULL,NULL)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c(TRUE,TRUE,TRUE)) [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #length(c(as.raw(10),as.raw(10),as.raw(10))) [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names("hello") NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(((0/0)+1i)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names((-(0/0))) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names((-(1/0))) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names((-0.0)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names((0/0)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names((1+NA)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names((1/0)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names((1i+NA)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names((3.4+NA)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(0.1234567) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(1) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(123456789000) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(1L) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(1i) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(3.4) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(FALSE) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(NULL) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(TRUE) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(as.raw(10)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c("hello","hello","hello")) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c(0.1234567,0.1234567,0.1234567)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c(1,1,1)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c(123456789000,123456789000,123456789000)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c(1L,1L,1L)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c(1i,1i,1i)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c(3.4,3.4,3.4)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c(FALSE,FALSE,FALSE)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c(NULL,NULL,NULL)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c(TRUE,TRUE,TRUE)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #names(c(as.raw(10),as.raw(10),as.raw(10))) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev("hello") [1] "hello" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(((0/0)+1i)) [1] NaN+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev((-(0/0))) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev((-(1/0))) [1] -Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev((-0.0)) [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev((0/0)) [1] NaN ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev((1+NA)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev((1/0)) [1] Inf ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev((1i+NA)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev((3.4+NA)) [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(0.1234567) [1] 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(1) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(123456789000) [1] 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(1L) [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(1i) [1] 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(3.4) [1] 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(FALSE) [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(NULL) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(TRUE) [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(as.raw(10)) [1] 0a ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c("hello","hello","hello")) [1] "hello" "hello" "hello" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c(0.1234567,0.1234567,0.1234567)) [1] 0.1234567 0.1234567 0.1234567 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c(1,1,1)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c(123456789000,123456789000,123456789000)) [1] 123456789000 123456789000 123456789000 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c(1L,1L,1L)) [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c(1i,1i,1i)) [1] 0+1i 0+1i 0+1i ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c(3.4,3.4,3.4)) [1] 3.4 3.4 3.4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c(FALSE,FALSE,FALSE)) [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c(NULL,NULL,NULL)) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c(TRUE,TRUE,TRUE)) [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnaryBuiltings#Output.MayIgnoreErrorContext# #rev(c(as.raw(10),as.raw(10),as.raw(10))) [1] 0a 0a 0a ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnlist# #x <- list(1, 2, 3); unlist(x); [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnlist# #x <- list(1, 2, NA); unlist(x); [1] 1 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnlist# #x <- list(1, TRUE, 3); unlist(x); [1] 1 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testUnlist# #x <- list(1L, 2L, 3L); unlist(x); [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[(1+NA)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[-10] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[-2] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[0] integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[10] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[1:1] [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[2:4] [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[2] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[4:2] [1] 3 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),(1+NA),(1+NA))] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),(1+NA),-10)] Error in x[c((1 + NA), (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),(1+NA),-2)] Error in x[c((1 + NA), (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),(1+NA),0)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),(1+NA),10)] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),(1+NA),2)] [1] NA NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-10)] Error in x[c((1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-10,(1+NA))] Error in x[c((1 + NA), -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-10,-10)] Error in x[c((1 + NA), -10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-10,-2)] Error in x[c((1 + NA), -10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-10,0)] Error in x[c((1 + NA), -10, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-10,10)] Error in x[c((1 + NA), -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-10,2)] Error in x[c((1 + NA), -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-2)] Error in x[c((1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-2,(1+NA))] Error in x[c((1 + NA), -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-2,-10)] Error in x[c((1 + NA), -2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-2,-2)] Error in x[c((1 + NA), -2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-2,0)] Error in x[c((1 + NA), -2, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-2,10)] Error in x[c((1 + NA), -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),-2,2)] Error in x[c((1 + NA), -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),0,(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),0,-10)] Error in x[c((1 + NA), 0, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),0,-2)] Error in x[c((1 + NA), 0, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),0,0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),0,10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),0,2)] [1] NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),10,(1+NA))] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),10,-10)] Error in x[c((1 + NA), 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),10,-2)] Error in x[c((1 + NA), 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),10,0)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),10,10)] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),10,2)] [1] NA NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),2)] [1] NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),2,(1+NA))] [1] NA 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),2,-10)] Error in x[c((1 + NA), 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),2,-2)] Error in x[c((1 + NA), 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),2,0)] [1] NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),2,10)] [1] NA 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c((1+NA),2,2)] [1] NA 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,(1+NA))] Error in x[c(-10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,(1+NA),(1+NA))] Error in x[c(-10, (1 + NA), (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,(1+NA),-10)] Error in x[c(-10, (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,(1+NA),-2)] Error in x[c(-10, (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,(1+NA),0)] Error in x[c(-10, (1 + NA), 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,(1+NA),10)] Error in x[c(-10, (1 + NA), 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,(1+NA),2)] Error in x[c(-10, (1 + NA), 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-10)] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-10,(1+NA))] Error in x[c(-10, -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-10,-10)] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-10,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-10,0)] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-10,10)] Error in x[c(-10, -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-10,2)] Error in x[c(-10, -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-2,(1+NA))] Error in x[c(-10, -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-2,-10)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-2,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-2,0)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-2,10)] Error in x[c(-10, -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,-2,2)] Error in x[c(-10, -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,0)] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,0,(1+NA))] Error in x[c(-10, 0, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,0,-10)] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,0,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,0,0)] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,0,10)] Error in x[c(-10, 0, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,0,2)] Error in x[c(-10, 0, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,10)] Error in x[c(-10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,10,(1+NA))] Error in x[c(-10, 10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,10,-10)] Error in x[c(-10, 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,10,-2)] Error in x[c(-10, 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,10,0)] Error in x[c(-10, 10, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,10,10)] Error in x[c(-10, 10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,10,2)] Error in x[c(-10, 10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,2)] Error in x[c(-10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,2,(1+NA))] Error in x[c(-10, 2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,2,-10)] Error in x[c(-10, 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,2,-2)] Error in x[c(-10, 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,2,0)] Error in x[c(-10, 2, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,2,10)] Error in x[c(-10, 2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-10,2,2)] Error in x[c(-10, 2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,(1+NA))] Error in x[c(-2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,(1+NA),(1+NA))] Error in x[c(-2, (1 + NA), (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,(1+NA),-10)] Error in x[c(-2, (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,(1+NA),-2)] Error in x[c(-2, (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,(1+NA),0)] Error in x[c(-2, (1 + NA), 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,(1+NA),10)] Error in x[c(-2, (1 + NA), 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,(1+NA),2)] Error in x[c(-2, (1 + NA), 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-10)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-10,(1+NA))] Error in x[c(-2, -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-10,-10)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-10,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-10,0)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-10,10)] Error in x[c(-2, -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-10,2)] Error in x[c(-2, -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-2,(1+NA))] Error in x[c(-2, -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-2,-10)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-2,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-2,0)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-2,10)] Error in x[c(-2, -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,-2,2)] Error in x[c(-2, -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,0)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,0,(1+NA))] Error in x[c(-2, 0, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,0,-10)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,0,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,0,0)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,0,10)] Error in x[c(-2, 0, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,0,2)] Error in x[c(-2, 0, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,10)] Error in x[c(-2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,10,(1+NA))] Error in x[c(-2, 10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,10,-10)] Error in x[c(-2, 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,10,-2)] Error in x[c(-2, 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,10,0)] Error in x[c(-2, 10, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,10,10)] Error in x[c(-2, 10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,10,2)] Error in x[c(-2, 10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,2)] Error in x[c(-2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,2,(1+NA))] Error in x[c(-2, 2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,2,-10)] Error in x[c(-2, 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,2,-2)] Error in x[c(-2, 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,2,0)] Error in x[c(-2, 2, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,2,10)] Error in x[c(-2, 2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(-2,2,2)] Error in x[c(-2, 2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,(1+NA))] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,(1+NA),(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,(1+NA),-10)] Error in x[c(0, (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,(1+NA),-2)] Error in x[c(0, (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,(1+NA),0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,(1+NA),10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,(1+NA),2)] [1] NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-10)] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-10,(1+NA))] Error in x[c(0, -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-10,-10)] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-10,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-10,0)] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-10,10)] Error in x[c(0, -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-10,2)] Error in x[c(0, -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-2,(1+NA))] Error in x[c(0, -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-2,-10)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-2,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-2,0)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-2,10)] Error in x[c(0, -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,-2,2)] Error in x[c(0, -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,0)] integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,0,(1+NA))] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,0,-10)] [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,0,-2)] [1] 0 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,0,0)] integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,0,10)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,0,2)] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,10)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,10,(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,10,-10)] Error in x[c(0, 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,10,-2)] Error in x[c(0, 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,10,0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,10,10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,10,2)] [1] NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,2)] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,2,(1+NA))] [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,2,-10)] Error in x[c(0, 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,2,-2)] Error in x[c(0, 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,2,0)] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,2,10)] [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(0,2,2)] [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,(1+NA),(1+NA))] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,(1+NA),-10)] Error in x[c(10, (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,(1+NA),-2)] Error in x[c(10, (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,(1+NA),0)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,(1+NA),10)] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,(1+NA),2)] [1] NA NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-10)] Error in x[c(10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-10,(1+NA))] Error in x[c(10, -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-10,-10)] Error in x[c(10, -10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-10,-2)] Error in x[c(10, -10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-10,0)] Error in x[c(10, -10, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-10,10)] Error in x[c(10, -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-10,2)] Error in x[c(10, -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-2)] Error in x[c(10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-2,(1+NA))] Error in x[c(10, -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-2,-10)] Error in x[c(10, -2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-2,-2)] Error in x[c(10, -2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-2,0)] Error in x[c(10, -2, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-2,10)] Error in x[c(10, -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,-2,2)] Error in x[c(10, -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,0,(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,0,-10)] Error in x[c(10, 0, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,0,-2)] Error in x[c(10, 0, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,0,0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,0,10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,0,2)] [1] NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,10,(1+NA))] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,10,-10)] Error in x[c(10, 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,10,-2)] Error in x[c(10, 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,10,0)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,10,10)] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,10,2)] [1] NA NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,2)] [1] NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,2,(1+NA))] [1] NA 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,2,-10)] Error in x[c(10, 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,2,-2)] Error in x[c(10, 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,2,0)] [1] NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,2,10)] [1] NA 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(10,2,2)] [1] NA 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,(1+NA))] [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,(1+NA),(1+NA))] [1] 1 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,(1+NA),-10)] Error in x[c(2, (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,(1+NA),-2)] Error in x[c(2, (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,(1+NA),0)] [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,(1+NA),10)] [1] 1 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,(1+NA),2)] [1] 1 NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-10)] Error in x[c(2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-10,(1+NA))] Error in x[c(2, -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-10,-10)] Error in x[c(2, -10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-10,-2)] Error in x[c(2, -10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-10,0)] Error in x[c(2, -10, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-10,10)] Error in x[c(2, -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-10,2)] Error in x[c(2, -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-2)] Error in x[c(2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-2,(1+NA))] Error in x[c(2, -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-2,-10)] Error in x[c(2, -2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-2,-2)] Error in x[c(2, -2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-2,0)] Error in x[c(2, -2, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-2,10)] Error in x[c(2, -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,-2,2)] Error in x[c(2, -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,0)] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,0,(1+NA))] [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,0,-10)] Error in x[c(2, 0, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,0,-2)] Error in x[c(2, 0, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,0,0)] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,0,10)] [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,0,2)] [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,10)] [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,10,(1+NA))] [1] 1 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,10,-10)] Error in x[c(2, 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,10,-2)] Error in x[c(2, 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,10,0)] [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,10,10)] [1] 1 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,10,2)] [1] 1 NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,2)] [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,2,(1+NA))] [1] 1 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,2,-10)] Error in x[c(2, 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,2,-2)] Error in x[c(2, 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,2,0)] [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,2,10)] [1] 1 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- (0:4); x[c(2,2,2)] [1] 1 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[(1+NA)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[-10] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[-2] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[0] integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[10] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[1:1] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[2:4] [1] 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[2] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[4:2] [1] 4 3 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),(1+NA))] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),-10)] Error in x[c((1 + NA), (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),-2)] Error in x[c((1 + NA), (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),0)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),10)] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),2)] [1] NA NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10)] Error in x[c((1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,(1+NA))] Error in x[c((1 + NA), -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,-10)] Error in x[c((1 + NA), -10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,-2)] Error in x[c((1 + NA), -10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,0)] Error in x[c((1 + NA), -10, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,10)] Error in x[c((1 + NA), -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,2)] Error in x[c((1 + NA), -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2)] Error in x[c((1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,(1+NA))] Error in x[c((1 + NA), -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,-10)] Error in x[c((1 + NA), -2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,-2)] Error in x[c((1 + NA), -2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,0)] Error in x[c((1 + NA), -2, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,10)] Error in x[c((1 + NA), -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,2)] Error in x[c((1 + NA), -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,-10)] Error in x[c((1 + NA), 0, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,-2)] Error in x[c((1 + NA), 0, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,2)] [1] NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,(1+NA))] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,-10)] Error in x[c((1 + NA), 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,-2)] Error in x[c((1 + NA), 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,0)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,10)] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,2)] [1] NA NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2)] [1] NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,(1+NA))] [1] NA 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,-10)] Error in x[c((1 + NA), 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,-2)] Error in x[c((1 + NA), 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,0)] [1] NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,10)] [1] NA 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,2)] [1] NA 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA))] Error in x[c(-10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),(1+NA))] Error in x[c(-10, (1 + NA), (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),-10)] Error in x[c(-10, (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),-2)] Error in x[c(-10, (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),0)] Error in x[c(-10, (1 + NA), 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),10)] Error in x[c(-10, (1 + NA), 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),2)] Error in x[c(-10, (1 + NA), 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10)] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,(1+NA))] Error in x[c(-10, -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,-10)] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,0)] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,10)] Error in x[c(-10, -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,2)] Error in x[c(-10, -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,(1+NA))] Error in x[c(-10, -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,-10)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,0)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,10)] Error in x[c(-10, -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,2)] Error in x[c(-10, -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0)] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,(1+NA))] Error in x[c(-10, 0, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,-10)] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,0)] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,10)] Error in x[c(-10, 0, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,2)] Error in x[c(-10, 0, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10)] Error in x[c(-10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,(1+NA))] Error in x[c(-10, 10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,-10)] Error in x[c(-10, 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,-2)] Error in x[c(-10, 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,0)] Error in x[c(-10, 10, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,10)] Error in x[c(-10, 10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,2)] Error in x[c(-10, 10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2)] Error in x[c(-10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,(1+NA))] Error in x[c(-10, 2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,-10)] Error in x[c(-10, 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,-2)] Error in x[c(-10, 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,0)] Error in x[c(-10, 2, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,10)] Error in x[c(-10, 2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,2)] Error in x[c(-10, 2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA))] Error in x[c(-2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),(1+NA))] Error in x[c(-2, (1 + NA), (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),-10)] Error in x[c(-2, (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),-2)] Error in x[c(-2, (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),0)] Error in x[c(-2, (1 + NA), 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),10)] Error in x[c(-2, (1 + NA), 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),2)] Error in x[c(-2, (1 + NA), 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,(1+NA))] Error in x[c(-2, -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,-10)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,0)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,10)] Error in x[c(-2, -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,2)] Error in x[c(-2, -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,(1+NA))] Error in x[c(-2, -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,-10)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,0)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,10)] Error in x[c(-2, -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,2)] Error in x[c(-2, -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,(1+NA))] Error in x[c(-2, 0, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,-10)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,0)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,10)] Error in x[c(-2, 0, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,2)] Error in x[c(-2, 0, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10)] Error in x[c(-2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,(1+NA))] Error in x[c(-2, 10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,-10)] Error in x[c(-2, 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,-2)] Error in x[c(-2, 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,0)] Error in x[c(-2, 10, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,10)] Error in x[c(-2, 10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,2)] Error in x[c(-2, 10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2)] Error in x[c(-2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,(1+NA))] Error in x[c(-2, 2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,-10)] Error in x[c(-2, 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,-2)] Error in x[c(-2, 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,0)] Error in x[c(-2, 2, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,10)] Error in x[c(-2, 2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,2)] Error in x[c(-2, 2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA))] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),-10)] Error in x[c(0, (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),-2)] Error in x[c(0, (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),2)] [1] NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10)] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,(1+NA))] Error in x[c(0, -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,-10)] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,0)] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,10)] Error in x[c(0, -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,2)] Error in x[c(0, -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,(1+NA))] Error in x[c(0, -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,-10)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,0)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,10)] Error in x[c(0, -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,2)] Error in x[c(0, -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0)] integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,(1+NA))] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,-10)] [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,-2)] [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,0)] integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,10)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,2)] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,-10)] Error in x[c(0, 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,-2)] Error in x[c(0, 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,2)] [1] NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2)] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,(1+NA))] [1] 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,-10)] Error in x[c(0, 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,-2)] Error in x[c(0, 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,0)] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,10)] [1] 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,2)] [1] 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),(1+NA))] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),-10)] Error in x[c(10, (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),-2)] Error in x[c(10, (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),0)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),10)] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),2)] [1] NA NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10)] Error in x[c(10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,(1+NA))] Error in x[c(10, -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,-10)] Error in x[c(10, -10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,-2)] Error in x[c(10, -10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,0)] Error in x[c(10, -10, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,10)] Error in x[c(10, -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,2)] Error in x[c(10, -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2)] Error in x[c(10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,(1+NA))] Error in x[c(10, -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,-10)] Error in x[c(10, -2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,-2)] Error in x[c(10, -2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,0)] Error in x[c(10, -2, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,10)] Error in x[c(10, -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,2)] Error in x[c(10, -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,(1+NA))] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,-10)] Error in x[c(10, 0, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,-2)] Error in x[c(10, 0, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,0)] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,2)] [1] NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,(1+NA))] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,-10)] Error in x[c(10, 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,-2)] Error in x[c(10, 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,0)] [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,10)] [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,2)] [1] NA NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2)] [1] NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,(1+NA))] [1] NA 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,-10)] Error in x[c(10, 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,-2)] Error in x[c(10, 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,0)] [1] NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,10)] [1] NA 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,2)] [1] NA 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA))] [1] 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),(1+NA))] [1] 2 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),-10)] Error in x[c(2, (1 + NA), -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),-2)] Error in x[c(2, (1 + NA), -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),0)] [1] 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),10)] [1] 2 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),2)] [1] 2 NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10)] Error in x[c(2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,(1+NA))] Error in x[c(2, -10, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,-10)] Error in x[c(2, -10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,-2)] Error in x[c(2, -10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,0)] Error in x[c(2, -10, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,10)] Error in x[c(2, -10, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,2)] Error in x[c(2, -10, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2)] Error in x[c(2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,(1+NA))] Error in x[c(2, -2, (1 + NA))] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,-10)] Error in x[c(2, -2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,-2)] Error in x[c(2, -2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,0)] Error in x[c(2, -2, 0)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,10)] Error in x[c(2, -2, 10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,2)] Error in x[c(2, -2, 2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0)] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,(1+NA))] [1] 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,-10)] Error in x[c(2, 0, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,-2)] Error in x[c(2, 0, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,0)] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,10)] [1] 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,2)] [1] 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10)] [1] 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,(1+NA))] [1] 2 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,-10)] Error in x[c(2, 10, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,-2)] Error in x[c(2, 10, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,0)] [1] 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,10)] [1] 2 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,2)] [1] 2 NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2)] [1] 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,(1+NA))] [1] 2 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,-10)] Error in x[c(2, 2, -10)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,-2)] Error in x[c(2, 2, -2)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,0)] [1] 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,10)] [1] 2 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorAccess#Output.MayIgnoreErrorContext# #x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,2)] [1] 2 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a <- b;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 9" "7, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "7, 5, 9" "7, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a;a <- b; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a;b <- a; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[1] <- 7;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 9" "7, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 5, 9" "7, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a;a <- b; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a;b <- a; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;a[3] <- 9;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a + 0;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b <- a;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a <- b;b[2] <- 8;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a <- b;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[1] <- 7;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a;a <- b; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;a[3] <- 9;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a <- b;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a <- b;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "7, 8, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a + 0;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a <- b;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a <- b;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "7, 8, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b <- a;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[1] <- 7;b[2] <- 8;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 5, 6" "7, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a <- b;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a;a <- b; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[1] <- 7;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 5, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 5, 6" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 5, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;a[3] <- 9;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a + 0;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b <- a;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); a[3] <- 9;b[2] <- 8;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a <- b;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[1] <- 7;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;a[3] <- 9;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a + 0;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b <- a;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 8, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a + 0;b[2] <- 8;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a <- b;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[1] <- 7;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;a[3] <- 9;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a + 0;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b <- a;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 8, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b <- a;b[2] <- 8;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 8, 6" "7, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 8, 6" "7, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a;b <- a; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a <- b;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a;a <- b; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[1] <- 7;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 9" "7, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;a[3] <- 9;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a + 0;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a <- b;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a <- b;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "1, 8, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b <- a;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a <- b;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a <- b;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a <- b;a[3] <- 9; c(toString(a),toString(b)) [1] "4, 8, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a <- b;b <- a + 0; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a <- b;b <- a; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a <- b;b[2] <- 8; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[1] <- 7;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[1] <- 7;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[1] <- 7;a[3] <- 9; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[1] <- 7;b <- a + 0; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[1] <- 7;b <- a; c(toString(a),toString(b)) [1] "7, 2, 3" "7, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[1] <- 7;b[2] <- 8; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[3] <- 9;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[3] <- 9;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[3] <- 9;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[3] <- 9;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[3] <- 9;b <- a; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 9" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;a[3] <- 9;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a + 0;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a + 0;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a + 0;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a + 0;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a + 0;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a + 0;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a;a <- b; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b <- a;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 8, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b[2] <- 8;a <- b; c(toString(a),toString(b)) [1] "4, 8, 6" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b[2] <- 8;a[1] <- 7; c(toString(a),toString(b)) [1] "7, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b[2] <- 8;a[3] <- 9; c(toString(a),toString(b)) [1] "1, 2, 9" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b[2] <- 8;b <- a + 0; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b[2] <- 8;b <- a; c(toString(a),toString(b)) [1] "1, 2, 3" "1, 2, 3" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorCopySemantics# #a <- c(1, 2, 3); b <- c(4, 5, 6); b[2] <- 8;b[2] <- 8;b[2] <- 8;b[2] <- 8; c(toString(a),toString(b)) [1] "1, 2, 3" "4, 8, 6" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #x <- NULL; codes <- c("A", "C", "G"); complements <- c("T", "G", "C"); x[codes] <- complements; as.vector(x); [1] "T" "G" "C" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #x <- NULL; codes <- c("A", "C", "G"); complements <- c("T", "G", "C"); x[codes] <- complements; names(x); [1] "A" "C" "G" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #x <- NULL; codes <- c("A", "C", "G"); complements <- c("T", "G", "C"); x[codes] <- complements; x[tolower(codes)] <- complements; as.vector(x); [1] "T" "G" "C" "T" "G" "C" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #x <- NULL; codes <- c("A", "C", "G"); complements <- c("T", "G", "C"); x[codes] <- complements; x[tolower(codes)] <- complements; names(x); [1] "A" "C" "G" "a" "c" "g" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #x <- NULL; names(x) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #x <- NULL; x[c("A", "A", "B")] <- "x"; as.vector(x["A"]) [1] "x" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #x <- NULL; x[c("A", "A", "B")] <- "x"; names(x["A"]) [1] "A" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #x <- NULL; x[c("A", "A", "B")] <- 1; names(x) [1] "A" "B" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #x <- NULL; x[c("A", "B", "C")] <- c("x", "y", "z"); as.vector(x["B"]) [1] "y" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #x <- NULL; x[c("A", "B", "C")] <- c("x", "y", "z"); as.vector(x["C"]) [1] "z" ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorStringAccess# #y <- NULL; y[c("A", "A", "B")] <- 1; y <- NULL; names(y) NULL ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate# #v <- double(5) ; v[[3]] <- c(1) ; v [1] 0 0 1 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate# #v <- double(5) ; v[[3]] <- matrix(c(1)) ; v [1] 0 0 1 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate# #x <- 1:10; for (i in 1:2) { x[[1]] <- x[[1]]; x <- c(1, 2, 3) }; x [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate# #x <- c(1, 2, 3); y <- x; x[1] <- 100; y; [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[1:1] <- c(200L,300L); x } [1] 200 1 2 3 4 Warning message: In x[1:1] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[1:1] <- c(400L,500L,600L); x } [1] 400 1 2 3 4 Warning message: In x[1:1] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[2:4] <- c(200L,300L); x } [1] 0 200 300 200 4 Warning message: In x[2:4] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[2:4] <- c(400L,500L,600L); x } [1] 0 400 500 600 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[4:2] <- c(200L,300L); x } [1] 0 200 300 200 4 Warning message: In x[4:2] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[4:2] <- c(400L,500L,600L); x } [1] 0 600 500 400 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),-10)] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),-2)] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),0)] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),10)] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),2)] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,-10)] <- c(200L,300L); x } Error in x[c((1 + NA), -10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,-2)] <- c(200L,300L); x } Error in x[c((1 + NA), -10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,0)] <- c(200L,300L); x } Error in x[c((1 + NA), -10, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,10)] <- c(200L,300L); x } Error in x[c((1 + NA), -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,2)] <- c(200L,300L); x } Error in x[c((1 + NA), -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-10,2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,-10)] <- c(200L,300L); x } Error in x[c((1 + NA), -2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,-2)] <- c(200L,300L); x } Error in x[c((1 + NA), -2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,0)] <- c(200L,300L); x } Error in x[c((1 + NA), -2, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,10)] <- c(200L,300L); x } Error in x[c((1 + NA), -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,2)] <- c(200L,300L); x } Error in x[c((1 + NA), -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),-2,2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), 0, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,-10)] <- c(200L,300L); x } Error in x[c((1 + NA), 0, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,-2)] <- c(200L,300L); x } Error in x[c((1 + NA), 0, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,0)] <- c(200L,300L); x } Error in x[c((1 + NA), 0, 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,10)] <- c(200L,300L); x } Error in x[c((1 + NA), 0, 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,2)] <- c(200L,300L); x } Error in x[c((1 + NA), 0, 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),0,2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), 10, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,-10)] <- c(200L,300L); x } Error in x[c((1 + NA), 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,-2)] <- c(200L,300L); x } Error in x[c((1 + NA), 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,0)] <- c(200L,300L); x } Error in x[c((1 + NA), 10, 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,10)] <- c(200L,300L); x } Error in x[c((1 + NA), 10, 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,2)] <- c(200L,300L); x } Error in x[c((1 + NA), 10, 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),10,2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), 2, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,-10)] <- c(200L,300L); x } Error in x[c((1 + NA), 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,-2)] <- c(200L,300L); x } Error in x[c((1 + NA), 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,0)] <- c(200L,300L); x } Error in x[c((1 + NA), 2, 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,10)] <- c(200L,300L); x } Error in x[c((1 + NA), 2, 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,2)] <- c(200L,300L); x } Error in x[c((1 + NA), 2, 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c((1+NA),2,2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),-10)] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),-2)] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),0)] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),10)] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),2)] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,(1+NA))] <- c(200L,300L); x } Error in x[c(-10, -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,-10)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(-10, -10, -10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,-10)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(-10, -10, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,-2)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,-2)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-10, -10, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,0)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(-10, -10, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,0)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(-10, -10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,10)] <- c(200L,300L); x } Error in x[c(-10, -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,10)] <- c(400L,500L,600L); x } Error in x[c(-10, -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,2)] <- c(200L,300L); x } Error in x[c(-10, -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-10,2)] <- c(400L,500L,600L); x } Error in x[c(-10, -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,(1+NA))] <- c(200L,300L); x } Error in x[c(-10, -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,-10)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,-10)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-10, -2, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,-2)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,-2)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-10, -2, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,0)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,0)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-10, -2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,10)] <- c(200L,300L); x } Error in x[c(-10, -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,10)] <- c(400L,500L,600L); x } Error in x[c(-10, -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,2)] <- c(200L,300L); x } Error in x[c(-10, -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,-2,2)] <- c(400L,500L,600L); x } Error in x[c(-10, -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,(1+NA))] <- c(200L,300L); x } Error in x[c(-10, 0, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, 0, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,-10)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(-10, 0, -10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,-10)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(-10, 0, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,-2)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,-2)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-10, 0, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,0)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(-10, 0, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,0)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(-10, 0, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,10)] <- c(200L,300L); x } Error in x[c(-10, 0, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,10)] <- c(400L,500L,600L); x } Error in x[c(-10, 0, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,2)] <- c(200L,300L); x } Error in x[c(-10, 0, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,0,2)] <- c(400L,500L,600L); x } Error in x[c(-10, 0, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,(1+NA))] <- c(200L,300L); x } Error in x[c(-10, 10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, 10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,-10)] <- c(200L,300L); x } Error in x[c(-10, 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,-10)] <- c(400L,500L,600L); x } Error in x[c(-10, 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,-2)] <- c(200L,300L); x } Error in x[c(-10, 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,-2)] <- c(400L,500L,600L); x } Error in x[c(-10, 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,0)] <- c(200L,300L); x } Error in x[c(-10, 10, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,0)] <- c(400L,500L,600L); x } Error in x[c(-10, 10, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,10)] <- c(200L,300L); x } Error in x[c(-10, 10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,10)] <- c(400L,500L,600L); x } Error in x[c(-10, 10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,2)] <- c(200L,300L); x } Error in x[c(-10, 10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,10,2)] <- c(400L,500L,600L); x } Error in x[c(-10, 10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,(1+NA))] <- c(200L,300L); x } Error in x[c(-10, 2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, 2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,-10)] <- c(200L,300L); x } Error in x[c(-10, 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,-10)] <- c(400L,500L,600L); x } Error in x[c(-10, 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,-2)] <- c(200L,300L); x } Error in x[c(-10, 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,-2)] <- c(400L,500L,600L); x } Error in x[c(-10, 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,0)] <- c(200L,300L); x } Error in x[c(-10, 2, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,0)] <- c(400L,500L,600L); x } Error in x[c(-10, 2, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,10)] <- c(200L,300L); x } Error in x[c(-10, 2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,10)] <- c(400L,500L,600L); x } Error in x[c(-10, 2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,2)] <- c(200L,300L); x } Error in x[c(-10, 2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-10,2,2)] <- c(400L,500L,600L); x } Error in x[c(-10, 2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),-10)] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),-2)] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),0)] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),10)] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),2)] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,(1+NA))] <- c(200L,300L); x } Error in x[c(-2, -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,-10)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,-10)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-2, -10, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,-2)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,-2)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-2, -10, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,0)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,0)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-2, -10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,10)] <- c(200L,300L); x } Error in x[c(-2, -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,10)] <- c(400L,500L,600L); x } Error in x[c(-2, -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,2)] <- c(200L,300L); x } Error in x[c(-2, -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-10,2)] <- c(400L,500L,600L); x } Error in x[c(-2, -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,(1+NA))] <- c(200L,300L); x } Error in x[c(-2, -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,-10)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,-10)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-2, -2, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,-2)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,-2)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-2, -2, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,0)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,0)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-2, -2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,10)] <- c(200L,300L); x } Error in x[c(-2, -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,10)] <- c(400L,500L,600L); x } Error in x[c(-2, -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,2)] <- c(200L,300L); x } Error in x[c(-2, -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,-2,2)] <- c(400L,500L,600L); x } Error in x[c(-2, -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,(1+NA))] <- c(200L,300L); x } Error in x[c(-2, 0, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, 0, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,-10)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,-10)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-2, 0, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,-2)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,-2)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-2, 0, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,0)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,0)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(-2, 0, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,10)] <- c(200L,300L); x } Error in x[c(-2, 0, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,10)] <- c(400L,500L,600L); x } Error in x[c(-2, 0, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,2)] <- c(200L,300L); x } Error in x[c(-2, 0, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,0,2)] <- c(400L,500L,600L); x } Error in x[c(-2, 0, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,(1+NA))] <- c(200L,300L); x } Error in x[c(-2, 10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, 10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,-10)] <- c(200L,300L); x } Error in x[c(-2, 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,-10)] <- c(400L,500L,600L); x } Error in x[c(-2, 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,-2)] <- c(200L,300L); x } Error in x[c(-2, 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,-2)] <- c(400L,500L,600L); x } Error in x[c(-2, 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,0)] <- c(200L,300L); x } Error in x[c(-2, 10, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,0)] <- c(400L,500L,600L); x } Error in x[c(-2, 10, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,10)] <- c(200L,300L); x } Error in x[c(-2, 10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,10)] <- c(400L,500L,600L); x } Error in x[c(-2, 10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,2)] <- c(200L,300L); x } Error in x[c(-2, 10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,10,2)] <- c(400L,500L,600L); x } Error in x[c(-2, 10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,(1+NA))] <- c(200L,300L); x } Error in x[c(-2, 2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, 2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,-10)] <- c(200L,300L); x } Error in x[c(-2, 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,-10)] <- c(400L,500L,600L); x } Error in x[c(-2, 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,-2)] <- c(200L,300L); x } Error in x[c(-2, 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,-2)] <- c(400L,500L,600L); x } Error in x[c(-2, 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,0)] <- c(200L,300L); x } Error in x[c(-2, 2, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,0)] <- c(400L,500L,600L); x } Error in x[c(-2, 2, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,10)] <- c(200L,300L); x } Error in x[c(-2, 2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,10)] <- c(400L,500L,600L); x } Error in x[c(-2, 2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,2)] <- c(200L,300L); x } Error in x[c(-2, 2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(-2,2,2)] <- c(400L,500L,600L); x } Error in x[c(-2, 2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c(0, (1 + NA), (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),-10)] <- c(200L,300L); x } Error in x[c(0, (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),-2)] <- c(200L,300L); x } Error in x[c(0, (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),0)] <- c(200L,300L); x } Error in x[c(0, (1 + NA), 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),10)] <- c(200L,300L); x } Error in x[c(0, (1 + NA), 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),2)] <- c(200L,300L); x } Error in x[c(0, (1 + NA), 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,(1+NA))] <- c(200L,300L); x } Error in x[c(0, -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,-10)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(0, -10, -10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,-10)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(0, -10, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,-2)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,-2)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(0, -10, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,0)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(0, -10, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,0)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(0, -10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,10)] <- c(200L,300L); x } Error in x[c(0, -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,10)] <- c(400L,500L,600L); x } Error in x[c(0, -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,2)] <- c(200L,300L); x } Error in x[c(0, -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-10,2)] <- c(400L,500L,600L); x } Error in x[c(0, -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,(1+NA))] <- c(200L,300L); x } Error in x[c(0, -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,-10)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,-10)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(0, -2, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,-2)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,-2)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(0, -2, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,0)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,0)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(0, -2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,10)] <- c(200L,300L); x } Error in x[c(0, -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,10)] <- c(400L,500L,600L); x } Error in x[c(0, -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,2)] <- c(200L,300L); x } Error in x[c(0, -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,-2,2)] <- c(400L,500L,600L); x } Error in x[c(0, -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,(1+NA))] <- c(200L,300L); x } Error in x[c(0, 0, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, 0, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,-10)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(0, 0, -10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,-10)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(0, 0, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,-2)] <- c(200L,300L); x } [1] 200 1 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,-2)] <- c(400L,500L,600L); x } [1] 400 1 500 600 400 Warning message: In x[c(0, 0, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,0)] <- c(200L,300L); x } [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,0)] <- c(400L,500L,600L); x } [1] 0 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,10)] <- c(200L,300L); x } [1] 0 1 2 3 4 NA NA NA NA 200 Warning message: In x[c(0, 0, 10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,10)] <- c(400L,500L,600L); x } [1] 0 1 2 3 4 NA NA NA NA 400 Warning message: In x[c(0, 0, 10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,2)] <- c(200L,300L); x } [1] 0 200 2 3 4 Warning message: In x[c(0, 0, 2)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,0,2)] <- c(400L,500L,600L); x } [1] 0 400 2 3 4 Warning message: In x[c(0, 0, 2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,(1+NA))] <- c(200L,300L); x } Error in x[c(0, 10, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, 10, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,-10)] <- c(200L,300L); x } Error in x[c(0, 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,-10)] <- c(400L,500L,600L); x } Error in x[c(0, 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,-2)] <- c(200L,300L); x } Error in x[c(0, 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,-2)] <- c(400L,500L,600L); x } Error in x[c(0, 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,0)] <- c(200L,300L); x } [1] 0 1 2 3 4 NA NA NA NA 200 Warning message: In x[c(0, 10, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,0)] <- c(400L,500L,600L); x } [1] 0 1 2 3 4 NA NA NA NA 400 Warning message: In x[c(0, 10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,10)] <- c(200L,300L); x } [1] 0 1 2 3 4 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,10)] <- c(400L,500L,600L); x } [1] 0 1 2 3 4 NA NA NA NA 500 Warning message: In x[c(0, 10, 10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,2)] <- c(200L,300L); x } [1] 0 300 2 3 4 NA NA NA NA 200 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,10,2)] <- c(400L,500L,600L); x } [1] 0 500 2 3 4 NA NA NA NA 400 Warning message: In x[c(0, 10, 2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,(1+NA))] <- c(200L,300L); x } Error in x[c(0, 2, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, 2, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,-10)] <- c(200L,300L); x } Error in x[c(0, 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,-10)] <- c(400L,500L,600L); x } Error in x[c(0, 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,-2)] <- c(200L,300L); x } Error in x[c(0, 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,-2)] <- c(400L,500L,600L); x } Error in x[c(0, 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,0)] <- c(200L,300L); x } [1] 0 200 2 3 4 Warning message: In x[c(0, 2, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,0)] <- c(400L,500L,600L); x } [1] 0 400 2 3 4 Warning message: In x[c(0, 2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,10)] <- c(200L,300L); x } [1] 0 200 2 3 4 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,10)] <- c(400L,500L,600L); x } [1] 0 400 2 3 4 NA NA NA NA 500 Warning message: In x[c(0, 2, 10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,2)] <- c(200L,300L); x } [1] 0 300 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(0,2,2)] <- c(400L,500L,600L); x } [1] 0 500 2 3 4 Warning message: In x[c(0, 2, 2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c(10, (1 + NA), (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),-10)] <- c(200L,300L); x } Error in x[c(10, (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),-2)] <- c(200L,300L); x } Error in x[c(10, (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),0)] <- c(200L,300L); x } Error in x[c(10, (1 + NA), 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),10)] <- c(200L,300L); x } Error in x[c(10, (1 + NA), 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),2)] <- c(200L,300L); x } Error in x[c(10, (1 + NA), 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,(1+NA))] <- c(200L,300L); x } Error in x[c(10, -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,-10)] <- c(200L,300L); x } Error in x[c(10, -10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,-10)] <- c(400L,500L,600L); x } Error in x[c(10, -10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,-2)] <- c(200L,300L); x } Error in x[c(10, -10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,-2)] <- c(400L,500L,600L); x } Error in x[c(10, -10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,0)] <- c(200L,300L); x } Error in x[c(10, -10, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,0)] <- c(400L,500L,600L); x } Error in x[c(10, -10, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,10)] <- c(200L,300L); x } Error in x[c(10, -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,10)] <- c(400L,500L,600L); x } Error in x[c(10, -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,2)] <- c(200L,300L); x } Error in x[c(10, -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-10,2)] <- c(400L,500L,600L); x } Error in x[c(10, -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,(1+NA))] <- c(200L,300L); x } Error in x[c(10, -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,-10)] <- c(200L,300L); x } Error in x[c(10, -2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,-10)] <- c(400L,500L,600L); x } Error in x[c(10, -2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,-2)] <- c(200L,300L); x } Error in x[c(10, -2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,-2)] <- c(400L,500L,600L); x } Error in x[c(10, -2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,0)] <- c(200L,300L); x } Error in x[c(10, -2, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,0)] <- c(400L,500L,600L); x } Error in x[c(10, -2, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,10)] <- c(200L,300L); x } Error in x[c(10, -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,10)] <- c(400L,500L,600L); x } Error in x[c(10, -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,2)] <- c(200L,300L); x } Error in x[c(10, -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,-2,2)] <- c(400L,500L,600L); x } Error in x[c(10, -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,(1+NA))] <- c(200L,300L); x } Error in x[c(10, 0, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, 0, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,-10)] <- c(200L,300L); x } Error in x[c(10, 0, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,-10)] <- c(400L,500L,600L); x } Error in x[c(10, 0, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,-2)] <- c(200L,300L); x } Error in x[c(10, 0, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,-2)] <- c(400L,500L,600L); x } Error in x[c(10, 0, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,0)] <- c(200L,300L); x } [1] 0 1 2 3 4 NA NA NA NA 200 Warning message: In x[c(10, 0, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,0)] <- c(400L,500L,600L); x } [1] 0 1 2 3 4 NA NA NA NA 400 Warning message: In x[c(10, 0, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,10)] <- c(200L,300L); x } [1] 0 1 2 3 4 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,10)] <- c(400L,500L,600L); x } [1] 0 1 2 3 4 NA NA NA NA 500 Warning message: In x[c(10, 0, 10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,2)] <- c(200L,300L); x } [1] 0 300 2 3 4 NA NA NA NA 200 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,0,2)] <- c(400L,500L,600L); x } [1] 0 500 2 3 4 NA NA NA NA 400 Warning message: In x[c(10, 0, 2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,(1+NA))] <- c(200L,300L); x } Error in x[c(10, 10, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, 10, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,-10)] <- c(200L,300L); x } Error in x[c(10, 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,-10)] <- c(400L,500L,600L); x } Error in x[c(10, 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,-2)] <- c(200L,300L); x } Error in x[c(10, 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,-2)] <- c(400L,500L,600L); x } Error in x[c(10, 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,0)] <- c(200L,300L); x } [1] 0 1 2 3 4 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,0)] <- c(400L,500L,600L); x } [1] 0 1 2 3 4 NA NA NA NA 500 Warning message: In x[c(10, 10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,10)] <- c(200L,300L); x } [1] 0 1 2 3 4 NA NA NA NA 200 Warning message: In x[c(10, 10, 10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,10)] <- c(400L,500L,600L); x } [1] 0 1 2 3 4 NA NA NA NA 600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,2)] <- c(200L,300L); x } [1] 0 200 2 3 4 NA NA NA NA 300 Warning message: In x[c(10, 10, 2)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,10,2)] <- c(400L,500L,600L); x } [1] 0 600 2 3 4 NA NA NA NA 500 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,(1+NA))] <- c(200L,300L); x } Error in x[c(10, 2, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, 2, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,-10)] <- c(200L,300L); x } Error in x[c(10, 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,-10)] <- c(400L,500L,600L); x } Error in x[c(10, 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,-2)] <- c(200L,300L); x } Error in x[c(10, 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,-2)] <- c(400L,500L,600L); x } Error in x[c(10, 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,0)] <- c(200L,300L); x } [1] 0 300 2 3 4 NA NA NA NA 200 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,0)] <- c(400L,500L,600L); x } [1] 0 500 2 3 4 NA NA NA NA 400 Warning message: In x[c(10, 2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,10)] <- c(200L,300L); x } [1] 0 300 2 3 4 NA NA NA NA 200 Warning message: In x[c(10, 2, 10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,10)] <- c(400L,500L,600L); x } [1] 0 500 2 3 4 NA NA NA NA 600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,2)] <- c(200L,300L); x } [1] 0 200 2 3 4 NA NA NA NA 200 Warning message: In x[c(10, 2, 2)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(10,2,2)] <- c(400L,500L,600L); x } [1] 0 600 2 3 4 NA NA NA NA 400 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c(2, (1 + NA), (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),-10)] <- c(200L,300L); x } Error in x[c(2, (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),-2)] <- c(200L,300L); x } Error in x[c(2, (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),0)] <- c(200L,300L); x } Error in x[c(2, (1 + NA), 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),10)] <- c(200L,300L); x } Error in x[c(2, (1 + NA), 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),2)] <- c(200L,300L); x } Error in x[c(2, (1 + NA), 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,(1+NA))] <- c(200L,300L); x } Error in x[c(2, -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,-10)] <- c(200L,300L); x } Error in x[c(2, -10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,-10)] <- c(400L,500L,600L); x } Error in x[c(2, -10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,-2)] <- c(200L,300L); x } Error in x[c(2, -10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,-2)] <- c(400L,500L,600L); x } Error in x[c(2, -10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,0)] <- c(200L,300L); x } Error in x[c(2, -10, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,0)] <- c(400L,500L,600L); x } Error in x[c(2, -10, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,10)] <- c(200L,300L); x } Error in x[c(2, -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,10)] <- c(400L,500L,600L); x } Error in x[c(2, -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,2)] <- c(200L,300L); x } Error in x[c(2, -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-10,2)] <- c(400L,500L,600L); x } Error in x[c(2, -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,(1+NA))] <- c(200L,300L); x } Error in x[c(2, -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,-10)] <- c(200L,300L); x } Error in x[c(2, -2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,-10)] <- c(400L,500L,600L); x } Error in x[c(2, -2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,-2)] <- c(200L,300L); x } Error in x[c(2, -2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,-2)] <- c(400L,500L,600L); x } Error in x[c(2, -2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,0)] <- c(200L,300L); x } Error in x[c(2, -2, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,0)] <- c(400L,500L,600L); x } Error in x[c(2, -2, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,10)] <- c(200L,300L); x } Error in x[c(2, -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,10)] <- c(400L,500L,600L); x } Error in x[c(2, -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,2)] <- c(200L,300L); x } Error in x[c(2, -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,-2,2)] <- c(400L,500L,600L); x } Error in x[c(2, -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,(1+NA))] <- c(200L,300L); x } Error in x[c(2, 0, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, 0, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,-10)] <- c(200L,300L); x } Error in x[c(2, 0, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,-10)] <- c(400L,500L,600L); x } Error in x[c(2, 0, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,-2)] <- c(200L,300L); x } Error in x[c(2, 0, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,-2)] <- c(400L,500L,600L); x } Error in x[c(2, 0, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,0)] <- c(200L,300L); x } [1] 0 200 2 3 4 Warning message: In x[c(2, 0, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,0)] <- c(400L,500L,600L); x } [1] 0 400 2 3 4 Warning message: In x[c(2, 0, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,10)] <- c(200L,300L); x } [1] 0 200 2 3 4 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,10)] <- c(400L,500L,600L); x } [1] 0 400 2 3 4 NA NA NA NA 500 Warning message: In x[c(2, 0, 10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,2)] <- c(200L,300L); x } [1] 0 300 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,0,2)] <- c(400L,500L,600L); x } [1] 0 500 2 3 4 Warning message: In x[c(2, 0, 2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,(1+NA))] <- c(200L,300L); x } Error in x[c(2, 10, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, 10, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,-10)] <- c(200L,300L); x } Error in x[c(2, 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,-10)] <- c(400L,500L,600L); x } Error in x[c(2, 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,-2)] <- c(200L,300L); x } Error in x[c(2, 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,-2)] <- c(400L,500L,600L); x } Error in x[c(2, 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,0)] <- c(200L,300L); x } [1] 0 200 2 3 4 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,0)] <- c(400L,500L,600L); x } [1] 0 400 2 3 4 NA NA NA NA 500 Warning message: In x[c(2, 10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,10)] <- c(200L,300L); x } [1] 0 200 2 3 4 NA NA NA NA 200 Warning message: In x[c(2, 10, 10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,10)] <- c(400L,500L,600L); x } [1] 0 400 2 3 4 NA NA NA NA 600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,2)] <- c(200L,300L); x } [1] 0 200 2 3 4 NA NA NA NA 300 Warning message: In x[c(2, 10, 2)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,10,2)] <- c(400L,500L,600L); x } [1] 0 600 2 3 4 NA NA NA NA 500 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,(1+NA))] <- c(200L,300L); x } Error in x[c(2, 2, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, 2, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,-10)] <- c(200L,300L); x } Error in x[c(2, 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,-10)] <- c(400L,500L,600L); x } Error in x[c(2, 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,-2)] <- c(200L,300L); x } Error in x[c(2, 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,-2)] <- c(400L,500L,600L); x } Error in x[c(2, 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,0)] <- c(200L,300L); x } [1] 0 300 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,0)] <- c(400L,500L,600L); x } [1] 0 500 2 3 4 Warning message: In x[c(2, 2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,10)] <- c(200L,300L); x } [1] 0 300 2 3 4 NA NA NA NA 200 Warning message: In x[c(2, 2, 10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,10)] <- c(400L,500L,600L); x } [1] 0 500 2 3 4 NA NA NA NA 600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,2)] <- c(200L,300L); x } [1] 0 200 2 3 4 Warning message: In x[c(2, 2, 2)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- (0:4); x[c(2,2,2)] <- c(400L,500L,600L); x } [1] 0 600 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[1:1] <- c(200L,300L); x } [1] 200 2 3 4 5 Warning message: In x[1:1] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[1:1] <- c(400L,500L,600L); x } [1] 400 2 3 4 5 Warning message: In x[1:1] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[2:4] <- c(200L,300L); x } [1] 1 200 300 200 5 Warning message: In x[2:4] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[2:4] <- c(400L,500L,600L); x } [1] 1 400 500 600 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[4:2] <- c(200L,300L); x } [1] 1 200 300 200 5 Warning message: In x[4:2] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[4:2] <- c(400L,500L,600L); x } [1] 1 600 500 400 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),-10)] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),-2)] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),0)] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),10)] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),2)] <- c(200L,300L); x } Error in x[c((1 + NA), (1 + NA), 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), (1 + NA), 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,-10)] <- c(200L,300L); x } Error in x[c((1 + NA), -10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,-2)] <- c(200L,300L); x } Error in x[c((1 + NA), -10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,0)] <- c(200L,300L); x } Error in x[c((1 + NA), -10, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,10)] <- c(200L,300L); x } Error in x[c((1 + NA), -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,2)] <- c(200L,300L); x } Error in x[c((1 + NA), -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-10,2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,-10)] <- c(200L,300L); x } Error in x[c((1 + NA), -2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,-2)] <- c(200L,300L); x } Error in x[c((1 + NA), -2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,0)] <- c(200L,300L); x } Error in x[c((1 + NA), -2, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,10)] <- c(200L,300L); x } Error in x[c((1 + NA), -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,2)] <- c(200L,300L); x } Error in x[c((1 + NA), -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),-2,2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), 0, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,-10)] <- c(200L,300L); x } Error in x[c((1 + NA), 0, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,-2)] <- c(200L,300L); x } Error in x[c((1 + NA), 0, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,0)] <- c(200L,300L); x } Error in x[c((1 + NA), 0, 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,10)] <- c(200L,300L); x } Error in x[c((1 + NA), 0, 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,2)] <- c(200L,300L); x } Error in x[c((1 + NA), 0, 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),0,2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 0, 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), 10, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,-10)] <- c(200L,300L); x } Error in x[c((1 + NA), 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,-2)] <- c(200L,300L); x } Error in x[c((1 + NA), 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,0)] <- c(200L,300L); x } Error in x[c((1 + NA), 10, 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,10)] <- c(200L,300L); x } Error in x[c((1 + NA), 10, 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,2)] <- c(200L,300L); x } Error in x[c((1 + NA), 10, 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),10,2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 10, 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,(1+NA))] <- c(200L,300L); x } Error in x[c((1 + NA), 2, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,-10)] <- c(200L,300L); x } Error in x[c((1 + NA), 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,-10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,-2)] <- c(200L,300L); x } Error in x[c((1 + NA), 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,-2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,0)] <- c(200L,300L); x } Error in x[c((1 + NA), 2, 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,0)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,10)] <- c(200L,300L); x } Error in x[c((1 + NA), 2, 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,10)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,2)] <- c(200L,300L); x } Error in x[c((1 + NA), 2, 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c((1+NA),2,2)] <- c(400L,500L,600L); x } Error in x[c((1 + NA), 2, 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),-10)] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),-2)] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),0)] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),10)] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),2)] <- c(200L,300L); x } Error in x[c(-10, (1 + NA), 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c(-10, (1 + NA), 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,(1+NA))] <- c(200L,300L); x } Error in x[c(-10, -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,-10)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(-10, -10, -10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,-10)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(-10, -10, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,-2)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,-2)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-10, -10, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,0)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(-10, -10, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,0)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(-10, -10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,10)] <- c(200L,300L); x } Error in x[c(-10, -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,10)] <- c(400L,500L,600L); x } Error in x[c(-10, -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,2)] <- c(200L,300L); x } Error in x[c(-10, -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-10,2)] <- c(400L,500L,600L); x } Error in x[c(-10, -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,(1+NA))] <- c(200L,300L); x } Error in x[c(-10, -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,-10)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,-10)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-10, -2, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,-2)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,-2)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-10, -2, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,0)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,0)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-10, -2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,10)] <- c(200L,300L); x } Error in x[c(-10, -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,10)] <- c(400L,500L,600L); x } Error in x[c(-10, -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,2)] <- c(200L,300L); x } Error in x[c(-10, -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,-2,2)] <- c(400L,500L,600L); x } Error in x[c(-10, -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,(1+NA))] <- c(200L,300L); x } Error in x[c(-10, 0, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, 0, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,-10)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(-10, 0, -10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,-10)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(-10, 0, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,-2)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,-2)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-10, 0, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,0)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(-10, 0, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,0)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(-10, 0, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,10)] <- c(200L,300L); x } Error in x[c(-10, 0, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,10)] <- c(400L,500L,600L); x } Error in x[c(-10, 0, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,2)] <- c(200L,300L); x } Error in x[c(-10, 0, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,0,2)] <- c(400L,500L,600L); x } Error in x[c(-10, 0, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,(1+NA))] <- c(200L,300L); x } Error in x[c(-10, 10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, 10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,-10)] <- c(200L,300L); x } Error in x[c(-10, 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,-10)] <- c(400L,500L,600L); x } Error in x[c(-10, 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,-2)] <- c(200L,300L); x } Error in x[c(-10, 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,-2)] <- c(400L,500L,600L); x } Error in x[c(-10, 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,0)] <- c(200L,300L); x } Error in x[c(-10, 10, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,0)] <- c(400L,500L,600L); x } Error in x[c(-10, 10, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,10)] <- c(200L,300L); x } Error in x[c(-10, 10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,10)] <- c(400L,500L,600L); x } Error in x[c(-10, 10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,2)] <- c(200L,300L); x } Error in x[c(-10, 10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,10,2)] <- c(400L,500L,600L); x } Error in x[c(-10, 10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,(1+NA))] <- c(200L,300L); x } Error in x[c(-10, 2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-10, 2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,-10)] <- c(200L,300L); x } Error in x[c(-10, 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,-10)] <- c(400L,500L,600L); x } Error in x[c(-10, 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,-2)] <- c(200L,300L); x } Error in x[c(-10, 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,-2)] <- c(400L,500L,600L); x } Error in x[c(-10, 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,0)] <- c(200L,300L); x } Error in x[c(-10, 2, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,0)] <- c(400L,500L,600L); x } Error in x[c(-10, 2, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,10)] <- c(200L,300L); x } Error in x[c(-10, 2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,10)] <- c(400L,500L,600L); x } Error in x[c(-10, 2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,2)] <- c(200L,300L); x } Error in x[c(-10, 2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-10,2,2)] <- c(400L,500L,600L); x } Error in x[c(-10, 2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),-10)] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),-2)] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),0)] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),10)] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),2)] <- c(200L,300L); x } Error in x[c(-2, (1 + NA), 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c(-2, (1 + NA), 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,(1+NA))] <- c(200L,300L); x } Error in x[c(-2, -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,-10)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,-10)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-2, -10, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,-2)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,-2)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-2, -10, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,0)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,0)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-2, -10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,10)] <- c(200L,300L); x } Error in x[c(-2, -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,10)] <- c(400L,500L,600L); x } Error in x[c(-2, -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,2)] <- c(200L,300L); x } Error in x[c(-2, -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-10,2)] <- c(400L,500L,600L); x } Error in x[c(-2, -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,(1+NA))] <- c(200L,300L); x } Error in x[c(-2, -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,-10)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,-10)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-2, -2, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,-2)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,-2)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-2, -2, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,0)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,0)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-2, -2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,10)] <- c(200L,300L); x } Error in x[c(-2, -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,10)] <- c(400L,500L,600L); x } Error in x[c(-2, -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,2)] <- c(200L,300L); x } Error in x[c(-2, -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,-2,2)] <- c(400L,500L,600L); x } Error in x[c(-2, -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,(1+NA))] <- c(200L,300L); x } Error in x[c(-2, 0, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, 0, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,-10)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,-10)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-2, 0, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,-2)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,-2)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-2, 0, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,0)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,0)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(-2, 0, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,10)] <- c(200L,300L); x } Error in x[c(-2, 0, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,10)] <- c(400L,500L,600L); x } Error in x[c(-2, 0, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,2)] <- c(200L,300L); x } Error in x[c(-2, 0, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,0,2)] <- c(400L,500L,600L); x } Error in x[c(-2, 0, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,(1+NA))] <- c(200L,300L); x } Error in x[c(-2, 10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, 10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,-10)] <- c(200L,300L); x } Error in x[c(-2, 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,-10)] <- c(400L,500L,600L); x } Error in x[c(-2, 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,-2)] <- c(200L,300L); x } Error in x[c(-2, 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,-2)] <- c(400L,500L,600L); x } Error in x[c(-2, 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,0)] <- c(200L,300L); x } Error in x[c(-2, 10, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,0)] <- c(400L,500L,600L); x } Error in x[c(-2, 10, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,10)] <- c(200L,300L); x } Error in x[c(-2, 10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,10)] <- c(400L,500L,600L); x } Error in x[c(-2, 10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,2)] <- c(200L,300L); x } Error in x[c(-2, 10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,10,2)] <- c(400L,500L,600L); x } Error in x[c(-2, 10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,(1+NA))] <- c(200L,300L); x } Error in x[c(-2, 2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(-2, 2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,-10)] <- c(200L,300L); x } Error in x[c(-2, 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,-10)] <- c(400L,500L,600L); x } Error in x[c(-2, 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,-2)] <- c(200L,300L); x } Error in x[c(-2, 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,-2)] <- c(400L,500L,600L); x } Error in x[c(-2, 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,0)] <- c(200L,300L); x } Error in x[c(-2, 2, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,0)] <- c(400L,500L,600L); x } Error in x[c(-2, 2, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,10)] <- c(200L,300L); x } Error in x[c(-2, 2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,10)] <- c(400L,500L,600L); x } Error in x[c(-2, 2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,2)] <- c(200L,300L); x } Error in x[c(-2, 2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(-2,2,2)] <- c(400L,500L,600L); x } Error in x[c(-2, 2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c(0, (1 + NA), (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),-10)] <- c(200L,300L); x } Error in x[c(0, (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),-2)] <- c(200L,300L); x } Error in x[c(0, (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),0)] <- c(200L,300L); x } Error in x[c(0, (1 + NA), 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),10)] <- c(200L,300L); x } Error in x[c(0, (1 + NA), 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),2)] <- c(200L,300L); x } Error in x[c(0, (1 + NA), 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c(0, (1 + NA), 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,(1+NA))] <- c(200L,300L); x } Error in x[c(0, -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,-10)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(0, -10, -10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,-10)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(0, -10, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,-2)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,-2)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(0, -10, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,0)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(0, -10, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,0)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(0, -10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,10)] <- c(200L,300L); x } Error in x[c(0, -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,10)] <- c(400L,500L,600L); x } Error in x[c(0, -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,2)] <- c(200L,300L); x } Error in x[c(0, -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-10,2)] <- c(400L,500L,600L); x } Error in x[c(0, -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,(1+NA))] <- c(200L,300L); x } Error in x[c(0, -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,-10)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,-10)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(0, -2, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,-2)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,-2)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(0, -2, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,0)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,0)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(0, -2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,10)] <- c(200L,300L); x } Error in x[c(0, -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,10)] <- c(400L,500L,600L); x } Error in x[c(0, -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,2)] <- c(200L,300L); x } Error in x[c(0, -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,-2,2)] <- c(400L,500L,600L); x } Error in x[c(0, -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,(1+NA))] <- c(200L,300L); x } Error in x[c(0, 0, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, 0, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,-10)] <- c(200L,300L); x } [1] 200 300 200 300 200 Warning message: In x[c(0, 0, -10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,-10)] <- c(400L,500L,600L); x } [1] 400 500 600 400 500 Warning message: In x[c(0, 0, -10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,-2)] <- c(200L,300L); x } [1] 200 2 300 200 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,-2)] <- c(400L,500L,600L); x } [1] 400 2 500 600 400 Warning message: In x[c(0, 0, -2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,0)] <- c(200L,300L); x } [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,0)] <- c(400L,500L,600L); x } [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,10)] <- c(200L,300L); x } [1] 1 2 3 4 5 NA NA NA NA 200 Warning message: In x[c(0, 0, 10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,10)] <- c(400L,500L,600L); x } [1] 1 2 3 4 5 NA NA NA NA 400 Warning message: In x[c(0, 0, 10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,2)] <- c(200L,300L); x } [1] 1 200 3 4 5 Warning message: In x[c(0, 0, 2)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,0,2)] <- c(400L,500L,600L); x } [1] 1 400 3 4 5 Warning message: In x[c(0, 0, 2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,(1+NA))] <- c(200L,300L); x } Error in x[c(0, 10, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, 10, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,-10)] <- c(200L,300L); x } Error in x[c(0, 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,-10)] <- c(400L,500L,600L); x } Error in x[c(0, 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,-2)] <- c(200L,300L); x } Error in x[c(0, 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,-2)] <- c(400L,500L,600L); x } Error in x[c(0, 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,0)] <- c(200L,300L); x } [1] 1 2 3 4 5 NA NA NA NA 200 Warning message: In x[c(0, 10, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,0)] <- c(400L,500L,600L); x } [1] 1 2 3 4 5 NA NA NA NA 400 Warning message: In x[c(0, 10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,10)] <- c(200L,300L); x } [1] 1 2 3 4 5 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,10)] <- c(400L,500L,600L); x } [1] 1 2 3 4 5 NA NA NA NA 500 Warning message: In x[c(0, 10, 10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,2)] <- c(200L,300L); x } [1] 1 300 3 4 5 NA NA NA NA 200 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,10,2)] <- c(400L,500L,600L); x } [1] 1 500 3 4 5 NA NA NA NA 400 Warning message: In x[c(0, 10, 2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,(1+NA))] <- c(200L,300L); x } Error in x[c(0, 2, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(0, 2, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,-10)] <- c(200L,300L); x } Error in x[c(0, 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,-10)] <- c(400L,500L,600L); x } Error in x[c(0, 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,-2)] <- c(200L,300L); x } Error in x[c(0, 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,-2)] <- c(400L,500L,600L); x } Error in x[c(0, 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,0)] <- c(200L,300L); x } [1] 1 200 3 4 5 Warning message: In x[c(0, 2, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,0)] <- c(400L,500L,600L); x } [1] 1 400 3 4 5 Warning message: In x[c(0, 2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,10)] <- c(200L,300L); x } [1] 1 200 3 4 5 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,10)] <- c(400L,500L,600L); x } [1] 1 400 3 4 5 NA NA NA NA 500 Warning message: In x[c(0, 2, 10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,2)] <- c(200L,300L); x } [1] 1 300 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(0,2,2)] <- c(400L,500L,600L); x } [1] 1 500 3 4 5 Warning message: In x[c(0, 2, 2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c(10, (1 + NA), (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),-10)] <- c(200L,300L); x } Error in x[c(10, (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),-2)] <- c(200L,300L); x } Error in x[c(10, (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),0)] <- c(200L,300L); x } Error in x[c(10, (1 + NA), 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),10)] <- c(200L,300L); x } Error in x[c(10, (1 + NA), 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),2)] <- c(200L,300L); x } Error in x[c(10, (1 + NA), 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c(10, (1 + NA), 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,(1+NA))] <- c(200L,300L); x } Error in x[c(10, -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,-10)] <- c(200L,300L); x } Error in x[c(10, -10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,-10)] <- c(400L,500L,600L); x } Error in x[c(10, -10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,-2)] <- c(200L,300L); x } Error in x[c(10, -10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,-2)] <- c(400L,500L,600L); x } Error in x[c(10, -10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,0)] <- c(200L,300L); x } Error in x[c(10, -10, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,0)] <- c(400L,500L,600L); x } Error in x[c(10, -10, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,10)] <- c(200L,300L); x } Error in x[c(10, -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,10)] <- c(400L,500L,600L); x } Error in x[c(10, -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,2)] <- c(200L,300L); x } Error in x[c(10, -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-10,2)] <- c(400L,500L,600L); x } Error in x[c(10, -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,(1+NA))] <- c(200L,300L); x } Error in x[c(10, -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,-10)] <- c(200L,300L); x } Error in x[c(10, -2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,-10)] <- c(400L,500L,600L); x } Error in x[c(10, -2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,-2)] <- c(200L,300L); x } Error in x[c(10, -2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,-2)] <- c(400L,500L,600L); x } Error in x[c(10, -2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,0)] <- c(200L,300L); x } Error in x[c(10, -2, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,0)] <- c(400L,500L,600L); x } Error in x[c(10, -2, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,10)] <- c(200L,300L); x } Error in x[c(10, -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,10)] <- c(400L,500L,600L); x } Error in x[c(10, -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,2)] <- c(200L,300L); x } Error in x[c(10, -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,-2,2)] <- c(400L,500L,600L); x } Error in x[c(10, -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,(1+NA))] <- c(200L,300L); x } Error in x[c(10, 0, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, 0, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,-10)] <- c(200L,300L); x } Error in x[c(10, 0, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,-10)] <- c(400L,500L,600L); x } Error in x[c(10, 0, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,-2)] <- c(200L,300L); x } Error in x[c(10, 0, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,-2)] <- c(400L,500L,600L); x } Error in x[c(10, 0, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,0)] <- c(200L,300L); x } [1] 1 2 3 4 5 NA NA NA NA 200 Warning message: In x[c(10, 0, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,0)] <- c(400L,500L,600L); x } [1] 1 2 3 4 5 NA NA NA NA 400 Warning message: In x[c(10, 0, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,10)] <- c(200L,300L); x } [1] 1 2 3 4 5 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,10)] <- c(400L,500L,600L); x } [1] 1 2 3 4 5 NA NA NA NA 500 Warning message: In x[c(10, 0, 10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,2)] <- c(200L,300L); x } [1] 1 300 3 4 5 NA NA NA NA 200 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,0,2)] <- c(400L,500L,600L); x } [1] 1 500 3 4 5 NA NA NA NA 400 Warning message: In x[c(10, 0, 2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,(1+NA))] <- c(200L,300L); x } Error in x[c(10, 10, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, 10, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,-10)] <- c(200L,300L); x } Error in x[c(10, 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,-10)] <- c(400L,500L,600L); x } Error in x[c(10, 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,-2)] <- c(200L,300L); x } Error in x[c(10, 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,-2)] <- c(400L,500L,600L); x } Error in x[c(10, 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,0)] <- c(200L,300L); x } [1] 1 2 3 4 5 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,0)] <- c(400L,500L,600L); x } [1] 1 2 3 4 5 NA NA NA NA 500 Warning message: In x[c(10, 10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,10)] <- c(200L,300L); x } [1] 1 2 3 4 5 NA NA NA NA 200 Warning message: In x[c(10, 10, 10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,10)] <- c(400L,500L,600L); x } [1] 1 2 3 4 5 NA NA NA NA 600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,2)] <- c(200L,300L); x } [1] 1 200 3 4 5 NA NA NA NA 300 Warning message: In x[c(10, 10, 2)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,10,2)] <- c(400L,500L,600L); x } [1] 1 600 3 4 5 NA NA NA NA 500 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,(1+NA))] <- c(200L,300L); x } Error in x[c(10, 2, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(10, 2, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,-10)] <- c(200L,300L); x } Error in x[c(10, 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,-10)] <- c(400L,500L,600L); x } Error in x[c(10, 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,-2)] <- c(200L,300L); x } Error in x[c(10, 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,-2)] <- c(400L,500L,600L); x } Error in x[c(10, 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,0)] <- c(200L,300L); x } [1] 1 300 3 4 5 NA NA NA NA 200 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,0)] <- c(400L,500L,600L); x } [1] 1 500 3 4 5 NA NA NA NA 400 Warning message: In x[c(10, 2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,10)] <- c(200L,300L); x } [1] 1 300 3 4 5 NA NA NA NA 200 Warning message: In x[c(10, 2, 10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,10)] <- c(400L,500L,600L); x } [1] 1 500 3 4 5 NA NA NA NA 600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,2)] <- c(200L,300L); x } [1] 1 200 3 4 5 NA NA NA NA 200 Warning message: In x[c(10, 2, 2)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(10,2,2)] <- c(400L,500L,600L); x } [1] 1 600 3 4 5 NA NA NA NA 400 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),(1+NA))] <- c(200L,300L); x } Error in x[c(2, (1 + NA), (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),-10)] <- c(200L,300L); x } Error in x[c(2, (1 + NA), -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),-10)] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),-2)] <- c(200L,300L); x } Error in x[c(2, (1 + NA), -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),-2)] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),0)] <- c(200L,300L); x } Error in x[c(2, (1 + NA), 0)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),0)] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), 0)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),10)] <- c(200L,300L); x } Error in x[c(2, (1 + NA), 10)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),10)] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),2)] <- c(200L,300L); x } Error in x[c(2, (1 + NA), 2)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,(1+NA),2)] <- c(400L,500L,600L); x } Error in x[c(2, (1 + NA), 2)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,(1+NA))] <- c(200L,300L); x } Error in x[c(2, -10, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, -10, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,-10)] <- c(200L,300L); x } Error in x[c(2, -10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,-10)] <- c(400L,500L,600L); x } Error in x[c(2, -10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,-2)] <- c(200L,300L); x } Error in x[c(2, -10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,-2)] <- c(400L,500L,600L); x } Error in x[c(2, -10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,0)] <- c(200L,300L); x } Error in x[c(2, -10, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,0)] <- c(400L,500L,600L); x } Error in x[c(2, -10, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,10)] <- c(200L,300L); x } Error in x[c(2, -10, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,10)] <- c(400L,500L,600L); x } Error in x[c(2, -10, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,2)] <- c(200L,300L); x } Error in x[c(2, -10, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-10,2)] <- c(400L,500L,600L); x } Error in x[c(2, -10, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,(1+NA))] <- c(200L,300L); x } Error in x[c(2, -2, (1 + NA))] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, -2, (1 + NA))] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,-10)] <- c(200L,300L); x } Error in x[c(2, -2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,-10)] <- c(400L,500L,600L); x } Error in x[c(2, -2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,-2)] <- c(200L,300L); x } Error in x[c(2, -2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,-2)] <- c(400L,500L,600L); x } Error in x[c(2, -2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,0)] <- c(200L,300L); x } Error in x[c(2, -2, 0)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,0)] <- c(400L,500L,600L); x } Error in x[c(2, -2, 0)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,10)] <- c(200L,300L); x } Error in x[c(2, -2, 10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,10)] <- c(400L,500L,600L); x } Error in x[c(2, -2, 10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,2)] <- c(200L,300L); x } Error in x[c(2, -2, 2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,-2,2)] <- c(400L,500L,600L); x } Error in x[c(2, -2, 2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,(1+NA))] <- c(200L,300L); x } Error in x[c(2, 0, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, 0, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,-10)] <- c(200L,300L); x } Error in x[c(2, 0, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,-10)] <- c(400L,500L,600L); x } Error in x[c(2, 0, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,-2)] <- c(200L,300L); x } Error in x[c(2, 0, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,-2)] <- c(400L,500L,600L); x } Error in x[c(2, 0, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,0)] <- c(200L,300L); x } [1] 1 200 3 4 5 Warning message: In x[c(2, 0, 0)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,0)] <- c(400L,500L,600L); x } [1] 1 400 3 4 5 Warning message: In x[c(2, 0, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,10)] <- c(200L,300L); x } [1] 1 200 3 4 5 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,10)] <- c(400L,500L,600L); x } [1] 1 400 3 4 5 NA NA NA NA 500 Warning message: In x[c(2, 0, 10)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,2)] <- c(200L,300L); x } [1] 1 300 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,0,2)] <- c(400L,500L,600L); x } [1] 1 500 3 4 5 Warning message: In x[c(2, 0, 2)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,(1+NA))] <- c(200L,300L); x } Error in x[c(2, 10, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, 10, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,-10)] <- c(200L,300L); x } Error in x[c(2, 10, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,-10)] <- c(400L,500L,600L); x } Error in x[c(2, 10, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,-2)] <- c(200L,300L); x } Error in x[c(2, 10, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,-2)] <- c(400L,500L,600L); x } Error in x[c(2, 10, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,0)] <- c(200L,300L); x } [1] 1 200 3 4 5 NA NA NA NA 300 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,0)] <- c(400L,500L,600L); x } [1] 1 400 3 4 5 NA NA NA NA 500 Warning message: In x[c(2, 10, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,10)] <- c(200L,300L); x } [1] 1 200 3 4 5 NA NA NA NA 200 Warning message: In x[c(2, 10, 10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,10)] <- c(400L,500L,600L); x } [1] 1 400 3 4 5 NA NA NA NA 600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,2)] <- c(200L,300L); x } [1] 1 200 3 4 5 NA NA NA NA 300 Warning message: In x[c(2, 10, 2)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,10,2)] <- c(400L,500L,600L); x } [1] 1 600 3 4 5 NA NA NA NA 500 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,(1+NA))] <- c(200L,300L); x } Error in x[c(2, 2, (1 + NA))] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,(1+NA))] <- c(400L,500L,600L); x } Error in x[c(2, 2, (1 + NA))] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,-10)] <- c(200L,300L); x } Error in x[c(2, 2, -10)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,-10)] <- c(400L,500L,600L); x } Error in x[c(2, 2, -10)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,-2)] <- c(200L,300L); x } Error in x[c(2, 2, -2)] <- c(200L, 300L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,-2)] <- c(400L,500L,600L); x } Error in x[c(2, 2, -2)] <- c(400L, 500L, 600L) : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,0)] <- c(200L,300L); x } [1] 1 300 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,0)] <- c(400L,500L,600L); x } [1] 1 500 3 4 5 Warning message: In x[c(2, 2, 0)] <- c(400L, 500L, 600L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,10)] <- c(200L,300L); x } [1] 1 300 3 4 5 NA NA NA NA 200 Warning message: In x[c(2, 2, 10)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,10)] <- c(400L,500L,600L); x } [1] 1 500 3 4 5 NA NA NA NA 600 ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,2)] <- c(200L,300L); x } [1] 1 200 3 4 5 Warning message: In x[c(2, 2, 2)] <- c(200L, 300L) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleValues.testVectorUpdate#Output.MayIgnoreErrorContext#Output.MayIgnoreWarningContext# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(2,2,2)] <- c(400L,500L,600L); x } [1] 1 600 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testAccessSequence# #{ x<-c(1L,2L,3L,4L,5L); x[1:4][1:3][1:2][1:1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testAccessSequence# #{ x<-c(1L,2L,3L,4L,5L); x[1:5][2:5][2:4][2:2] } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testAccessSequence# #{ x<-c(1L,2L,3L,4L,5L); x[2:5][2:4][2:3][2:2] } [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[1+1i, 1]<-7 } Error in `[<-`(`*tmp*`, 1 + (0+1i), 1, value = 7) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Ignored.Unstable#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[1+1i, 1]<-NULL } Error in `[<-`(`*tmp*`, 1 + (0+1i), 1, value = NULL) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[1+1i, 1]<-c(7,42) } Error in `[<-`(`*tmp*`, 1 + (0+1i), 1, value = c(7, 42)) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[1+1i, 1]<-integer() } Error in `[<-`(`*tmp*`, 1 + (0+1i), 1, value = integer(0)) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[1+1i, 1]]<-7 } Error in `[[<-`(`*tmp*`, 1 + (0+1i), 1, value = 7) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Ignored.Unstable#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[1+1i, 1]]<-NULL } Error in x[[1 + (0+1i), 1]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[1+1i, 1]]<-c(7,42) } Error in x[[1 + (0+1i), 1]] <- c(7, 42) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[1+1i, 1]]<-integer() } Error in x[[1 + (0+1i), 1]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-c(1,2,3,4); x[1+1i]<-NULL } Error in x[1 + (0+1i)] <- NULL : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-c(1,2,3,4); x[1+1i]<-c(1) } Error in x[1 + (0+1i)] <- c(1) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-c(1,2,3,4); x[1+1i]<-c(1,2) } Error in x[1 + (0+1i)] <- c(1, 2) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-c(1,2,3,4); x[1+1i]<-c(1,2,3) } Error in x[1 + (0+1i)] <- c(1, 2, 3) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-c(1,2,3,4); x[1+1i]<-integer() } Error in x[1 + (0+1i)] <- integer() : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Ignored.Unstable#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); x[[1+1i]]<-NULL } Error in x[[1 + (0+1i)]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-c(1,2,3,4); x[[1+1i]]<-c(1) } Error in x[[1 + (0+1i)]] <- c(1) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); x[[1+1i]]<-c(1,2) } Error in x[[1 + (0+1i)]] <- c(1, 2) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); x[[1+1i]]<-c(1,2,3) } Error in x[[1 + (0+1i)]] <- c(1, 2, 3) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); x[[1+1i]]<-integer() } Error in x[[1 + (0+1i)]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[1+1i, 1]<-7 } Error in `[<-`(`*tmp*`, 1 + (0+1i), 1, value = 7) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[1+1i, 1]<-NULL } Error in `[<-`(`*tmp*`, 1 + (0+1i), 1, value = NULL) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[1+1i, 1]<-c(7,42) } Error in `[<-`(`*tmp*`, 1 + (0+1i), 1, value = c(7, 42)) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[1+1i, 1]<-integer() } Error in `[<-`(`*tmp*`, 1 + (0+1i), 1, value = integer(0)) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[1+1i, 1]]<-7 } Error in `[[<-`(`*tmp*`, 1 + (0+1i), 1, value = 7) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[1+1i, 1]]<-NULL } Error in `[[<-`(`*tmp*`, 1 + (0+1i), 1, value = NULL) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[1+1i, 1]]<-c(7,42) } Error in `[[<-`(`*tmp*`, 1 + (0+1i), 1, value = c(7, 42)) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[1+1i, 1]]<-integer() } Error in `[[<-`(`*tmp*`, 1 + (0+1i), 1, value = integer(0)) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-list(1,2,3,4); x[1+1i]<-NULL } Error in x[1 + (0+1i)] <- NULL : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-list(1,2,3,4); x[1+1i]<-c(1) } Error in x[1 + (0+1i)] <- c(1) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-list(1,2,3,4); x[1+1i]<-c(1,2) } Error in x[1 + (0+1i)] <- c(1, 2) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-list(1,2,3,4); x[1+1i]<-c(1,2,3) } Error in x[1 + (0+1i)] <- c(1, 2, 3) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-list(1,2,3,4); x[1+1i]<-integer() } Error in x[1 + (0+1i)] <- integer() : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-list(1,2,3,4); x[[1+1i]]<-NULL } Error in x[[1 + (0+1i)]] <- NULL : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-list(1,2,3,4); x[[1+1i]]<-c(1) } Error in x[[1 + (0+1i)]] <- c(1) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-list(1,2,3,4); x[[1+1i]]<-c(1,2) } Error in x[[1 + (0+1i)]] <- c(1, 2) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-list(1,2,3,4); x[[1+1i]]<-c(1,2,3) } Error in x[[1 + (0+1i)]] <- c(1, 2, 3) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testComplexIndex# #{ x<-list(1,2,3,4); x[[1+1i]]<-integer() } Error in x[[1 + (0+1i)]] <- integer() : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDimnamesNames# #v <- 1:8; dim(v) <- c(2,2,2); dimnames(v) <- list(foo=c('a','b'), bar=c('x','y'), baz=c('u','v')); v[,,1,drop=TRUE] bar foo x y a 1 3 b 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDimnamesNames# #v <- 1:8; dim(v) <- c(2,2,2); dimnames(v) <- list(foo=c('a','b'), bar=c('x','y'), baz=c('u','v')); v[,,1] bar foo x y a 1 3 b 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDimnamesNames# #v <- 1:8; dim(v) <- c(2,2,2); dimnames(v) <- list(foo=c('a','b'), bar=c('x','y'), baz=c('u','v')); v[,,2,drop=FALSE] , , baz = v bar foo x y a 5 7 b 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-c(7,42); `[[`(x); } Error in x[[]] : no index specified ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-c(7,42); `[[`(x, 2); } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-c(7,42); `[`(x); } [1] 7 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-c(7,42); `[`(x, 2); } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-c(7,aa=42); `[[`(x, "a") } Error in x[["a"]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-c(7,aa=42); `[[`(x, "a", exact=FALSE) } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-c(7,aa=42); `[[`(x, "a", exact=TRUE) } Error in x[["a", exact = TRUE]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-list(a=7); `$`(x, "a") } [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-matrix(c(7,42), ncol=2); `[`(x, 1, 2) } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-matrix(c(7,42), ncol=2); `[`(x, 1, 2, drop=FALSE) } [,1] [1,] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectAccess# #{ x<-matrix(c(7,42), ncol=2); `[`(x, 1, 2, drop=TRUE) } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-c(7,42); `[<-`(x, 1); } [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-c(7,42); `[<-`(x, 1, 7); } [1] 7 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate#Output.IgnoreErrorContext# #{ x<-c(7,42); `[[<-`(x, 1); } Error: [[ ]] with missing subscript ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-c(7,42); `[[<-`(x, 1, 7); } [1] 7 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-c(a=7); class(x)<-"foo"; `$<-.foo`<-function(x, name, value) x[name]<-value; `$<-.foo`(x, "a", 42); x } a 7 attr(,"class") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-c(a=7); class(x)<-"foo"; `$<-.foo`<-function(x, name, value) x[name]<-value; `$<-`(x, "a", 42); x } a 7 attr(,"class") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-data.frame(1,2); `[<-.data.frame`(x, 2, value=7) } X1 X2 1 1 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-data.frame(1,2); `[[<-.data.frame`(x, 2, value=7) } X1 X2 1 1 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-data.frame(a=7, b=42); `$<-`(x, "a", 1); x } a b 1 7 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-data.frame(c(1,2), c(3,4)); `[<-.data.frame`(x, 2, 1, 7) } c.1..2. c.3..4. 1 1 3 2 7 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-data.frame(c(1,2), c(3,4)); `[[<-.data.frame`(x, 2, 1, 7) } c.1..2. c.3..4. 1 1 3 2 7 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-factor(c("a", "b", "a")); `[<-`(x, 3, value="b") } [1] a b b Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testDirectUpdate# #{ x<-factor(c("a", "b", "a")); `[[<-`(x, 3, value="b") } [1] a b b Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testEmptyUpdate# #{ a <- list(); a$a = 6; a; } $a [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testEmptyUpdate# #{ a <- list(); a[['b']] = 6; a; } $b [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ a <- c(1,2); a$a = 3; a; } [[1]] [1] 1 [[2]] [1] 2 $a [1] 3 Warning message: In a$a = 3 : Coercing LHS to a list ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ a <- c(a=1,b=2); a$a; } Error in a$a : $ operator is invalid for atomic vectors ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ a <- list(a = 1, b = 2); a$a <- 67; a; } $a [1] 67 $b [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ a <- list(a = 1, b = 2); a$a; } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ a <- list(a = 1, b = 2); a$b <- 67; a; } $a [1] 1 $b [1] 67 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ a <- list(a = 1, b = 2); a$b; } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ a <- list(a = 1, b = 2); a$c <- 67; a; } $a [1] 1 $b [1] 2 $c [1] 67 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ a <- list(a = 1, b = 2); a$c; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ e <- list(a=2) ; e$"a" } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ e <- list(a=2) ; e$a } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ f <- function(v) { v$x } ; f(list(xa=1, xb=2, hello=3)) ; f(list(y=2,x=3)) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ f <- function(v) { v$x } ; f(list(xa=1, xb=2, hello=3)) ; l <- list(y=2,x=3) ; f(l) ; l[[2]] <- 4 ; f(l) } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ v <- list(xb=1, b=2, aa=3, aa=4) ; v$a } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ v <- list(xb=1, b=2, aa=3, aa=4) ; v$aa } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ v <- list(xb=1, b=2, aa=3, aa=4) ; v$x } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x <- list(1, 2) ; x$b } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess#Output.IgnoreErrorContext# #{ x <- list(a=1, b=2) ; f <- function(x) { x$b } ; f(x) ; f(1:3) } Error: $ operator is invalid for atomic vectors ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x <- list(a=1, b=2) ; f <- function(x) { x$b } ; f(x) ; f(x) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x <- list(a=1, b=2) ; f <- function(x) { x$b } ; f(x) ; x <- list(c=2,b=10) ; f(x) } [1] 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x<-NULL; x$a } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x<-c(a=7, 42); x$a<-NULL; x } [[1]] [1] 42 Warning message: In x$a <- NULL : Coercing LHS to a list ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x<-data.frame(a=list(1,2)); y<-list(bb=x, c=NULL); y$b$a.1 } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x<-data.frame(a=list(1,2)); y<-list(bb=x, c=NULL); y$b$a.2 } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x<-list(1, a=7, 42); x$a<-NULL; x } [[1]] [1] 1 [[2]] [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x<-list(a=7, 42); x$a<-NULL; x } [[1]] [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x<-list(a=list(b=7)); x$a$b<-42; x } $a $a$b [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x<-list(a=list(b=7)); x$a[["b"]]<-42; x } $a $a$b [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x<-list(a=list(b=7)); x[["a"]]$b<-42; x } $a $a$b [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFieldAccess# #{ x<-list(list(a=7), NULL); x[[1]]$a<-42; x } [[1]] [[1]]$a [1] 42 [[2]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-list(7, list(1, 42)); y<-`[[`(x, c(2,2)); y } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-.subset(x); y } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-.subset2(x); y } Error in .subset2(x) : no index specified ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-`[[`(x); y } Error in x[[]] : no index specified ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-`[[`(x, exact=FALSE); y } Error in x[[exact = FALSE]] : no index specified ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-`[`(x); y } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-`[`(x, 1, 2); y } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-`[`(x, 1, 2, drop=FALSE); y } [,1] [1,] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-`[`(x, 2); y } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-`[`(x, drop=FALSE); y } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-`[`(x, drop=FALSE, 1, 2); y } [,1] [1,] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2); y<-`[`(x, drop=TRUE); y } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2, dimnames=list(c("a", "b"), c("c", "dd"))); `[[`(x, "a", "d") } Error in x[["a", "d"]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2, dimnames=list(c("a", "b"), c("c", "dd"))); `[[`(x, "a", "d", exact=FALSE) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2, dimnames=list(c("a", "b"), c("c", "dd"))); `[[`(x, "a", "dd") } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testFunctionAccess# #{ x<-matrix(1:4, ncol=2, dimnames=list(c("a", "b"), c("c", "dd"))); `[[`(x, exact=FALSE, "a", "d") } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testGenericUpdate# #{ a <- TRUE; a[[2]] <- FALSE; a; } [1] TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testIn# #{ (1 + 2i) %in% c(1+10i, 1+4i, 2+2i, 1+2i) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testIn# #{ 1 %in% 1:10 } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testIn# #{ 1:3 %in% 1:10 } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testIn# #{ as.logical(-1:1) %in% TRUE } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testIn# #{ c("1L","hello") %in% 1:10 } [1] FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testIn# #{ x <- function(){1} ; x %in% TRUE } Error in match(x, table, nomatch = 0L) : 'match' requires vector arguments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #f <- function(x) x[[1]]; l <- as.pairlist(c('a','b')); f(l); l <- quote(a+b); f(l) [1] "a" `+` ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #l <- quote(a+b+c); l[[c(2,2)]]; l[[c(2,3)]]; l[[c(2,2)]]; l[[c(3)]]; l <- as.pairlist(c('+','x','c')); l[[2]] <- as.pairlist(c('+','a','b')); l[[c(2,2)]]; l[[c(2,3)]]; l[[c(2,2)]]; l[[c(3)]] a b a c [1] "a" [1] "b" [1] "a" [1] "c" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ e <- quote(f(x=a, b)); names(e) } [1] "" "x" "" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ e <- quote(f(x=a, y=b)); names(e) } [1] "" "x" "y" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ e <- quote(f(x=a, y=b)); names(e[-1]) } [1] "x" "y" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ f<-quote(function(x=42) x); f[[2]]$x<-7; eval(f)() } [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ x<-quote(function(x, y) 42); names(x[[2]]) } [1] "x" "y" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ x<-quote(function(x, y) 42); typeof(x[[2]][[1]]) } [1] "symbol" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ x<-quote(function(x, y) 42); x[2] } as.pairlist(alist(x = , y = ))() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ x<-quote(function(x, y) 42); x[NA] } NULL(NULL, NULL, NULL) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ x<-quote(function(x, y) 42); x[NaN] } NULL() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ x<-quote(function(x, y) 42); x[[2]] } $x $y ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLanguageIndex# #{ x<-quote(function(x, y=7) 42); x[[2]] } $x $y [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLargeNames# #v <- runif(1000); names(v) <- paste0('a', 1:1000); v[paste0('a', 1:1000)] <- 42; length(v); sum(v) [1] 1000 [1] 42000 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLengthUpdate# #{ k <- c(1,2,3) ; length(k) <- 5 ; k } [1] 1 2 3 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testLengthUpdate# #{ k <- c(1,2,3,4,5,6,7,8,9) ; length(k) <- 4 ; k } [1] 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ f <- function(b, i, v) { b[[i]] <- v ; b } ; f(1:3,2,2) ; f(1:3,"X",2) ; f(list(1,list(2)),c(2,1),4) } [[1]] [1] 1 [[2]] [[2]][[1]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ f<-function(i) { x<-list(1,2,3,4,5) ; x[i] } ; f(1) ; f(3:4) } [[1]] [1] 3 [[2]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ f<-function(i) { x<-list(1,2,3,4,5) ; x[i] } ; f(1) ; f(1L) ; f(TRUE) } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 [[4]] [1] 4 [[5]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ f<-function(i) { x<-list(1,2,3,4,5) ; x[i] } ; f(1) ; f(TRUE) ; f(1L) } [[1]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ f<-function(i) { x<-list(1,2,3,4,5) ; x[i] } ; f(c(TRUE,FALSE)) ; f(3:4) } [[1]] [1] 3 [[2]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ f<-function(i) { x<-list(1L,2L,3L,4L,5L) ; x[i] } ; f(1) ; f(TRUE) ; f(c(3,2)) } [[1]] [1] 3 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ f<-function(x, i) { x[i] } ; f(list(1,2,3),3:1) ; f(list(1L,2L,3L,4L,5L),c(0,0,0,0-2)) } [[1]] [1] 1 [[2]] [1] 3 [[3]] [1] 4 [[4]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l <- list(a=1,b=2,c=list(d=3,e=list(f=4))) ; l[[c(3,1)]] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l <- list(a=1,b=2,c=list(d=3,e=list(f=4))) ; l[[c(3,2)]] } $f [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l <- list(c=list(d=3,e=c(f=4)), b=2, a=3) ; l[[c("c")]] } $d [1] 3 $e f 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l <- list(c=list(d=3,e=c(f=4)), b=2, a=3) ; l[[c("c","e")]] } f 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l <- list(c=list(d=3,e=c(f=4)), b=2, a=3) ; l[[c("c","e", "f")]] } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-(list(list(1,2),c(3,4))); l[[c(2,1)]] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-(list(list(1,2),list(3,4))); l[[c(1,-1)]] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-(list(list(1,2),list(3,4))); l[[c(1,-2)]] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-(list(list(1,2),list(3,4))); l[[c(1,2)]] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-(list(list(1,2),list(3,4))); l[[c(1,TRUE)]] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-list(1,2,3) ; l[c(1,2)] } [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-list(1,2,3) ; l[c(2)] } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-list(1,2L,TRUE) ; l[-2] } [[1]] [1] 1 [[2]] [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-list(1,2L,TRUE) ; l[FALSE] } list() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-list(1,2L,TRUE) ; l[NA] } [[1]] NULL [[2]] NULL [[3]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-list(1,2L,TRUE) ; l[[2]] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ l<-list(1,2L,TRUE) ; l[c(FALSE,FALSE,TRUE)] } [[1]] [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ m<-list(1,2) ; m[NULL] } list() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ x<-list(1,2,3,4,5) ; x[c(TRUE,TRUE,TRUE,FALSE,FALSE,FALSE,FALSE,TRUE,NA)] } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 [[4]] NULL [[5]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ x<-list(1,2L,TRUE,FALSE,5) ; x[2:4] } [[1]] [1] 2 [[2]] [1] TRUE [[3]] [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ x<-list(1,2L,TRUE,FALSE,5) ; x[4:2] } [[1]] [1] FALSE [[2]] [1] TRUE [[3]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ x<-list(1,2L,TRUE,FALSE,5) ; x[c(-2,-3)] } [[1]] [1] 1 [[2]] [1] FALSE [[3]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ x<-list(1,2L,TRUE,FALSE,5) ; x[c(-2,-3,-4,0,0,0)] } [[1]] [1] 1 [[2]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ x<-list(1,2L,TRUE,FALSE,5) ; x[c(2,5,4,3,3,3,0)] } [[1]] [1] 2 [[2]] [1] 5 [[3]] [1] FALSE [[4]] [1] TRUE [[5]] [1] TRUE [[6]] [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListAccess# #{ x<-list(1,2L,TRUE,FALSE,5) ; x[c(2L,5L,4L,3L,3L,3L,0L)] } [[1]] [1] 2 [[2]] [1] 5 [[3]] [1] FALSE [[4]] [1] TRUE [[5]] [1] TRUE [[6]] [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListDefinitions# #{ list(1,b=list(2,3)) } [[1]] [1] 1 $b $b[[1]] [1] 2 $b[[2]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListDefinitions# #{ list(1,b=list(c=2,3)) } [[1]] [1] 1 $b $b$c [1] 2 $b[[2]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListDefinitions# #{ list(1,list(2,list(3,4))) } [[1]] [1] 1 [[2]] [[2]][[1]] [1] 2 [[2]][[2]] [[2]][[2]][[1]] [1] 3 [[2]][[2]][[2]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListDefinitions# #{ list(1:4) } [[1]] [1] 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListDefinitions# #{ list(list(c=2)) } [[1]] [[1]]$c [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(), 1]] } Error in x[[list(), 1]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(), 1]]<-7 } Error in `[[<-`(`*tmp*`, list(), 1, value = 7) : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(), 1]]<-c(7,42) } Error in x[[list(), 1]] <- c(7, 42) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(), 1]]<-integer() } Error in x[[list(), 1]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1), 1]] } Error in x[[list(1), 1]] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1), 1]]<-7 } Error in `[[<-`(`*tmp*`, list(1), 1, value = 7) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1), 1]]<-c(7,42) } Error in x[[list(1), 1]] <- c(7, 42) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1), 1]]<-integer() } Error in x[[list(1), 1]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1,2), 1]] } Error in x[[list(1, 2), 1]] : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1,2), 1]]<-7 } Error in `[[<-`(`*tmp*`, list(1, 2), 1, value = 7) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1,2), 1]]<-c(7,42) } Error in x[[list(1, 2), 1]] <- c(7, 42) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1,2), 1]]<-integer() } Error in x[[list(1, 2), 1]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1,2,3), 1]]<-7 } Error in `[[<-`(`*tmp*`, list(1, 2, 3), 1, value = 7) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1,2,3), 1]]<-c(7,42) } Error in x[[list(1, 2, 3), 1]] <- c(7, 42) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1,2,3), 1]]<-integer() } Error in x[[list(1, 2, 3), 1]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ x<-1:4; dim(x)<-c(2,2); x[list(), 1] } Error in x[list(), 1] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(), 1]<-7 } Error in `[<-`(`*tmp*`, list(), 1, value = 7) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(), 1]<-c(7,42) } Error in `[<-`(`*tmp*`, list(), 1, value = c(7, 42)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(), 1]<-integer() } Error in `[<-`(`*tmp*`, list(), 1, value = integer(0)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ x<-1:4; dim(x)<-c(2,2); x[list(1), 1] } Error in x[list(1), 1] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(1), 1]<-7 } Error in `[<-`(`*tmp*`, list(1), 1, value = 7) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(1), 1]<-c(7,42) } Error in `[<-`(`*tmp*`, list(1), 1, value = c(7, 42)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(1), 1]<-integer() } Error in `[<-`(`*tmp*`, list(1), 1, value = integer(0)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ x<-1:4; dim(x)<-c(2,2); x[list(1,2), 1] } Error in x[list(1, 2), 1] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(1,2), 1]<-7 } Error in `[<-`(`*tmp*`, list(1, 2), 1, value = 7) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(1,2), 1]<-c(7,42) } Error in `[<-`(`*tmp*`, list(1, 2), 1, value = c(7, 42)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(1,2), 1]<-integer() } Error in `[<-`(`*tmp*`, list(1, 2), 1, value = integer(0)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(1,2,3), 1]<-7 } Error in `[<-`(`*tmp*`, list(1, 2, 3), 1, value = 7) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(1,2,3), 1]<-c(7,42) } Error in `[<-`(`*tmp*`, list(1, 2, 3), 1, value = c(7, 42)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[list(1,2,3), 1]<-integer() } Error in `[<-`(`*tmp*`, list(1, 2, 3), 1, value = integer(0)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(), 1]] } Error in x[[list(), 1]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(), 1]]<-7 } Error in `[[<-`(`*tmp*`, list(), 1, value = 7) : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(), 1]]<-NULL } Error in `[[<-`(`*tmp*`, list(), 1, value = NULL) : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(), 1]]<-c(7,42) } Error in `[[<-`(`*tmp*`, list(), 1, value = c(7, 42)) : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(), 1]]<-integer() } Error in `[[<-`(`*tmp*`, list(), 1, value = integer(0)) : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1), 1]] } Error in x[[list(1), 1]] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1), 1]]<-7 } Error in `[[<-`(`*tmp*`, list(1), 1, value = 7) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1), 1]]<-NULL } Error in `[[<-`(`*tmp*`, list(1), 1, value = NULL) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1), 1]]<-c(7,42) } Error in `[[<-`(`*tmp*`, list(1), 1, value = c(7, 42)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1), 1]]<-integer() } Error in `[[<-`(`*tmp*`, list(1), 1, value = integer(0)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1,2), 1]] } Error in x[[list(1, 2), 1]] : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1,2), 1]]<-7 } Error in `[[<-`(`*tmp*`, list(1, 2), 1, value = 7) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1,2), 1]]<-NULL } Error in `[[<-`(`*tmp*`, list(1, 2), 1, value = NULL) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1,2), 1]]<-c(7,42) } Error in `[[<-`(`*tmp*`, list(1, 2), 1, value = c(7, 42)) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1,2), 1]]<-integer() } Error in `[[<-`(`*tmp*`, list(1, 2), 1, value = integer(0)) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1,2,3), 1]]<-7 } Error in `[[<-`(`*tmp*`, list(1, 2, 3), 1, value = 7) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1,2,3), 1]]<-NULL } Error in `[[<-`(`*tmp*`, list(1, 2, 3), 1, value = NULL) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1,2,3), 1]]<-c(7,42) } Error in `[[<-`(`*tmp*`, list(1, 2, 3), 1, value = c(7, 42)) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[list(1,2,3), 1]]<-integer() } Error in `[[<-`(`*tmp*`, list(1, 2, 3), 1, value = integer(0)) : attempt to select more than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(), 1] } Error in x[list(), 1] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(), 1]<-7 } Error in `[<-`(`*tmp*`, list(), 1, value = 7) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(), 1]<-NULL } Error in `[<-`(`*tmp*`, list(), 1, value = NULL) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(), 1]<-c(7,42) } Error in `[<-`(`*tmp*`, list(), 1, value = c(7, 42)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(), 1]<-integer() } Error in `[<-`(`*tmp*`, list(), 1, value = integer(0)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1), 1] } Error in x[list(1), 1] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1), 1]<-7 } Error in `[<-`(`*tmp*`, list(1), 1, value = 7) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1), 1]<-NULL } Error in `[<-`(`*tmp*`, list(1), 1, value = NULL) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1), 1]<-c(7,42) } Error in `[<-`(`*tmp*`, list(1), 1, value = c(7, 42)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1), 1]<-integer() } Error in `[<-`(`*tmp*`, list(1), 1, value = integer(0)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1,2), 1] } Error in x[list(1, 2), 1] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1,2), 1]<-7 } Error in `[<-`(`*tmp*`, list(1, 2), 1, value = 7) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1,2), 1]<-NULL } Error in `[<-`(`*tmp*`, list(1, 2), 1, value = NULL) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1,2), 1]<-c(7,42) } Error in `[<-`(`*tmp*`, list(1, 2), 1, value = c(7, 42)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1,2), 1]<-integer() } Error in `[<-`(`*tmp*`, list(1, 2), 1, value = integer(0)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1,2,3), 1]<-7 } Error in `[<-`(`*tmp*`, list(1, 2, 3), 1, value = 7) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1,2,3), 1]<-NULL } Error in `[<-`(`*tmp*`, list(1, 2, 3), 1, value = NULL) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1,2,3), 1]<-c(7,42) } Error in `[<-`(`*tmp*`, list(1, 2, 3), 1, value = c(7, 42)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[list(1,2,3), 1]<-integer() } Error in `[<-`(`*tmp*`, list(1, 2, 3), 1, value = integer(0)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list()]] } Error in z[[list()]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list()]]<-42 } Error in z[[list()]] <- 42 : attempt to select less than one element in OneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list()]]<-NULL } Error in z[[list()]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list()]]<-integer() } Error in z[[list()]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[[list(1)]] } Error in z[[list(1)]] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[[list(1)]]<-42 } Error in z[[list(1)]] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list(1)]]<-NULL } Error in z[[list(1)]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list(1)]]<-integer() } Error in z[[list(1)]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list(1,2)]] } Error in z[[list(1, 2)]] : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[[list(1,2)]]<-42 } Error in z[[list(1, 2)]] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list(1,2)]]<-NULL } Error in z[[list(1, 2)]] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list(1,2)]]<-integer() } Error in z[[list(1, 2)]] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list(1,2,3)]]<-42 } Error in `[[<-`(`*tmp*`, list(1, 2, 3), value = 42) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list(1,2,3)]]<-NULL } Error in `[[<-`(`*tmp*`, list(1, 2, 3), value = NULL) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-1:4; z[[list(1,2,3)]]<-integer() } Error in `[[<-`(`*tmp*`, list(1, 2, 3), value = integer(0)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list()] } Error in z[list()] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list()]<-42 } Error in z[list()] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list()]<-NULL } Error in z[list()] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list()]<-integer() } Error in z[list()] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1)] } Error in z[list(1)] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1)]<-42 } Error in z[list(1)] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1)]<-NULL } Error in z[list(1)] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1)]<-integer() } Error in z[list(1)] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1,2)] } Error in z[list(1, 2)] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1,2)]<-42 } Error in z[list(1, 2)] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1,2)]<-NULL } Error in z[list(1, 2)] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1,2)]<-integer() } Error in z[list(1, 2)] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1,2,3)]<-42 } Error in z[list(1, 2, 3)] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1,2,3)]<-NULL } Error in z[list(1, 2, 3)] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-1:4; z[list(1,2,3)]<-integer() } Error in z[list(1, 2, 3)] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-list(1,2,3,4); z[[list()]] } Error in z[[list()]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-list(1,2,3,4); z[[list()]]<-42 } Error in z[[list()]] <- 42 : attempt to select less than one element in OneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-list(1,2,3,4); z[[list()]]<-NULL } Error in z[[list()]] <- NULL : attempt to select less than one element in OneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorMessage# #{ z<-list(1,2,3,4); z[[list()]]<-integer() } Error in z[[list()]] <- integer() : attempt to select less than one element in OneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[[list(1)]] } Error in z[[list(1)]] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[[list(1)]]<-42 } Error in z[[list(1)]] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[[list(1)]]<-NULL } Error in z[[list(1)]] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[[list(1)]]<-integer() } Error in z[[list(1)]] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[[list(1,2)]] } Error in z[[list(1, 2)]] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[[list(1,2)]]<-42 } Error in z[[list(1, 2)]] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[[list(1,2)]]<-NULL } Error in z[[list(1, 2)]] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[[list(1,2)]]<-integer() } Error in z[[list(1, 2)]] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ z<-list(1,2,3,4); z[[list(1,2,3)]]<-42 } Error in `[[<-`(`*tmp*`, list(1, 2, 3), value = 42) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ z<-list(1,2,3,4); z[[list(1,2,3)]]<-NULL } Error in `[[<-`(`*tmp*`, list(1, 2, 3), value = NULL) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex#Output.IgnoreErrorContext# #{ z<-list(1,2,3,4); z[[list(1,2,3)]]<-integer() } Error in `[[<-`(`*tmp*`, list(1, 2, 3), value = integer(0)) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list()] } Error in z[list()] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list()]<-42 } Error in z[list()] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list()]<-NULL } Error in z[list()] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list()]<-integer() } Error in z[list()] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1)] } Error in z[list(1)] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1)]<-42 } Error in z[list(1)] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1)]<-NULL } Error in z[list(1)] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1)]<-integer() } Error in z[list(1)] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1,2)] } Error in z[list(1, 2)] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1,2)]<-42 } Error in z[list(1, 2)] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1,2)]<-NULL } Error in z[list(1, 2)] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1,2)]<-integer() } Error in z[list(1, 2)] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1,2,3)]<-42 } Error in z[list(1, 2, 3)] <- 42 : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1,2,3)]<-NULL } Error in z[list(1, 2, 3)] <- NULL : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListIndex# #{ z<-list(1,2,3,4); z[list(1,2,3)]<-integer() } Error in z[list(1, 2, 3)] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# # { f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=1)),c("b","a"),10) ; f(list(a=1,b=c(a=2)),c(TRUE,TRUE),3) } $a [1] 3 $b a 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function() { l[1:2] <- x ; x[1] <- 211L ; l[1] } ; l <- 1:3 ; x <- 10L ; f() } [1] 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Ignored.Unstable# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=1)),c("b","a"),10) ; f(c(a=1,b=2),"b",NULL) } Error in b[[i]] <- v : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=1)),c("b","a"),10) ; f(c(a=1,b=2),"b",as.raw(12)) } Error in b[[i]] <- v : incompatible types (from raw to double) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Output.IgnoreErrorMessage# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=1)),c("b","a"),10) ; f(c(a=1,b=2),c(1+2i,3+4i),as.raw(12)) } Error in b[[i]] <- v : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=1)),c("b","a"),10) ; f(f,TRUE,3) } Error in b[[i]] <- v : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=1)),c("b","a"),10) ; f(list(a=1,b=2),"b",NULL) } $a [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=1)),c("b","a"),10) ; f(list(a=1,b=c(a=2)),1+2i,1:3) } Error in b[[i]] <- v : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=1)),c("b","a"),10) ; f(list(a=1,b=c(a=2)),c("b","a"),1:3) } Error in b[[i]] <- v : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=1)),c("b","a"),10) ; f(list(a=1,b=f),c("b","x"),3) } Error in b[[i]] <- v : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=1)),c("b","a"),10) ; f(list(a=1,b=list(2)),"b",double()) } $a [1] 1 $b numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(c(1,2,b=c(x=3)),c("b"),10) } b.x b 1 2 3 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Output.IgnoreErrorContext# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(c(1,2,b=c(x=3)),c("b","x"),10) } Error in `[[<-`(`*tmp*`, i, value = 10) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Output.IgnoreErrorContext# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2, list(3)),c("b","x"),10) } Error in `[[<-`(`*tmp*`, i, value = 10) : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=c(x=3)),c("b","x"),10) } [[1]] [1] 1 [[2]] [1] 2 $b x 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Output.IgnoreErrorContext# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(3)),c("a","x"),10) } Error in `[[<-`(`*tmp*`, i, value = 10) : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(a=list(x=1,y=2),3),4),c("b","a","x"),10) } [[1]] [1] 1 [[2]] [1] 2 $b $b$a $b$a$x [1] 10 $b$a$y [1] 2 $b[[2]] [1] 3 [[4]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(x=3)),c("b","x"),10) } [[1]] [1] 1 [[2]] [1] 2 $b $b$x [1] 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Output.IgnoreErrorContext# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,b=list(x=3)),character(),10) } Error in b[[i]] <- v : attempt to select less than one element in OneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,list(3)), c(3,1), 4) ; f(c(1,2,3), "hello", 2) } hello 1 2 3 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,list(3)), c(3,1), 4) ; f(c(1,2,3), 2L, 1:2) } Error in b[[i]] <- v : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Ignored.Unstable# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,list(3)), c(3,1), 4) ; f(c(1,2,3), 2L, NULL) } Error in b[[i]] <- v : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,list(3)), c(3,1), 4) ; f(c(1,2,3), f, 2) } Error in b[[i]] <- v : invalid subscript type 'closure' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,list(3)), c(3,1), 4) ; f(list(1,2,3), 2L, 3) } [[1]] [1] 1 [[2]] [1] 3 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,list(3)), c(3,1), 4) ; f(list(1,2,3), 2L, NULL) } [[1]] [1] 1 [[2]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(list(1,2,list(3)), c(3,1), 4) ; f(list(f,f), c(1,1), 3) } Error in b[[i]] <- v : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Output.IgnoreErrorContext# #{ l <- as.list(1:3) ; l[[0]] <- 2 } Error in l[[0]] <- 2 : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list() ; l[[1]] <-2 ; l} [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list() ; l[c(TRUE,TRUE)] <-2 ; l } [[1]] [1] 2 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1, list(2)) ; m <- l ; l[[c(2,1)]] <- 3 ; m[[2]][[1]] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1, list(2,3,4)) ; m <- l ; l[[c(2,1)]] <- 3 ; m[[2]][[1]] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Output.IgnoreErrorContext# #{ l <- list(1,2) ; l[[c(1,1,2,3,4,3)]] <- 10 ; l } Error in `[[<-`(`*tmp*`, c(1, 1, 2, 3, 4, 3), value = 10) : recursive indexing failed at level 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,2); l[0] <- NULL; l} [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Output.IgnoreErrorContext# #{ l <- list(1,2); l[[0]] } Error in l[[0]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,2,3) ; l[-1L] <- c(20,30) ; l } [[1]] [1] 1 [[2]] [1] 20 [[3]] [1] 30 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,2,3) ; l[-1] <- c(20,30) ; l } [[1]] [1] 1 [[2]] [1] 20 [[3]] [1] 30 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,2,3) ; l[2] <- list(100) ; l[2] } [[1]] [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,2,3) ; l[[2]] <- list(100) ; l[2] } [[1]] [[1]][[1]] [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,2,3) ; l[c(2,3)] <- c(20,30) ; l } [[1]] [1] 1 [[2]] [1] 20 [[3]] [1] 30 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,2,3) ; l[c(2:3)] <- c(20,30) ; l } [[1]] [1] 1 [[2]] [1] 20 [[3]] [1] 30 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,2,3) ; l[c(FALSE,TRUE,TRUE)] <- c(20,30) ; l } [[1]] [1] 1 [[2]] [1] 20 [[3]] [1] 30 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,2,3) ; x <- list(100) ; y <- x; l[1:1] <- x ; l[[1]] } [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,2,3) ; x <- list(100) ; y <- x; l[[1:1]] <- x ; l[[1]] } [[1]] [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,list(2,c(3))) ; l[[c(2,2)]] <- 4 ; l } [[1]] [1] 1 [[2]] [[2]][[1]] [1] 2 [[2]][[2]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,list(2,c(3))) ; l[[c(2,2)]] <- NULL ; l } [[1]] [1] 1 [[2]] [[2]][[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,list(2,list(3))) ; l[[1]] <- 5 ; l } [[1]] [1] 5 [[2]] [[2]][[1]] [1] 2 [[2]][[2]] [[2]][[2]][[1]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(1,list(2,list(3))) ; l[[1]] <- NULL ; l } [[1]] [[1]][[1]] [1] 2 [[1]][[2]] [[1]][[2]][[1]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(100) ; f <- function() { l[[1]] <- 2 } ; f() ; l } [[1]] [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(100,200,300,400,500) ; f <- function() { l[[3]] <- 2 } ; f() ; l } [[1]] [1] 100 [[2]] [1] 200 [[3]] [1] 300 [[4]] [1] 400 [[5]] [1] 500 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(a=1,b=2,c=3) ; l[1] <- NULL ; l } $b [1] 2 $c [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(a=1,b=2,c=3) ; l[3] <- NULL ; l } $a [1] 1 $b [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(a=1,b=2,c=3) ; l[4] <- NULL ; l} $a [1] 1 $b [1] 2 $c [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(a=1,b=2,c=3) ; l[5] <- NULL ; l} $a [1] 1 $b [1] 2 $c [1] 3 [[4]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(a=1,b=2,c=3) ; l[["b"]] <- NULL ; l } $a [1] 1 $c [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(a=1,b=2,c=3) ; l[[4]] <- NULL ; l} $a [1] 1 $b [1] 2 $c [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(a=1,b=2,c=3) ; l[[5]] <- NULL ; l} $a [1] 1 $b [1] 2 $c [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(a=1,b=2,cd=list(c=3,d=4)) ; x <- list(l,xy=list(x=l,y=l)) ; x[[c("xy","y","cd","d")]] <- 10 ; l } $a [1] 1 $b [1] 2 $cd $cd$c [1] 3 $cd$d [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- list(a=1,b=2,cd=list(c=3,d=4)) ; x <- list(l,xy=list(x=l,y=l)) ; x[[c(2,2,3,2)]] <- 10 ; l } $a [1] 1 $b [1] 2 $cd $cd$c [1] 3 $cd$d [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Output.IgnoreErrorContext# #{ l <- list(list(1,2),2) ; l[[c(1,1,2,3,4,3)]] <- 10 ; l } Error in `[[<-`(`*tmp*`, c(1, 1, 2, 3, 4, 3), value = 10) : recursive indexing failed at level 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- matrix(list(1,2)) ; l[3] <- NULL ; l } [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- matrix(list(1,2)) ; l[4] <- NULL ; l } [[1]] [1] 1 [[2]] [1] 2 [[3]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- matrix(list(1,2)) ; l[[3]] <- NULL ; l } [,1] [1,] 1 [2,] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l <- matrix(list(1,2)) ; l[[4]] <- NULL ; l } [,1] [1,] 1 [2,] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list() ; x <- 1:3 ; l[[1]] <- x ; l } [[1]] [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list() ; x <- 1:3 ; l[[1]] <- x; x[2] <- 100L; l[[1]] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(1,2L,TRUE) ; l[[2]]<-100 ; l } [[1]] [1] 1 [[2]] [1] 100 [[3]] [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(1,2L,TRUE) ; l[[3]]<-list(100) ; l } [[1]] [1] 1 [[2]] [1] 2 [[3]] [[3]][[1]] [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(1,2L,TRUE) ; l[[5]]<-100 ; l } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] TRUE [[4]] NULL [[5]] [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a="a",b="b",c=list(d="cd",e="ce",f=c(x="cfx",y="cfy",z="cfz"))) ; l[[c("c","f","zz")]] <- "cfzz" ; l } $a [1] "a" $b [1] "b" $c $c$d [1] "cd" $c$e [1] "ce" $c$f x y z zz "cfx" "cfy" "cfz" "cfzz" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=3) ; l[c("a","a","a","c")] <- NULL ; l } $b [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=3,d=4); l[c(-1,-10)] <- NULL ; l} $a [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=3,d=4); l[c(-1,-3)] <- NULL ; l} $a [1] 1 $c [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=3,d=4); l[c(2,3)] <- NULL ; l} $a [1] 1 $d [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=3,d=4); l[c(2,3,5)] <- NULL ; l} $a [1] 1 $d [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=3,d=4); l[c(2,3,6)] <- NULL ; l} $a [1] 1 $d [1] 4 [[3]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=3,d=4); l[c(TRUE,FALSE)] <- NULL ; l} $b [1] 2 $d [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=3,d=4); l[c(TRUE,FALSE,FALSE,TRUE,FALSE,NA,TRUE,TRUE)] <- NULL ; l} $b [1] 2 $c [1] 3 [[3]] NULL [[4]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=3,d=4); l[c(TRUE,TRUE,FALSE,TRUE)] <- NULL ; l} $c [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=list(d=1,e=2,f=c(x=1,y=2,z=3))) ; l[[c("c","f")]] <- NULL ; l } $a [1] 1 $b [1] 2 $c $c$d [1] 1 $c$e [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=list(d=1,e=2,f=c(x=1,y=2,z=3))) ; l[[c("c","f","z")]] <- 100 ; l } $a [1] 1 $b [1] 2 $c $c$d [1] 1 $c$e [1] 2 $c$f x y z 1 2 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=list(d=1,e=2,f=c(x=1,y=2,z=3))) ; l[[c("c","f","zz")]] <- 100 ; l } $a [1] 1 $b [1] 2 $c $c$d [1] 1 $c$e [1] 2 $c$f x y z zz 1 2 3 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,c=list(d=1,e=2,f=c(x=1,y=2,z=3))) ; l[[c("c","f","zz")]] <- list(100) ; l } $a [1] 1 $b [1] 2 $c $c$d [1] 1 $c$e [1] 2 $c$f $c$f$x [1] 1 $c$f$y [1] 2 $c$f$z [1] 3 $c$f$zz $c$f$zz[[1]] [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1,b=2,list(c=3,d=4,list(e=5:6,f=100))) ; l[[c(3,3,1)]] <- NULL ; l } $a [1] 1 $b [1] 2 [[3]] [[3]]$c [1] 3 [[3]]$d [1] 4 [[3]][[3]] [[3]][[3]]$f [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1L,b=2L,c=list(d=1L,e=2L,f=c(x=1L,y=2L,z=3L))) ; l[[c("c","f")]] <- 100L ; l } $a [1] 1 $b [1] 2 $c $c$d [1] 1 $c$e [1] 2 $c$f [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1L,b=2L,c=list(d=1L,e=2L,f=c(x=1L,y=2L,z=3L))) ; l[[c("c","f")]] <- list(haha="gaga") ; l } $a [1] 1 $b [1] 2 $c $c$d [1] 1 $c$e [1] 2 $c$f $c$f$haha [1] "gaga" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=1L,b=2L,c=list(d=1L,e=2L,f=c(x=1L,y=2L,z=3L))) ; l[[c("c","f","zz")]] <- 100L ; l } $a [1] 1 $b [1] 2 $c $c$d [1] 1 $c$e [1] 2 $c$f x y z zz 1 2 3 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ l<-list(a=TRUE,b=FALSE,c=list(d=TRUE,e=FALSE,f=c(x=TRUE,y=FALSE,z=TRUE))) ; l[[c("c","f","zz")]] <- TRUE ; l } $a [1] TRUE $b [1] FALSE $c $c$d [1] TRUE $c$e [1] FALSE $c$f x y z zz TRUE FALSE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ m<-list(1,2) ; m[TRUE] <- NULL ; m } list() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ m<-list(1,2) ; m[[-1]] <- NULL ; m } [[1]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ m<-list(1,2) ; m[[-2]] <- NULL ; m } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ m<-list(1,2) ; m[[1]] <- NULL ; m } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ m<-list(1,2) ; m[[TRUE]] <- NULL ; m } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-1:3 ; v[2] <- list(100) ; v } [[1]] [1] 1 [[2]] [1] 100 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-1:3 ; v[[2]] <- list(100) ; v } [[1]] [1] 1 [[2]] [[2]][[1]] [1] 100 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-list(1,2,3) ; v[c()] <- NULL ; v } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-list(1,2,3) ; v[c(-1,-2,-6)] <- NULL ; v } [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-list(1,2,3) ; v[c(2,3,4)] <- NULL ; v } [[1]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-list(1,2,3) ; v[c(2,3,NA,7,0)] <- NULL ; v } [[1]] [1] 1 [[2]] NULL [[3]] NULL [[4]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-list(1,2,3) ; v[c(TRUE,FALSE)] <- NULL ; v } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-list(1,2,3) ; v[c(TRUE,FALSE,FALSE,FALSE,FALSE,TRUE)] <- NULL ; v } [[1]] [1] 2 [[2]] [1] 3 [[3]] NULL [[4]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-list(1,2,3) ; v[c(TRUE,FALSE,TRUE)] <- NULL ; v } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-list(1,2,3) ; v[double()] <- NULL ; v } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-list(1,2,3) ; v[integer()] <- NULL ; v } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ v<-list(1,2,3) ; v[logical()] <- NULL ; v } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x <- 1:3 ; l <- list(1) ; l[[TRUE]] <- x ; l[[1]] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate#Output.IgnoreErrorContext# #{ x <- as.list(1:3) ; x[[integer()]] <- 3 } Error in x[[integer()]] <- 3 : attempt to select less than one element in OneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x <- c(1L,2L,3L) ; l <- list(1) ; l[[1]] <- x ; x[2] <- 100L ; l[[1]] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x <- list(1,list(2,3),4) ; x[[c(2,3)]] <- 3 ; x } [[1]] [1] 1 [[2]] [[2]][[1]] [1] 2 [[2]][[2]] [1] 3 [[2]][[3]] [1] 3 [[3]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x <- list(1,list(2,3),4) ; z <- x[[2]] ; x[[c(2,3)]] <- 3 ; z } [[1]] [1] 2 [[2]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x <-2L ; y <- x; x[1] <- 211L ; y } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x<-c(1,2,3) ; y<-x ; x[2]<-100 ; y } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x<-list(1,2,3,4,5); x[3:4]<-c(300L,400L); x } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 300 [[4]] [1] 400 [[5]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x<-list(1,2,3,4,5); x[4:3]<-c(300L,400L); x } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 400 [[4]] [1] 300 [[5]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x<-list(1,2L,TRUE,TRUE,FALSE); x[c(-2,-3,-3,-100,0)]<-256; x } [[1]] [1] 256 [[2]] [1] 2 [[3]] [1] TRUE [[4]] [1] 256 [[5]] [1] 256 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x<-list(1,2L,list(3,list(4)),list(5)) ; x[c(4,2,3)]<-list(256L,257L,258L); x } [[1]] [1] 1 [[2]] [1] 257 [[3]] [1] 258 [[4]] [1] 256 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x<-list(11,10,9) ; x[c(TRUE, FALSE, TRUE)] <- c(1000,2000); x } [[1]] [1] 1000 [[2]] [1] 10 [[3]] [1] 2000 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testListUpdate# #{ x<-list(FALSE,NULL,3L,4L,5.5); x[c(TRUE,FALSE)] <- 1000; x } [[1]] [1] 1000 [[2]] NULL [[3]] [1] 1000 [[4]] [1] 4 [[5]] [1] 1000 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:16, nrow=8) ; m[c(TRUE,FALSE),c(FALSE,TRUE), drop=TRUE]} [1] 9 11 13 15 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:16, nrow=8) ; m[c(TRUE,FALSE,FALSE),c(FALSE,NA), drop=FALSE]} [,1] [1,] NA [2,] NA [3,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:16, nrow=8) ; m[c(TRUE,FALSE,FALSE),c(FALSE,TRUE), drop=TRUE]} [1] 9 12 15 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:4, nrow=2) ; m[[2,1,drop=FALSE]] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; f <- function(i,j) { m[i,j] } ; f(1,1) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; f <- function(i,j) { m[i,j] } ; f(1,1:3) } [1] 1 3 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[,-1] } [,1] [,2] [1,] 3 5 [2,] 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[,1[2],drop=FALSE] } [,1] [1,] NA [2,] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[,1] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[,] } [,1] [,2] [,3] [1,] 1 3 5 [2,] 2 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[,c(-1,0,0,-1)] } [,1] [,2] [1,] 3 5 [2,] 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[,c(1,NA,1,NA)] } [,1] [,2] [,3] [,4] [1,] 1 NA 1 NA [2,] 2 NA 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[,c(NA,1,0)] } [,1] [,2] [1,] NA 1 [2,] NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[1,,drop=FALSE] } [,1] [,2] [,3] [1,] 1 3 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[1,2] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[1,] } [1] 1 3 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[1:2,-1] } [,1] [,2] [1,] 3 5 [2,] 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[1:2,0:1] ; m[1:2,1:1] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[1:2,0:1] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[1:2,2:3] } [,1] [,2] [1,] 3 5 [2,] 4 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; m[[1,2]] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=2) ; x<-2 ; m[[1,x]] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=3) ; f <- function(i,j) { m[i,j] } ; f(1,c(-1,0,-1,-10)) } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=3) ; f <- function(i,j) { m[i,j] } ; f(1,c(1,2)) } [1] 1 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMatrixIndex# #{ m <- matrix(1:6, nrow=3) ; f <- function(i,j) { m[i,j] } ; f(c(TRUE),c(FALSE,TRUE)) } [1] 4 5 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectors# #{ x<-1.1:3.1; x[1L] } [1] 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectors# #{ x<-1.1:3.1; x[2L] } [1] 2.1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectors# #{ x<-1.1:3.1; x[3L] } [1] 3.1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectors# #{ x<-3.1:1; x[1L] } [1] 3.1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectors# #{ x<-3.1:1; x[2L] } [1] 2.1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectors# #{ x<-3.1:1; x[3L] } [1] 1.1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectors# #{ x<-NULL; x[1L] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectors# #{ x<-NULL; x[2L] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectors# #{ x<-NULL; x[3L] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectors# #{ x<-NULL; x[NaN] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b <- as.list(3:5) ; dim(b) <- c(1,3) ; b[NULL] <- NULL ; b } [,1] [,2] [,3] [1,] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b<-3:5; dim(b) <- c(1,3) ; b[0] <- NULL ; b } [,1] [,2] [,3] [1,] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ b<-3:5; dim(b) <- c(1,3) ; b[[0]] <- NULL ; b } Error in b[[0]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ b<-3:5; dim(b) <- c(1,3) ; b[[c(1)]] <- NULL ; b } Error in b[[c(1)]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ b<-3:5; dim(b) <- c(1,3) ; b[[c(1,2)]] <- NULL ; b } Error in `[[<-`(`*tmp*`, c(1, 2), value = NULL) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b<-3:5; dim(b) <- c(1,3) ; b[] <- NULL ; b } Error in b[] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b<-3:5; dim(b) <- c(1,3) ; b[c(1)] <- NULL ; b } Error in b[c(1)] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b<-3:5; dim(b) <- c(1,3) ; b[c(1,2)] <- NULL ; b } Error in b[c(1, 2)] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b<-3:5; dim(b) <- c(1,3) ; b[c(FALSE, FALSE, FALSE)] <- NULL ; b } [,1] [,2] [,3] [1,] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b<-as.list(3:5); dim(b) <- c(1,3) ; b[0] <- NULL ; b } [,1] [,2] [,3] [1,] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ b<-as.list(3:5); dim(b) <- c(1,3) ; b[[0]] <- NULL ; b } Error in b[[0]] <- NULL : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b<-as.list(3:5); dim(b) <- c(1,3) ; b[[c(1)]] <- NULL ; b } [[1]] [1] 4 [[2]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ b<-as.list(3:5); dim(b) <- c(1,3) ; b[[c(1,2)]] <- NULL ; b } Error in b[[c(1, 2)]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b<-as.list(3:5); dim(b) <- c(1,3) ; b[] <- NULL ; b } list() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b<-as.list(3:5); dim(b) <- c(1,3) ; b[c(1)] <- NULL ; b } [[1]] [1] 4 [[2]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ b<-as.list(3:5); dim(b) <- c(1,3) ; b[c(1,2)] <- NULL ; b } [[1]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function() 42; y<-list(); y[[1]]<-f; y[[1]] } function() 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(v, ...) v[...]; x<-matrix(1:4, ncol=2); f(x, 1, 2) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(v, i, ...) v[i, ...]; x<-matrix(1:4, ncol=2); f(x, 1, 2) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(v, val, ...) { v[...]<-val; v; } ; x<-matrix(1:4, ncol=2); f(x, 7, 1, 2) } [,1] [,2] [1,] 1 7 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(v, val, i, ...) { v[i, ...]<-val; v; } ; x<-matrix(1:4, ncol=2); f(x, 7, 1, 2) } [,1] [,2] [1,] 1 7 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(x, i, v) { x[[i]]<-v; x }; y<-list(a=47); f(y, "a", NULL); z<-list(a=47, b=7); f(z, "a", NULL) } $b [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(x,y) sys.call(); x<-f(7, 42); typeof(x[c(1,2)]) } [1] "language" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(x,y) sys.call(); x<-f(7, 42); typeof(x[c(1,2)][[1]]) } [1] "symbol" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(x,y) sys.call(); x<-f(7, 42); typeof(x[c(1,2)][[2]]) } [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(x,y) sys.call(); x<-f(7, 42); x[-1]} 7(42) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(x,y) sys.call(); x<-f(7, 42); x[c(1,2)] } f(7) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ f<-function(x,y) sys.call(); x<-f(7, 42); x[c(2,3)] } 7(42) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- c(1,2) ; attr(l, "foo")<-"foo"; names(l)<-c("a", "b"); l[1] <- 7 ; attributes(l) } $foo [1] "foo" $names [1] "a" "b" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- c(1,2) ; names(l)<-c("a", "b"); attr(l, "foo")<-"foo"; l[1] <- 7 ; attributes(l) } $names [1] "a" "b" $foo [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- list(1,2) ; attr(l, "foo")<-"foo"; names(l)<-c("a", "b"); l[1] <- NULL ; attributes(l) } $names [1] "b" $foo [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- list(1,2) ; names(l)<-c("a", "b"); attr(l, "foo")<-"foo"; l[1] <- NULL ; attributes(l) } $names [1] "b" $foo [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- list(1,2,3) ; l[c(1,3)] <- NULL ; l } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- list(1,2,3) ; l[c(1,3)] <- c(NULL, 42) ; l } [[1]] [1] 42 [[2]] [1] 2 [[3]] [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- list(1,2,3) ; l[c(1,3)] <- c(NULL, NULL) ; l } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- list(a=1,b=2) ; attr(l, "foo")<-"foo"; l[1] <- NULL ; l } $b [1] 2 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- list(a=1,b=2) ; attr(l, "foo")<-"foo"; l[[1]] <- NULL ; l } $b [1] 2 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- matrix(list(a=1,b=2,c=3,d=4)) ; attr(l, "foo")<-"foo"; l[1] <- NULL ; attributes(l) } $foo [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l <- matrix(list(a=1,b=2,c=3,d=4)) ; attr(l, "foo")<-"foo"; l[[1]] <- NULL ; attributes(l) } $foo [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(1); l[1]<-NULL; l } list() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(1,2,3,4); l[1]<-NULL; l } [[1]] [1] 2 [[2]] [1] 3 [[3]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(1,2,3,4); l[4]<-NULL; l } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(1,2,3,4); l[5]<-NULL; l } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 [[4]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(1,2,3,4); l[7]<-NULL; l } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 [[4]] [1] 4 [[5]] NULL [[6]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ l<-list(1,2,3,4); l[[c(-1)]]<-c(1); l } Error in l[[c(-1)]] <- c(1) : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ l<-list(1,2,3,4); l[[c(-1,1)]]<-c(1); l } Error in l[[c(-1, 1)]] <- c(1) : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ l<-list(1,2,3,4); l[[c(0)]]<-c(1); l } Error in l[[c(0)]] <- c(1) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ l<-list(1,2,3,4); l[[c(0,1)]]<-c(1); l } Error in l[[c(0, 1)]] <- c(1) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ l<-list(1,2,3,4); l[[c(1,1,1)]]<-c(1); l } Error in `[[<-`(`*tmp*`, c(1, 1, 1), value = 1) : recursive indexing failed at level 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(1,2,3,4); l[[c(1,NA)]]<-c(1); l } Error in l[[c(1, NA)]] <- c(1) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(1,2,3,4); l[[c(2,1)]]<-7; l } [[1]] [1] 1 [[2]] [1] 7 [[3]] [1] 3 [[4]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ l<-list(1,2,3,4); l[[c(7,1)]]<-c(1); l } Error in `[[<-`(`*tmp*`, c(7, 1), value = 1) : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(1,2,3,4); l[[c(NA)]]<-c(1); l } Error in l[[c(NA)]] <- c(1) : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ l<-list(1,2,3,4); l[[c(NA,1)]]<-c(-1); l } Error in l[[c(NA, 1)]] <- c(-1) : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ l<-list(1,2,3,4); l[[c(NA,1)]]<-c(1); l } Error in l[[c(NA, 1)]] <- c(1) : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(1,2,3,4); l[c(1,3)]<-list(NULL); l } [[1]] NULL [[2]] [1] 2 [[3]] NULL [[4]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(1,2,3,4); l[c(2,1)]<-7; l } [[1]] [1] 7 [[2]] [1] 7 [[3]] [1] 3 [[4]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ l<-list(list(1),2,3,4); l[[c(1,1,NA)]]<-c(1); l } Error in l[[c(1, 1, NA)]] <- c(1) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ m <- 1:4; dim(m) <- c(2,2); i <- 1:2; dim(i) <- c(1,2); m[i] <- 42; m } [,1] [,2] [1,] 1 42 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ m <- 1:4; dim(m) <- c(2,2); i <- 1:2; dim(i) <- c(1,2); m[i] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ m <- 1:4; dim(m) <- c(2,2); i <- as.double(1:2); dim(i) <- c(1,2); m[i] <- 42; m } [,1] [,2] [1,] 1 42 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ m <- 1:4; dim(m) <- c(2,2); i <- as.double(1:2); dim(i) <- c(1,2); m[i] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ m <- matrix(list(1,2,3,4,5,6), nrow=3) ; m[c(2,3,6,7)] <- NULL ; m } [[1]] [1] 1 [[2]] [1] 4 [[3]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ m <- matrix(list(1,2,3,4,5,6), nrow=3) ; m[c(2,3,6,8)] <- NULL ; m } [[1]] [1] 1 [[2]] [1] 4 [[3]] [1] 5 [[4]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ m <- matrix(list(1,2,3,4,5,6), nrow=3) ; m[c(2,3,6,8,9)] <- NULL ; m } [[1]] [1] 1 [[2]] [1] 4 [[3]] [1] 5 [[4]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ m <- matrix(list(1,2,3,4,5,6), nrow=3) ; m[c(2,3,7)] <- NULL ; m } [[1]] [1] 1 [[2]] [1] 4 [[3]] [1] 5 [[4]] [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ m <- matrix(list(1,2,3,4,5,6), nrow=3) ; m[c(2,3,8)] <- NULL ; m } [[1]] [1] 1 [[2]] [1] 4 [[3]] [1] 5 [[4]] [1] 6 [[5]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ n<-1; n[7]<-42; n } [1] 1 NA NA NA NA NA 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ n<-1; n[[7]]<-42; n } [1] 1 NA NA NA NA NA 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ n<-1; n[[c(7,8)]]<-c(42,43); n } Error in `[[<-`(`*tmp*`, c(7, 8), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ n<-1; n[c(7,8)]<-c(42,43); n } [1] 1 NA NA NA NA NA 42 43 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ sigList<-list(object=c("foo", "")); fcall<-do.call("call", c("fun", sigList)); x<-fcall[-1]; x[[1]] } [1] "foo" "" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ v <- c(1,2,3,4,5,6,7,8,9); f <- function(k) v[k]; f(2:5); f(-1:-2) } [1] 3 4 5 6 7 8 9 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ v<-c(a="foo", aa="me"); v["a"] } a "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x <- NULL; x[["names", exact=TRUE]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x <- NULL; x[c("a", as.character(NA))] <- 7; x } a 7 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x <- NULL; x[c("a", as.character(NA), as.character(NA))] <- 7; x } a 7 7 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x <- c("a", "b"); y<-NULL; y[integer()]<-x[integer()]; y } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x <- c("a", "b"); y<-c("c","d"); y[integer()]<-x[integer()]; y} [1] "c" "d" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x <- c(1) ; x[[NA]] <- NULL ; x } Error in x[[NA]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x <- c(1); x[[-4]] <- NULL } Error in x[[-4]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x <- c(1,2) ; x[[NA]] <- NULL ; x } Error in x[[NA]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x <- c(1,2,3) ; x[[NA]] <- NULL ; x } Error in x[[NA]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x <- c(1,2,3); x[[-1]] <- NULL } Error in x[[-1]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x <- integer() ; x[[NA]] <- NULL ; x } Error in x[[NA]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x <- list() ; x[[NA]] <- NULL ; x } Error in x[[NA]] <- NULL : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x <- list(1) ; x[[NA]] <- NULL ; x } Error in x[[NA]] <- NULL : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x <- list(1,2) ; x[[NA]] <- NULL ; x } Error in x[[NA]] <- NULL : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x <- list(1,2,3) ; x[[NA]] <- NULL ; x } Error in x[[NA]] <- NULL : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; dim(x)<-c(1,2); u<-2+2i; x[[u, u]] } Error in x[[u, u]] : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; dim(x)<-c(1,2); x[2+2i, 2+2i] } Error in x[2 + (0+2i), 2 + (0+2i)] : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; dim(x)=c(1,1,2); x[[, , 1]] } Error in x[[, , 1]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; dim(x)=c(1,1,2); x[[1, , 1]] } Error in x[[1, , 1]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; dim(x)=c(1,1,2); x[[1, , ]] } Error in x[[1, , ]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; dim(x)=c(1,2); x[,1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; dim(x)=c(1,2); x[,] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; dim(x)=c(1,2); x[[, 1]] } Error in x[[, 1]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; dim(x)=c(1,2); x[[, ]] } Error in x[[, ]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; dim(x)=c(1,2); x[[1, ]] } Error in x[[1, ]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-1:2; x[[c(TRUE, TRUE)]] } Error in x[[c(TRUE, TRUE)]] : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:2; x[c(TRUE, TRUE)] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[c(0, 1)]<-42; x } [1] 42 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[c(0, 1)]<-c(7, 42); x } [1] 7 2 3 4 Warning message: In x[c(0, 1)] <- c(7, 42) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[c(1, 0)]<-42; x } [1] 42 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[c(1, 0)]<-c(7, 42); x } [1] 7 2 3 4 Warning message: In x[c(1, 0)] <- c(7, 42) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[c(1, NA)]<-42; x } [1] 42 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[c(1, NaN)]<-42; x } [1] 42 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[c(NA, 1)]<-42; x } [1] 42 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[c(NaN, 1)]<-42; x } [1] 42 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[NA, NA]<-7; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[-1,0]<-integer(); x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[-1] } [1] 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[-1]<-42; x } [,1] [,2] [1,] 1 42 [2,] 42 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[-5,0]<-integer(); x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[-5]<-42; x } [,1] [,2] [1,] 42 42 [2,] 42 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[0,-1]<-integer(); x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[0,-5]<-integer(); x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[0,0]<-integer(); x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[0]<-42; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[NA]<-42; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[NULL]<-42; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[-1, 0]] <- integer(); x } Error in x[[-1, 0]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[-5, 0]] <- integer(); x } Error in x[[-5, 0]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[0, -1]] <- integer(); x } Error in x[[0, -1]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[0, -5]] <- integer(); x } Error in x[[0, -5]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[0, 0]] <- integer(); x } Error in x[[0, 0]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[[c(-1, -2)]]<-42; x } Error in x[[c(-1, -2)]] <- 42 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(0,0)]]<-c(42, 43); x } Error in x[[c(0, 0)]] <- c(42, 43) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(0,0,0)]]<-c(42, 43); x } Error in `[[<-`(`*tmp*`, c(0, 0, 0), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(0,0,1)]]<-c(42, 43); x } Error in `[[<-`(`*tmp*`, c(0, 0, 1), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[[c(0,0,42+71)]]<-c(42,43); x } Error in `[[<-`(`*tmp*`, c(0, 0, 42 + 71), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(0,1)]]<-c(42, 43); x } Error in x[[c(0, 1)]] <- c(42, 43) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(0,1,1)]]<-c(42, 43); x } Error in `[[<-`(`*tmp*`, c(0, 1, 1), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(0,42+7i)]]<-c(42,43); x } Error in x[[c(0, 42 + (0+7i))]] <- c(42, 43) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[[c(1+1i)]]<-c(42); x } Error in x[[c(1 + (0+1i))]] <- c(42) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(1+1i)]]<-c(42,43); x } Error in x[[c(1 + (0+1i))]] <- c(42, 43) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(1+1i)]]<-integer(); x } Error in x[[c(1 + (0+1i))]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(1+1i,42+7i,3+3i)]]<-c(42,43); x } Error in `[[<-`(`*tmp*`, c(1 + (0+1i), 42 + (0+7i), 3 + (0+3i)), value = c(42, : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[[c(1,0)]]<-c(42, 43); x } Error in `[[<-`(`*tmp*`, c(1, 0), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[[c(1,0,0)]]<-c(42, 43); x } Error in `[[<-`(`*tmp*`, c(1, 0, 0), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[[c(1,1,0)]]<-c(42, 43); x } Error in `[[<-`(`*tmp*`, c(1, 1, 0), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[[c(1,4)]]<-c(42, 43); x } Error in `[[<-`(`*tmp*`, c(1, 4), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[[c(FALSE,TRUE)]]<-c(42,43); x } Error in x[[c(FALSE, TRUE)]] <- c(42, 43) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-1:4; dim(x)<-c(2,2); x[[c(FALSE,TRUE,TRUE)]]<-c(42,43); x } Error in `[[<-`(`*tmp*`, c(FALSE, TRUE, TRUE), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(as.raw(42))]]<-c(42,43); x } Error in x[[c(as.raw(42))]] <- c(42, 43) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[[c(as.raw(42))]]<-c(43); x } Error in x[[c(as.raw(42))]] <- c(43) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(as.raw(42))]]<-integer(); x } Error in x[[c(as.raw(42))]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(as.raw(42), as.raw(7))]]<-c(42,43); x } Error in x[[c(as.raw(42), as.raw(7))]] <- c(42, 43) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(as.raw(42), as.raw(7), as.raw(1))]]<-c(42,43); x } Error in `[[<-`(`*tmp*`, c(as.raw(42), as.raw(7), as.raw(1)), value = c(42, : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[c(as.raw(integer()))]]<-c(42,43); x } Error in x[[c(as.raw(integer()))]] <- c(42, 43) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[complex()]]<-c(42,43); x } Error in x[[complex()]] <- c(42, 43) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list()]]<-c(42); x } Error in x[[list()]] <- c(42) : attempt to select less than one element in OneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list()]]<-c(42,43); x } Error in x[[list()]] <- c(42, 43) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list()]]<-integer(); x } Error in x[[list()]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1)]]<-c(42); x } Error in x[[list(1)]] <- c(42) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1)]]<-c(42,43); x } Error in x[[list(1)]] <- c(42, 43) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1)]]<-integer(); x } Error in x[[list(1)]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1,2)]]<-c(42,43); x } Error in x[[list(1, 2)]] <- c(42, 43) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[[list(1,2,3)]]<-c(42,43); x } Error in `[[<-`(`*tmp*`, list(1, 2, 3), value = c(42, 43)) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(-1, -2)]<-42; x } [,1] [,2] [1,] 1 42 [2,] 2 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(0,0)]<-c(42, 43); x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(0,0,0)]<-c(42, 43); x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(0,0,1)]<-c(42, 43); x } [,1] [,2] [1,] 42 3 [2,] 2 4 Warning message: In x[c(0, 0, 1)] <- c(42, 43) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(0,1)]<-c(42, 43); x } [,1] [,2] [1,] 42 3 [2,] 2 4 Warning message: In x[c(0, 1)] <- c(42, 43) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(0,1,1)]<-c(42, 43); x } [,1] [,2] [1,] 43 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(0,42+7i)]<-c(42,43); x } Error in x[c(0, 42 + (0+7i))] <- c(42, 43) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1+1i)]<-c(42); x } Error in x[c(1 + (0+1i))] <- c(42) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1+1i)]<-c(42,43); x } Error in x[c(1 + (0+1i))] <- c(42, 43) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[c(1+1i)]<-integer(); x } Error in x[c(1 + (0+1i))] <- integer() : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1+1i,42+7i,3+3i)]<-c(42,43); x } Error in x[c(1 + (0+1i), 42 + (0+7i), 3 + (0+3i))] <- c(42, 43) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1, NA), 2]<-7; x } [,1] [,2] [1,] 1 7 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1, NA)]<-7; x } [,1] [,2] [1,] 7 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1,0)]<-c(42, 43); x } [,1] [,2] [1,] 42 3 [2,] 2 4 Warning message: In x[c(1, 0)] <- c(42, 43) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1,0,0)]<-c(42, 43); x } [,1] [,2] [1,] 42 3 [2,] 2 4 Warning message: In x[c(1, 0, 0)] <- c(42, 43) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1,1,0)]<-c(42, 43); x } [,1] [,2] [1,] 43 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1,4)]<-c(42, 43); x } [,1] [,2] [1,] 42 3 [2,] 2 43 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1,NA)]<-c(42, 43); x } Error in x[c(1, NA)] <- c(42, 43) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(1,NaN)]<-c(42, 43); x } Error in x[c(1, NaN)] <- c(42, 43) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(NA, 1),1]<-7; x } [,1] [,2] [1,] 7 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(NA, 1),1]<-c(7, 42); x } Error in x[c(NA, 1), 1] <- c(7, 42) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(NA, NA),1]<-7; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(NA,1)]<-c(42, 43); x } Error in x[c(NA, 1)] <- c(42, 43) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(NaN,1)]<-c(42, 43); x } Error in x[c(NaN, 1)] <- c(42, 43) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(as.raw(42))]<-c(42,43); x } Error in x[c(as.raw(42))] <- c(42, 43) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(as.raw(42))]<-c(43); x } Error in x[c(as.raw(42))] <- c(43) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(as.raw(42))]<-integer(); x } Error in x[c(as.raw(42))] <- integer() : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(as.raw(42), as.raw(7))]<-c(42,43); x } Error in x[c(as.raw(42), as.raw(7))] <- c(42, 43) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(as.raw(42), as.raw(7), as.raw(1))]<-c(42,43); x } Error in x[c(as.raw(42), as.raw(7), as.raw(1))] <- c(42, 43) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[c(as.raw(integer()))]<-c(42,43); x } Error in x[c(as.raw(integer()))] <- c(42, 43) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[complex()]<-c(42,43); x } Error in x[complex()] <- c(42, 43) : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[list()]<-c(42); x } Error in x[list()] <- c(42) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[list()]<-c(42,43); x } Error in x[list()] <- c(42, 43) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; dim(x)<-c(2,2); x[list()]<-integer(); x } Error in x[list()] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[list(1)]<-c(42); x } Error in x[list(1)] <- c(42) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[list(1)]<-c(42,43); x } Error in x[list(1)] <- c(42, 43) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[list(1)]<-integer(); x } Error in x[list(1)] <- integer() : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[list(1,2)]<-c(42,43); x } Error in x[list(1, 2)] <- c(42, 43) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; dim(x)<-c(2,2); x[list(1,2,3)]<-c(42,43); x } Error in x[list(1, 2, 3)] <- c(42, 43) : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[0]<-NULL; x } [1] 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[1]<-NULL; x } Error in x[1] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[1]<-c(1,1); x } [1] 1 2 3 4 Warning message: In x[1] <- c(1, 1) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; x[[0]]<-NULL; x } Error in x[[0]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:4; x[[1]]<-NULL; x } Error in x[[1]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[[1]]<-c(1,1); x } Error in x[[1]] <- c(1, 1) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[c(1, NA)]<-7; x } [1] 7 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1:4; x[c(1, NA)]<-c(7, 42); x } Error in x[c(1, NA)] <- c(7, 42) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1:8; dim(x)<-c(2,2,2); x[[-3, 1, 1]] } Error in x[[-3, 1, 1]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1; x[0]<-integer(); x } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1; x[1,1,1]<-42; x } Error in x[1, 1, 1] <- 42 : incorrect number of subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1; x[1,1]<-42; x } Error in x[1, 1] <- 42 : incorrect number of subscripts on matrix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1; x[1]<-integer(); x } Error in x[1] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-1; x[[0]]<-integer(); x } Error in x[[0]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1; x[[1,1,1]]<-42; x } Error in x[[1, 1, 1]] <- 42 : [[ ]] improper number of subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1; x[[1,1]]<-42; x } Error in x[[1, 1]] <- 42 : [[ ]] improper number of subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1; x[[]] } Error in x[[]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1; x[[]]<-42; x } Error in x[[]] <- 42 : [[ ]] with missing subscript ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-1; x[[c(1, 1)]] } Error in x[[c(1, 1)]] : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1; x[] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-1; x[]<-42; x } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-2; x[NULL] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-2; x[[NULL]] } Error in x[[NULL]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-7; x[0]<-42; x } [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-7; x[NA]<-42; x } [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-7; x[NA]<-c(42, 7); x } Error in x[NA] <- c(42, 7) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-7; x[NULL]<-42; x } [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-7; x[[0]]<-42; x } Error in x[[0]] <- 42 : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-7; x[[NA]]<-42; x } Error in x[[NA]] <- 42 : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-7; x[[NA]]<-c(42, 7); x } Error in x[[NA]] <- c(42, 7) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-7; x[[NULL]]<-42; x } Error in x[[NULL]] <- 42 : attempt to select less than one element in OneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-NULL; x[1,1,1]<-42; x } Error in x[1, 1, 1] <- 42 : incorrect number of subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-NULL; x[1,1]<-42; x } Error in x[1, 1] <- 42 : incorrect number of subscripts on matrix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-NULL; x[1,1]<-NULL } ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-NULL; x[1]<-42+7i; x } [1] 42+7i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-NULL; x[1]<-42; x } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-NULL; x[7]<-42; x } [1] NA NA NA NA NA NA 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-NULL; x[[1,1,1]]<-42; x } Error in x[[1, 1, 1]] <- 42 : [[ ]] improper number of subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-NULL; x[[1,1]]<-42; x } Error in x[[1, 1]] <- 42 : [[ ]] improper number of subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-NULL; x[c("a", "b")]<-42L; x } a b 42 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-as.integer(1:4); dim(x)<-c(2,2); x[[as.integer(NA)]] } Error in x[[as.integer(NA)]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-as.integer(1:4); x[[as.integer(NA)]] } Error in x[[as.integer(NA)]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-as.symbol("foo"); y<-list(); y[[1]]<-x; y[[1]] } foo ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c("a", "b"); dim(x)<-c(2,1); dimnames(x)<-list(c("Z", "X"), NULL); x[, "Z"] } Error in x[, "Z"] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-c(1); x[[-4]]<-7 } Error in x[[-4]] <- 7 : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1); x[[NA]] } Error in x[[NA]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1, 2); dim(x)<-c(1,2); dimnames(x)<-list("a", c("b", "c")); x[,1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1, 2); dim(x)<-c(1,2); dimnames(x)<-list(NULL, c("b", "c")); x[,1] } b 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1, 2); dim(x)<-c(2,1); dimnames(x)<-list(c("b", "c"), "d"); x[1,] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1, 2); dim(x)<-c(2,1); dimnames(x)<-list(c("b", "c"), NULL); x[1,] } b 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1, 2); dim(x)<-c(2,1,1); dimnames(x)<-list(c("b", "c"), "a", NULL); x[1,,] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1, 2); dim(x)<-c(2,1,1); dimnames(x)<-list(c("b", "c"), NULL, "a"); x[1,,] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1, 2); dim(x)<-c(2,1,1); dimnames(x)<-list(c("b", "c"), NULL, NULL); x[1,,] } b 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); dim(x)<-2; attr(x, "foo")<-"foo"; x["a"]<-42; attributes(x) } $foo [1] "foo" $names [1] "" "" "a" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); dim(x)<-2; attr(x, "foo")<-"foo"; x[1]<-42; attributes(x) } $dim [1] 2 $foo [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); dim(x)<-c(1,2); dimnames(x)<-list("a", c("b", "c")); x["z", "x"] } Error in x["z", "x"] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); dim(x)<-c(1,2); dimnames(x)<-list("a", c("b", "c")); x[["z", "x"]] } Error in x[["z", "x"]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); dim(x)<-c(1,2); x["a", "b"] } Error in x["a", "b"] : no 'dimnames' attribute for array ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); dim(x)<-c(1,2); x[["a", "b"]] } Error in x[["a", "b"]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); dim(x)<-c(1,2); x[[c("a")]] } Error in x[[c("a")]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); dim(x)<-c(1,2); x[c("a")] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); x[[c("a")]] } Error in x[[c("a")]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-c(1,2); x[[c("a", "b")]] } Error in x[[c("a", "b")]] : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); x[c("a")] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); x[c("a", "b")] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); y<-list(a=x); names(y$a)<-"c"; names(y$a) } [1] "c" NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); y<-list(a=x); names(y[1])<-"c"; names(y[1]) } [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); y<-list(a=x); names(y[1])<-"c"; names(y[[1]]) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); y<-list(a=x); names(y[[1]])<-"c"; names(y[1]) } [1] "a" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2); y<-list(a=x); names(y[[1]])<-"c"; names(y[[1]]) } [1] "c" NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-c(1,2,3); x[[-1]]<-7 } Error in x[[-1]] <- 7 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-c(1,2,3); x[[-4]]<-7 } Error in x[[-4]] <- 7 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-c(1,2,3); x[[-4]]<-NULL } Error in x[[-4]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[1,1]<-NULL; x } Error in x[1, 1] <- NULL : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[1]<-NULL; x } Error in x[1] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[1,1]]<-NULL; x } Error in x[[1, 1]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[1]]<-NULL; x } Error in x[[1]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[as.raw(1), 1]]<-NULL } Error in x[[as.raw(1), 1]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(5,10); names(x)<-c(101, 102); names(x)[1]<-42; x } 42 102 5 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(TRUE,TRUE,FALSE); x[1L] } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(TRUE,TRUE,FALSE); x[2L] } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(TRUE,TRUE,FALSE); x[3L] } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(a=1); x["b"]<-2; x } a b 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(a=1); x[c("a","b")]<-c(7,42); x } a b 7 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(a=1); x[c("a","b","b")]<-c(7,42,100); x } a b 7 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(a=1, b=2); x[1] } a 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(a=1, b=2); x[[1]] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-c(a=1, b=2); x[[c("z", "x")]] } Error in x[[c("z", "x")]] : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-c(a=1, b=2); x[c("z", "x")] } NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-c(aa=1, b=2); dim(x)<-c(1,2); x["a", exact=FALSE]<-7; x } Error in `[<-`(`*tmp*`, "a", exact = FALSE, value = 7) : no 'dimnames' attribute for array ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-emptyenv(); y<-list(); y[[1]]<-x; y[[1]] } ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-getClass("ClassUnionRepresentation"); y<-list(); y[[1]]<-x; y[[1]]@virtual } [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x["y"] } [[1]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x[["y"]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1); x[[-1]] } Error in x[[-1]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1); x[[-4]]<-7 } Error in x[[-4]] <- 7 : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1); x[[-4]]<-NULL } Error in x[[-4]] <- NULL : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-list(1); x[[0]] } Error in x[[0]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x[[NA]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-list(1); x[[NULL]] } Error in x[[NULL]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x[[as.integer(NA)]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-list(1); x[[c(0)]] } Error in x[[c(0)]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-list(1); x[[c(1, 0)]] } Error in x[[c(1, 0)]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x[[c(1, 1)]] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x[[c(1, 1, 1)]] } Error in x[[c(1, 1, 1)]] : recursive indexing failed at level 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x[[c(1, 2)]] } Error in x[[c(1, 2)]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x[[c(1, 2, 0)]] } Error in x[[c(1, 2, 0)]] : recursive indexing failed at level 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x[[c(1, NA)]] } Error in x[[c(1, NA)]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x[[c(NA)]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-list(1); x[[c(NULL)]] } Error in x[[c(NULL)]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-list(1); x[[c(TRUE, FALSE)]] } Error in x[[c(TRUE, FALSE)]] : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1); x[[c(TRUE, TRUE)]] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1, 2, list(42)); x[[c(-1, 1)]]<-7; x } Error in x[[c(-1, 1)]] <- 7 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1, list(42)); dim(x)<-c(1,2); x[[c(2, 5)]]<-7; x } [,1] [,2] [1,] 1 List,5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1, list(42)); dim(x)<-c(1,2); x[c(2, 5)]<-7; x } [[1]] [1] 1 [[2]] [1] 7 [[3]] NULL [[4]] NULL [[5]] [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1, list(42)); x[[c(-1, 1)]]<-7; x } [[1]] [1] 1 [[2]] [[2]][[1]] [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1, list(42)); x[[c(-1, 1)]]<-NULL; x } [[1]] [1] 1 [[2]] list() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1, list(42)); x[[c(-3, 1)]]<-7; x } Error in x[[c(-3, 1)]] <- 7 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1, list(42)); x[[c(2, 1)]]<-NULL; x } [[1]] [1] 1 [[2]] list() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1, list(42)); x[[c(2, 5)]]<-7; x } [[1]] [1] 1 [[2]] [[2]][[1]] [1] 42 [[2]][[2]] NULL [[2]][[3]] NULL [[2]][[4]] NULL [[2]][[5]] [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1, list(42)); x[[c(2, 5)]]<-NULL; x } [[1]] [1] 1 [[2]] [[2]][[1]] [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1, list(42)); x[c(2, 5)]<-7; x } [[1]] [1] 1 [[2]] [1] 7 [[3]] NULL [[4]] NULL [[5]] [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1, list(42, 1)); x[[c(-1, -2)]]<-7; x } [[1]] [1] 1 [[2]] [[2]][[1]] [1] 7 [[2]][[2]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1, list(42, 1)); x[[c(-1, -3)]]<-7; x } Error in x[[c(-1, -3)]] <- 7 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1, list(42, 1, 2)); x[[c(-1, -2)]]<-7; x } Error in x[[c(-1, -2)]] <- 7 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1,2,3); x[[-1]] } Error in x[[-1]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1,2,3); x[[-1]]<-7 } Error in x[[-1]] <- 7 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1,2,3); x[[-1]]<-NULL } Error in x[[-1]] <- NULL : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1,2,3); x[[-4]]<-7 } Error in x[[-4]] <- 7 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1,2,3); x[[-4]]<-NULL } Error in x[[-4]] <- NULL : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(1,2,3); x[[-5]] } Error in x[[-5]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[1,1]<-NULL; x } Error in x[1, 1] <- NULL : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[1]<-NULL; x } [[1]] [1] 2 [[2]] [1] 3 [[3]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[1,1]]<-NULL; x } Error in x[[1, 1]] <- NULL : incompatible types (from NULL to list) in [[ assignment ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[1]]<-NULL; x } [[1]] [1] 2 [[2]] [1] 3 [[3]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(42,2,3); x[[c(-1, 1)]] } Error in x[[c(-1, 1)]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-list(42,2,3); x[[c(0, 1)]] } Error in x[[c(0, 1)]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorMessage# #{ x<-list(42,2,3); x[[c(1, -1)]] } Error in x[[c(1, -1)]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(42,2,3); x[[c(1, 2)]] } Error in x[[c(1, 2)]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(42,2,3); x[[c(1, NULL, 2)]] } Error in x[[c(1, NULL, 2)]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(42,2,3); x[[c(2, 1, 3)]] } Error in x[[c(2, 1, 3)]] : recursive indexing failed at level 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(42,2,3); x[[c(NA, 1)]] } Error in x[[c(NA, 1)]] : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(42,2,3); x[[c(NULL, 2, 1, 3)]] } Error in x[[c(NULL, 2, 1, 3)]] : recursive indexing failed at level 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(42,2,3); x[[c(NULL, 2, NULL, 1, 3)]] } Error in x[[c(NULL, 2, NULL, 1, 3)]] : recursive indexing failed at level 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(42,2,3); x[[c(NULL, 2,1)]] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(42,2,3); x[[c(NULL, NULL,1)]] } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(42,2,3); x[[c(NULL,1)]] } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(a=42); x["a"] } $a [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(a=42); x["b"] } $ NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(a=42); x[["a"]] } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(a=42); x[["b"]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(a=42); x[[c("a", "y")]] } Error in x[[c("a", "y")]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(a=list(42)); x[[c("a", "y")]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(a=list(b=42)); x[[c("a", "b")]] } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(aa=1, ba=2); x[["a", exact=FALSE]] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(aa=1, ba=2); x[["a", exact=TRUE]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(aa=1, ba=2); x[[exact=FALSE, "a"]] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(aa=1, ba=2); x[[exact=TRUE], "a"] } Error: unexpected ',' in "{ x<-list(aa=1, ba=2); x[[exact=TRUE]," ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(ab=1, ac=2); x[["a", exact=FALSE]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(data=list(matrix(1:4, ncol=2))); x$data[[1]][2,2]<-42; x } $data $data[[1]] [,1] [,2] [1,] 1 3 [2,] 2 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(list(1,42)); x[[c(1, 2)]] } [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(list(1,list(42))); x[[c(1, 2)]] } [[1]] [1] 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(list(1,list(42))); x[[c(1, 2)]]<-7; x } [[1]] [[1]][[1]] [1] 1 [[1]][[2]] [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(list(1,list(42,list(143)))); x[[c(1, 2, 2)]] } [[1]] [1] 143 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(list(1,list(42,list(143)))); x[[c(1, 2, 2)]]<-7; x } [[1]] [[1]][[1]] [1] 1 [[1]][[2]] [[1]][[2]][[1]] [1] 42 [[1]][[2]][[2]] [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(list(1,list(42,list(143)))); x[[c(1, 2, 7)]]<-7; x } [[1]] [[1]][[1]] [1] 1 [[1]][[2]] [[1]][[2]][[1]] [1] 42 [[1]][[2]][[2]] [[1]][[2]][[2]][[1]] [1] 143 [[1]][[2]][[3]] NULL [[1]][[2]][[4]] NULL [[1]][[2]][[5]] NULL [[1]][[2]][[6]] NULL [[1]][[2]][[7]] [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-list(list(1,list(42,list(143)))); x[[c(1, 2, 7, 7)]]<-7; x } Error in `[[<-`(`*tmp*`, c(1, 2, 7, 7), value = 7) : no such index at level 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(list(1,list(42,list(list(143))))); x[[c(1, 2, 2, 1)]]<-7; x } [[1]] [[1]][[1]] [1] 1 [[1]][[2]] [[1]][[2]][[1]] [1] 42 [[1]][[2]][[2]] [[1]][[2]][[2]][[1]] [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-list(list(1,list(42,list(list(143))))); x[[c(1, 2, 2, NA)]]<-7; x } Error in x[[c(1, 2, 2, NA)]] <- 7 : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther#Output.IgnoreErrorContext# #{ x<-list(list(1,list(42,list(list(143))))); x[[c(1, NA, 2, 1)]]<-7; x } Error in `[[<-`(`*tmp*`, c(1, NA, 2, 1), value = 7) : no such index at level 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-matrix(1:4, ncol=2); x[1,alist(a=)[[1]]] } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-matrix(1:4, ncol=2); x[] } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-matrix(1:4, ncol=2); x[alist(a=)[[1]]] } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-matrix(1:4, ncol=2, dimnames=list(c("a", "b"), c("c", "d"))); dimnames(x)[[1]][1]<-"z"; x } c d z 1 3 b 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-matrix(1:4, ncol=2, dimnames=list(c(m="a", "b"), c("c", "d"))); dimnames(x)[[1]]$m<-"z"; x } c d z 1 3 b 2 4 Warning message: In dimnames(x)[[1]]$m <- "z" : Coercing LHS to a list ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ x<-matrix(1:4, ncol=2, dimnames=list(m=c("a", "b"), n=c("c", "d"))); dimnames(x)$m[1]<-"z"; x } n m c d z 1 3 b 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ y<-list(42,7); dim(y)<-c(1:2); attr(y, "foo")<-"foo"; x<-list(1, y); dim(x)<-c(1,2); x[[c(2, 1)]]<-7; x[2] } [[1]] [,1] [,2] [1,] 7 7 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ z<-1; s<-substitute(z); x<-matrix(1:4, ncol=2); x[s] } Error in x[s] : invalid subscript type 'symbol' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMoreVectorsOther# #{ z<-1; s<-substitute(z); x<-matrix(1:4, ncol=2); x[s]<-1; } Error in x[s] <- 1 : invalid subscript type 'symbol' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMultiDimScalarIndex# #{ x<-1:8; dim(x)<-c(2,2,2); dim(x[,0,]) } [1] 2 0 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMultiDimScalarIndex# #{ x<-1:8; dim(x)<-c(2,2,2); dim(x[0,-1,0]) } [1] 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMultiDimScalarIndex# #{ x<-1:8; dim(x)<-c(2,2,2); dim(x[0,2,0]) } [1] 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMultiDimScalarIndex# #{ x<-1:8; dim(x)<-c(2,2,2); dim(x[0,3,0]) } Error in x[0, 3, 0] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMultiDimScalarIndex# #{ x<-1:8; dim(x)<-c(2,2,2); dim(x[1,0,]) } [1] 0 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMultiDimScalarIndex# #{ x<-1:8; dim(x)<-c(2,2,2); x[-1,-1, 0] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testMultiDimScalarIndex# #{ x<-1:8; dim(x)<-c(2,2,2); x[-1,0,] } [,1] [,2] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[1, NA] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[1, NA]<-7; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[1, NA]<-c(7, 42); x } Error in x[1, NA] <- c(7, 42) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[NA, 1] } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[NA, 1]<-7; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[NA, 1]<-c(7, 42); x } Error in x[NA, 1] <- c(7, 42) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[NA, NA] } [,1] [,2] [1,] NA NA [2,] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[NA, NA]<-7; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[NA, NA]<-c(7, 42); x } Error in x[NA, NA] <- c(7, 42) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[NA] } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[NA]<-7; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[NA]<-c(7, 42, 1); x } Error in x[NA] <- c(7, 42, 1) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[NA]<-c(7,42); x } Error in x[NA] <- c(7, 42) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[1, NA]] } Error in x[[1, NA]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[1, NA]]<-7; x } Error in x[[1, NA]] <- 7 : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[1, NA]]<-c(7, 42); x } Error in x[[1, NA]] <- c(7, 42) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[1, NA]]<-c(7, 42, 1); x } Error in x[[1, NA]] <- c(7, 42, 1) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA, 1]] } Error in x[[NA, 1]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA, 1]]<-7; x } Error in x[[NA, 1]] <- 7 : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA, 1]]<-c(7, 42); x } Error in x[[NA, 1]] <- c(7, 42) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA, 1]]<-c(7, 42, 1); x } Error in x[[NA, 1]] <- c(7, 42, 1) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA, NA]] } Error in x[[NA, NA]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA, NA]]<-7; x } Error in x[[NA, NA]] <- 7 : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA, NA]]<-c(7, 42); x } Error in x[[NA, NA]] <- c(7, 42) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA, NA]]<-c(7, 42, 1); x } Error in x[[NA, NA]] <- c(7, 42, 1) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA]] } Error in x[[NA]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA]]<-7; x } Error in x[[NA]] <- 7 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA]]<-c(7, 42); x } Error in x[[NA]] <- c(7, 42) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[NA]]<-c(7, 42, 1); x } Error in x[[NA]] <- c(7, 42, 1) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[1, NA] } [[1]] NULL [[2]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[1, NA]<-7; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[1, NA]<-c(7, 42); x } Error in x[1, NA] <- c(7, 42) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[1, NA]<-c(7, 42, 1); x } Error in x[1, NA] <- c(7, 42, 1) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA, 1] } [[1]] NULL [[2]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA, 1]<-7; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA, 1]<-c(7, 42); x } Error in x[NA, 1] <- c(7, 42) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA, 1]<-c(7, 42, 1); x } Error in x[NA, 1] <- c(7, 42, 1) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA, NA] } [,1] [,2] [1,] NULL NULL [2,] NULL NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA, NA]<-7; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA, NA]<-c(7, 42); x } Error in x[NA, NA] <- c(7, 42) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA, NA]<-c(7, 42, 1); x } Error in x[NA, NA] <- c(7, 42, 1) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA] } [[1]] NULL [[2]] NULL [[3]] NULL [[4]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA]<-7; x } [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA]<-c(7, 42, 1); x } Error in x[NA] <- c(7, 42, 1) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[NA]<-c(7,42); x } Error in x[NA] <- c(7, 42) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[1, NA]] } Error in x[[1, NA]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[1, NA]]<-7; x } Error in x[[1, NA]] <- 7 : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[1, NA]]<-c(7, 42); x } Error in x[[1, NA]] <- c(7, 42) : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[1, NA]]<-c(7, 42, 1); x } Error in x[[1, NA]] <- c(7, 42, 1) : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA, 1]] } Error in x[[NA, 1]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA, 1]]<-7; x } Error in x[[NA, 1]] <- 7 : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA, 1]]<-c(7, 42); x } Error in x[[NA, 1]] <- c(7, 42) : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA, 1]]<-c(7, 42, 1); x } Error in x[[NA, 1]] <- c(7, 42, 1) : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA, NA]] } Error in x[[NA, NA]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA, NA]]<-7; x } Error in x[[NA, NA]] <- 7 : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA, NA]]<-c(7, 42); x } Error in x[[NA, NA]] <- c(7, 42) : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA, NA]]<-c(7, 42, 1); x } Error in x[[NA, NA]] <- c(7, 42, 1) : [[ ]] subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA]]<-7; x } Error in x[[NA]] <- 7 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA]]<-c(7, 42); x } Error in x[[NA]] <- c(7, 42) : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNAIndex# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[NA]]<-c(7, 42, 1); x } Error in x[[NA]] <- c(7, 42, 1) : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[0] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[0] <- c(1,5); x; } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[0] <- c(5); x; } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[1] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[1] <- c(1,5); x; } [1] 1 Warning message: In x[1] <- c(1, 5) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[1] <- c(5); x; } [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[[0]] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate#Output.IgnoreErrorContext# #{ x <- NULL; x[[0]] <- c(1,5); x; } Error in x[[0]] <- c(1, 5) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate#Output.IgnoreErrorContext# #{ x <- NULL; x[[0]] <- c(5); x; } Error in x[[0]] <- c(5) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[[1]] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[[1]] <- c(1,5); x; } [[1]] [1] 1 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[[1]] <- c(5); x; } [[1]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[[c(0,1)]] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate#Output.IgnoreErrorContext# #{ x <- NULL; x[[c(0,1)]] <- c(1,5); x; } Error in x[[c(0, 1)]] <- c(1, 5) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate#Output.IgnoreErrorContext# #{ x <- NULL; x[[c(0,1)]] <- c(5); x; } Error in x[[c(0, 1)]] <- c(5) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[[c(0,2)]] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate#Output.IgnoreErrorContext# #{ x <- NULL; x[[c(0,2)]] <- c(1,5); x; } Error in x[[c(0, 2)]] <- c(1, 5) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate#Output.IgnoreErrorContext# #{ x <- NULL; x[[c(0,2)]] <- c(5); x; } Error in x[[c(0, 2)]] <- c(5) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[[c(1,0)]] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate#Output.IgnoreErrorMessage# #{ x <- NULL; x[[c(1,0)]] <- c(1,5); x; } Error in `[[<-`(`*tmp*`, c(1, 0), value = c(1, 5)) : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate#Output.IgnoreErrorContext# #{ x <- NULL; x[[c(1,0)]] <- c(5); x; } Error in `[[<-`(`*tmp*`, c(1, 0), value = 5) : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[[c(1,2)]] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate#Output.IgnoreErrorMessage# #{ x <- NULL; x[[c(1,2)]] <- c(1,5); x; } Error in `[[<-`(`*tmp*`, c(1, 2), value = c(1, 5)) : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate#Output.IgnoreErrorContext# #{ x <- NULL; x[[c(1,2)]] <- c(5); x; } Error in `[[<-`(`*tmp*`, c(1, 2), value = 5) : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(0,1)] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(0,1)] <- c(1,5); x; } [1] 1 Warning message: In x[c(0, 1)] <- c(1, 5) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(0,1)] <- c(5); x; } [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(0,2)] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(0,2)] <- c(1,5); x; } [1] NA 1 Warning message: In x[c(0, 2)] <- c(1, 5) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(0,2)] <- c(5); x; } [1] NA 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(1,0)] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(1,0)] <- c(1,5); x; } [1] 1 Warning message: In x[c(1, 0)] <- c(1, 5) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(1,0)] <- c(5); x; } [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(1,2)] <- c(); x; } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(1,2)] <- c(1,5); x; } [1] 1 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testNullUpdate# #{ x <- NULL; x[c(1,2)] <- c(5); x; } [1] 5 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ `[.foo` <- function(x, i, ...) structure(NextMethod("["), class = class(x)); x<-c(1,2); class(x)<-"foo"; x[1] } [1] 1 attr(,"class") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-c(a=6); class(x)<-"foo"; `$.foo`<-function(x, name) x[name]+1; x$a } a 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-data.frame(1,2); x[2]<-7; x } X1 X2 1 1 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-data.frame(1,2); x[[2]]<-7; x } X1 X2 1 1 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-data.frame(a=7, b=42); x$a } [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-data.frame(a=7, b=42); x$a<-1; x } a b 1 1 42 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-data.frame(c(1,2), c(3,4)); x[2,1]<-7; x } c.1..2. c.3..4. 1 1 3 2 7 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-data.frame(c(1,2), c(3,4)); x[[2,1]]<-7; x } c.1..2. c.3..4. 1 1 3 2 7 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-factor(c("a", "b", "a")); x[3, drop=FALSE] } [1] a Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-factor(c("a", "b", "a")); x[3, drop=TRUE] } [1] a Levels: a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-factor(c("a", "b", "a")); x[3] } [1] a Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-factor(c("a", "b", "a")); x[[3]] } [1] a Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject# #{ x<-factor(c("a", zz="b", "a")); x[["z", exact=FALSE]] } [1] b Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObject#Output.IgnoreErrorContext# #{ x<-factor(c("a", zz="b", "a")); x[["z", exact=TRUE]] } Error in `[[.default`(x, "z", exact = TRUE) : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDefaultAccess# #{ x<-factor(c("a", "b", "a")); .subset(x, 1) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDefaultAccess# #{ x<-factor(c("a", "b", "a")); .subset2(x, 1) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-c(a=6); class(x)<-"foo"; `$.foo`<-function(x, name) x[name]+1; `$.foo`(x, "a") } a 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-c(a=6); class(x)<-"foo"; `$.foo`<-function(x, name) x[name]+1; `$`(x, "a") } a 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-data.frame(a=7, b=42); `$`(x, "a") } [1] 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-factor(c("a", "b", "a")); `[.factor`(x, 1) } [1] a Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-factor(c("a", "b", "a")); `[.factor`(x, 1, drop=FALSE) } [1] a Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-factor(c("a", "b", "a")); `[.factor`(x, 1, drop=TRUE) } [1] a Levels: a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-factor(c("a", "b", "a")); `[[.factor`(x, 1) } [1] a Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-factor(c("a", "b", "a")); `[[`(x, 1) } [1] a Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-factor(c("a", "b", "a")); `[`(x, 1) } [1] a Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-factor(c("a", "b", "a")); `[`(x, 1, drop=FALSE) } [1] a Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-factor(c("a", z="b", "a")); `[[.factor`(x, "z") } [1] b Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-factor(c("a", zz="b", "a")); `[[.factor`(x, "z", exact=FALSE) } [1] b Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess#Output.IgnoreErrorContext# #{ x<-factor(c("a", zz="b", "a")); `[[.factor`(x, "z", exact=TRUE) } Error in `[[.default`(x, "z", exact = TRUE) : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testObjectDirectAccess# #{ x<-factor(c("a", zz="b", "a")); `[[`(x, "z", exact=FALSE) } [1] b Levels: a b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPairList# # quote(`~`(,))[c(-3,-1)][[1]] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPairList# #l <- as.pairlist(c(1,2,3,4)); l2 <- l; typeof(l); l[[3]] <- 123; typeof(l); l [1] "pairlist" [1] "pairlist" [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 123 [[4]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPairList# #l <- as.pairlist(c(1,2,3,4)); typeof(l); l[[3]] <- 123; typeof(l); l [1] "pairlist" [1] "pairlist" [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 123 [[4]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPairList# #l <- pairlist("a","b",1,4,3); typeof(l); typeof(l[[1]]); typeof(l[1]); typeof(l[1:5]); typeof(l[4:5]); l[4:5] [1] "pairlist" [1] "character" [1] "list" [1] "list" [1] "list" [[1]] [1] 4 [[2]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPairList# #l <- quote(a("b",1,4,3)); typeof(l); typeof(l[[1]]); typeof(l[1]); typeof(l[1:5]); typeof(l[4:5]); l[4:5] [1] "language" [1] "symbol" [1] "language" [1] "language" [1] "language" 4(3) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPairList# #quote(`~`(,))[[2]] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPairList# #typeof( quote(`~`(,))[c(-3,-1)][[1]]) [1] "symbol" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPairList# #typeof(quote(`~`(,))[[2]]) [1] "symbol" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPairList# #x <- as.pairlist(list(7,42)); x[[1]] <- list(); typeof(x); x$foo <- 123; typeof(x); x[1] <- list(1); typeof(x) [1] "pairlist" [1] "pairlist" [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ mp<-getOption("max.print"); options(max.print=3); x<-c(1,2,3,4,5); attr(x, "foo")<-"foo"; print(x); options(max.print=mp) } [1] 1 2 3 [ reached getOption("max.print") -- omitted 2 entries ] attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ mp<-getOption("max.print"); options(max.print=3); x<-c(1,2,3,4,5); print(x); options(max.print=mp) } [1] 1 2 3 [ reached getOption("max.print") -- omitted 2 entries ] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1,1)] } a a a a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,1,1,1)] } aaa aaa aaa aaa ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,2,3,4)] } aaa b c d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-(1:4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "cc", "d")); x[0, c(1,2,3,4)] } aaa b cc d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-10001:10008; dim(x)<-c(2,2,2); x } , , 1 [,1] [,2] [1,] 10001 10003 [2,] 10002 10004 , , 2 [,1] [,2] [1,] 10005 10007 [2,] 10006 10008 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-101:108; dim(x)<-c(2,2,2); dimnames(x)<-list(c(1, 2), c(3, 4), c(5, 6)); x } , , 5 3 4 1 101 103 2 102 104 , , 6 3 4 1 105 107 2 106 108 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:16; dim(x)<-c(2,2,2,2); x } , , 1, 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2, 1 [,1] [,2] [1,] 5 7 [2,] 6 8 , , 1, 2 [,1] [,2] [1,] 9 11 [2,] 10 12 , , 2, 2 [,1] [,2] [1,] 13 15 [2,] 14 16 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:16; dim(x)<-c(2,4,2); x } , , 1 [,1] [,2] [,3] [,4] [1,] 1 3 5 7 [2,] 2 4 6 8 , , 2 [,1] [,2] [,3] [,4] [1,] 9 11 13 15 [2,] 10 12 14 16 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:256; dim(x)<-c(4,4,4,4); x } , , 1, 1 [,1] [,2] [,3] [,4] [1,] 1 5 9 13 [2,] 2 6 10 14 [3,] 3 7 11 15 [4,] 4 8 12 16 , , 2, 1 [,1] [,2] [,3] [,4] [1,] 17 21 25 29 [2,] 18 22 26 30 [3,] 19 23 27 31 [4,] 20 24 28 32 , , 3, 1 [,1] [,2] [,3] [,4] [1,] 33 37 41 45 [2,] 34 38 42 46 [3,] 35 39 43 47 [4,] 36 40 44 48 , , 4, 1 [,1] [,2] [,3] [,4] [1,] 49 53 57 61 [2,] 50 54 58 62 [3,] 51 55 59 63 [4,] 52 56 60 64 , , 1, 2 [,1] [,2] [,3] [,4] [1,] 65 69 73 77 [2,] 66 70 74 78 [3,] 67 71 75 79 [4,] 68 72 76 80 , , 2, 2 [,1] [,2] [,3] [,4] [1,] 81 85 89 93 [2,] 82 86 90 94 [3,] 83 87 91 95 [4,] 84 88 92 96 , , 3, 2 [,1] [,2] [,3] [,4] [1,] 97 101 105 109 [2,] 98 102 106 110 [3,] 99 103 107 111 [4,] 100 104 108 112 , , 4, 2 [,1] [,2] [,3] [,4] [1,] 113 117 121 125 [2,] 114 118 122 126 [3,] 115 119 123 127 [4,] 116 120 124 128 , , 1, 3 [,1] [,2] [,3] [,4] [1,] 129 133 137 141 [2,] 130 134 138 142 [3,] 131 135 139 143 [4,] 132 136 140 144 , , 2, 3 [,1] [,2] [,3] [,4] [1,] 145 149 153 157 [2,] 146 150 154 158 [3,] 147 151 155 159 [4,] 148 152 156 160 , , 3, 3 [,1] [,2] [,3] [,4] [1,] 161 165 169 173 [2,] 162 166 170 174 [3,] 163 167 171 175 [4,] 164 168 172 176 , , 4, 3 [,1] [,2] [,3] [,4] [1,] 177 181 185 189 [2,] 178 182 186 190 [3,] 179 183 187 191 [4,] 180 184 188 192 , , 1, 4 [,1] [,2] [,3] [,4] [1,] 193 197 201 205 [2,] 194 198 202 206 [3,] 195 199 203 207 [4,] 196 200 204 208 , , 2, 4 [,1] [,2] [,3] [,4] [1,] 209 213 217 221 [2,] 210 214 218 222 [3,] 211 215 219 223 [4,] 212 216 220 224 , , 3, 4 [,1] [,2] [,3] [,4] [1,] 225 229 233 237 [2,] 226 230 234 238 [3,] 227 231 235 239 [4,] 228 232 236 240 , , 4, 4 [,1] [,2] [,3] [,4] [1,] 241 245 249 253 [2,] 242 246 250 254 [3,] 243 247 251 255 [4,] 244 248 252 256 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:32; dim(x)<-c(2,2,2,2,2); x } , , 1, 1, 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2, 1, 1 [,1] [,2] [1,] 5 7 [2,] 6 8 , , 1, 2, 1 [,1] [,2] [1,] 9 11 [2,] 10 12 , , 2, 2, 1 [,1] [,2] [1,] 13 15 [2,] 14 16 , , 1, 1, 2 [,1] [,2] [1,] 17 19 [2,] 18 20 , , 2, 1, 2 [,1] [,2] [1,] 21 23 [2,] 22 24 , , 1, 2, 2 [,1] [,2] [1,] 25 27 [2,] 26 28 , , 2, 2, 2 [,1] [,2] [1,] 29 31 [2,] 30 32 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:32; dim(x)<-c(2,2,2,4); x } , , 1, 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2, 1 [,1] [,2] [1,] 5 7 [2,] 6 8 , , 1, 2 [,1] [,2] [1,] 9 11 [2,] 10 12 , , 2, 2 [,1] [,2] [1,] 13 15 [2,] 14 16 , , 1, 3 [,1] [,2] [1,] 17 19 [2,] 18 20 , , 2, 3 [,1] [,2] [1,] 21 23 [2,] 22 24 , , 1, 4 [,1] [,2] [1,] 25 27 [2,] 26 28 , , 2, 4 [,1] [,2] [1,] 29 31 [2,] 30 32 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:32; dim(x)<-c(2,2,4,2); x } , , 1, 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2, 1 [,1] [,2] [1,] 5 7 [2,] 6 8 , , 3, 1 [,1] [,2] [1,] 9 11 [2,] 10 12 , , 4, 1 [,1] [,2] [1,] 13 15 [2,] 14 16 , , 1, 2 [,1] [,2] [1,] 17 19 [2,] 18 20 , , 2, 2 [,1] [,2] [1,] 21 23 [2,] 22 24 , , 3, 2 [,1] [,2] [1,] 25 27 [2,] 26 28 , , 4, 2 [,1] [,2] [1,] 29 31 [2,] 30 32 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:32; dim(x)<-c(2,4,2,2); x } , , 1, 1 [,1] [,2] [,3] [,4] [1,] 1 3 5 7 [2,] 2 4 6 8 , , 2, 1 [,1] [,2] [,3] [,4] [1,] 9 11 13 15 [2,] 10 12 14 16 , , 1, 2 [,1] [,2] [,3] [,4] [1,] 17 19 21 23 [2,] 18 20 22 24 , , 2, 2 [,1] [,2] [,3] [,4] [1,] 25 27 29 31 [2,] 26 28 30 32 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:32; dim(x)<-c(4,2,2,2); x } , , 1, 1 [,1] [,2] [1,] 1 5 [2,] 2 6 [3,] 3 7 [4,] 4 8 , , 2, 1 [,1] [,2] [1,] 9 13 [2,] 10 14 [3,] 11 15 [4,] 12 16 , , 1, 2 [,1] [,2] [1,] 17 21 [2,] 18 22 [3,] 19 23 [4,] 20 24 , , 2, 2 [,1] [,2] [1,] 25 29 [2,] 26 30 [3,] 27 31 [4,] 28 32 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:4; dim(x)<-c(1,2,2); x } , , 1 [,1] [,2] [1,] 1 2 , , 2 [,1] [,2] [1,] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:4; dim(x)<-c(2,1,2); dimnames(x)<-list(c("a", "b"), "c", c("d", "e")); x } , , d c a 1 b 2 , , e c a 3 b 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:4; dim(x)<-c(2,1,2); x } , , 1 [,1] [1,] 1 [2,] 2 , , 2 [,1] [1,] 3 [2,] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:4; dim(x)<-c(2,2,1); x } , , 1 [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:4; dim(x)<-c(2,2,1,1); x } , , 1, 1 [,1] [,2] [1,] 1 3 [2,] 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:64; dim(x)<-c(2,2,2,2,2,2); x } , , 1, 1, 1, 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2, 1, 1, 1 [,1] [,2] [1,] 5 7 [2,] 6 8 , , 1, 2, 1, 1 [,1] [,2] [1,] 9 11 [2,] 10 12 , , 2, 2, 1, 1 [,1] [,2] [1,] 13 15 [2,] 14 16 , , 1, 1, 2, 1 [,1] [,2] [1,] 17 19 [2,] 18 20 , , 2, 1, 2, 1 [,1] [,2] [1,] 21 23 [2,] 22 24 , , 1, 2, 2, 1 [,1] [,2] [1,] 25 27 [2,] 26 28 , , 2, 2, 2, 1 [,1] [,2] [1,] 29 31 [2,] 30 32 , , 1, 1, 1, 2 [,1] [,2] [1,] 33 35 [2,] 34 36 , , 2, 1, 1, 2 [,1] [,2] [1,] 37 39 [2,] 38 40 , , 1, 2, 1, 2 [,1] [,2] [1,] 41 43 [2,] 42 44 , , 2, 2, 1, 2 [,1] [,2] [1,] 45 47 [2,] 46 48 , , 1, 1, 2, 2 [,1] [,2] [1,] 49 51 [2,] 50 52 , , 2, 1, 2, 2 [,1] [,2] [1,] 53 55 [2,] 54 56 , , 1, 2, 2, 2 [,1] [,2] [1,] 57 59 [2,] 58 60 , , 2, 2, 2, 2 [,1] [,2] [1,] 61 63 [2,] 62 64 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:64; dim(x)<-c(2,2,2,4,2); x } , , 1, 1, 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2, 1, 1 [,1] [,2] [1,] 5 7 [2,] 6 8 , , 1, 2, 1 [,1] [,2] [1,] 9 11 [2,] 10 12 , , 2, 2, 1 [,1] [,2] [1,] 13 15 [2,] 14 16 , , 1, 3, 1 [,1] [,2] [1,] 17 19 [2,] 18 20 , , 2, 3, 1 [,1] [,2] [1,] 21 23 [2,] 22 24 , , 1, 4, 1 [,1] [,2] [1,] 25 27 [2,] 26 28 , , 2, 4, 1 [,1] [,2] [1,] 29 31 [2,] 30 32 , , 1, 1, 2 [,1] [,2] [1,] 33 35 [2,] 34 36 , , 2, 1, 2 [,1] [,2] [1,] 37 39 [2,] 38 40 , , 1, 2, 2 [,1] [,2] [1,] 41 43 [2,] 42 44 , , 2, 2, 2 [,1] [,2] [1,] 45 47 [2,] 46 48 , , 1, 3, 2 [,1] [,2] [1,] 49 51 [2,] 50 52 , , 2, 3, 2 [,1] [,2] [1,] 53 55 [2,] 54 56 , , 1, 4, 2 [,1] [,2] [1,] 57 59 [2,] 58 60 , , 2, 4, 2 [,1] [,2] [1,] 61 63 [2,] 62 64 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:64; dim(x)<-c(4,4,4); x } , , 1 [,1] [,2] [,3] [,4] [1,] 1 5 9 13 [2,] 2 6 10 14 [3,] 3 7 11 15 [4,] 4 8 12 16 , , 2 [,1] [,2] [,3] [,4] [1,] 17 21 25 29 [2,] 18 22 26 30 [3,] 19 23 27 31 [4,] 20 24 28 32 , , 3 [,1] [,2] [,3] [,4] [1,] 33 37 41 45 [2,] 34 38 42 46 [3,] 35 39 43 47 [4,] 36 40 44 48 , , 4 [,1] [,2] [,3] [,4] [1,] 49 53 57 61 [2,] 50 54 58 62 [3,] 51 55 59 63 [4,] 52 56 60 64 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:8; dim(x)<-c(2, 4); toString(x) } [1] "1, 2, 3, 4, 5, 6, 7, 8" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:8; dim(x)<-c(2, 4); x } [,1] [,2] [,3] [,4] [1,] 1 3 5 7 [2,] 2 4 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:8; dim(x)<-c(2,2,2); dimnames(x)<-list(c(101, 102), NULL, NULL); x } , , 1 [,1] [,2] 101 1 3 102 2 4 , , 2 [,1] [,2] 101 5 7 102 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:8; dim(x)<-c(2,2,2); dimnames(x)<-list(c(101, 102), NULL, c(105, 106)); x } , , 105 [,1] [,2] 101 1 3 102 2 4 , , 106 [,1] [,2] 101 5 7 102 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:8; dim(x)<-c(2,2,2); dimnames(x)<-list(c(101, 102), c(103, 104), NULL); x } , , 1 103 104 101 1 3 102 2 4 , , 2 103 104 101 5 7 102 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:8; dim(x)<-c(2,2,2); dimnames(x)<-list(c(101, 102), c(103, 104), c(105, 106)); x } , , 105 103 104 101 1 3 102 2 4 , , 106 103 104 101 5 7 102 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:8; dim(x)<-c(2,2,2); dimnames(x)<-list(c(101, 102), c(105, 106)); x } , , 1 105 106 101 1 3 102 2 4 , , 2 105 106 101 5 7 102 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-1:8; dim(x)<-c(2,2,2); x } , , 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2 [,1] [,2] [1,] 5 7 [2,] 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1,1)] } a a a a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,1,1,1)] } aaa aaa aaa aaa ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,2,3,4)] } aaa b c d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c("a", "b", "c", "d"); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "cc", "d")); x[0, c(1,2,3,4)] } aaa b cc d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1,1)] } a a a a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,1,1,1)] } aaa aaa aaa aaa ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,2,3,4)] } aaa b c d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1+1i, 2+2i, 3+3i, 4+4i); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "cc", "d")); x[0, c(1,2,3,4)] } aaa b cc d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1,2); y<-list(x, 1, 2, 3); dim(y)<-c(2, 2); y } [,1] [,2] [1,] Numeric,2 2 [2,] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1,1)] } a a a a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,1,1,1)] } aaa aaa aaa aaa ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,2,3,4)] } aaa b c d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1.1, 2.2, 3.3, 4.4); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "cc", "d")); x[0, c(1,2,3,4)] } aaa b cc d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1:2, 100003:100004,10005:10008); dim(x)<-c(2,2,2); x } , , 1 [,1] [,2] [1,] 1 100003 [2,] 2 100004 , , 2 [,1] [,2] [1,] 10005 10007 [2,] 10006 10008 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(1:4,10005:10008); dim(x)<-c(2,2,2); x } , , 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2 [,1] [,2] [1,] 10005 10007 [2,] 10006 10008 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(3+2i, 5+0i, 1+3i, 5+3i, 2-4i, 5-2i, 6-7i, 5-0i); dim(x)<-c(2,2,2); x } , , 1 [,1] [,2] [1,] 3+2i 1+3i [2,] 5+0i 5+3i , , 2 [,1] [,2] [1,] 2-4i 6-7i [2,] 5-2i 5+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1,1)] } a a a a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,1,1,1)] } aaa aaa aaa aaa ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,2,3,4)] } aaa b c d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(TRUE, FALSE, TRUE, FALSE); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "cc", "d")); x[0, c(1,2,3,4)] } aaa b cc d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1,1)] } a a a a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,1,1,1)] } aaa aaa aaa aaa ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,2,3,4)] } aaa b c d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-c(as.raw(1),as.raw(2),as.raw(3),as.raw(4)); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "cc", "d")); x[0, c(1,2,3,4)] } aaa b cc d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-character(0); y<-list(x, 1+1i, 2+2i, 3+3i); dim(y)<-c(2, 2); y } [,1] [,2] [1,] Character,0 2+2i [2,] 1+1i 3+3i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(0, 0); x } <0 x 0 matrix> ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(0, 0, 2, 2, 2); x } , , 1, 1, 1 , , 2, 1, 1 , , 1, 2, 1 , , 2, 2, 1 , , 1, 1, 2 , , 2, 1, 2 , , 1, 2, 2 , , 2, 2, 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(0, 1); dimnames(x)<-list(NULL, "a"); x } a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(0, 1); x } [,1] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(0, 3); x } [,1] [,2] [,3] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(0, 4); dimnames(x)<-list(NULL, c("a", "bbbbbbbbbbbb", "c", "d")); x } a bbbbbbbbbbbb c d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(1, 0); dimnames(x)<-list("a"); x } a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(1, 0); x } [1,] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(1, 0, 0); x } <1 x 0 x 0 array of integer> [1,] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(1, 0, 0, 2); x } <1 x 0 x 0 x 2 array of integer> [1,] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(1, 0, 2); x } , , 1 [1,] , , 2 [1,] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(1, 0, 2, 0, 2); x } <1 x 0 x 2 x 0 x 2 array of integer> [1,] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(1, 0, 2, 2, 2); dimnames(x)<-list("a", NULL, c("b", "c"), c("d", "e"), c("f", "g")); x } , , b, d, f a , , c, d, f a , , b, e, f a , , c, e, f a , , b, d, g a , , c, d, g a , , b, e, g a , , c, e, g a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); dim(x)<-c(3, 0); x } [1,] [2,] [3,] ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-integer(0); y<-list(x, 1, 2, 3); dim(y)<-c(2, 2); y } [,1] [,2] [1,] Integer,0 2 [2,] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-list(1, 2, 3, 4); dim(x)<-c(2, 2); toString(x) } [1] "1, 2, 3, 4" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-list(1,2,3,4); dim(x)<-c(2, 2); y<-list(x, 1, 2, 3); dim(y)<-c(2, 2); y } [,1] [,2] [1,] List,4 2 [2,] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-list(1,2,3,4,5,6,7,8); dim(x)<-c(2,2,2); x } , , 1 [,1] [,2] [1,] 1 3 [2,] 2 4 , , 2 [,1] [,2] [1,] 5 7 [2,] 6 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("a", "b", "c", "d")); x[0, c(1,1,1,1)] } a a a a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,1,1,1)] } aaa aaa aaa aaa ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "c", "d")); x[0, c(1,2,3,4)] } aaa b c d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ x<-list(TRUE, "a", 42, 1.1); dim(x)<-c(1,4); dimnames(x)<-list("z", c("aaa", "b", "cc", "d")); x[0, c(1,2,3,4)] } aaa b cc d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testPrint# #{ z<-list(1,2,3,4); dim(z)<-c(2,2); x<-list(z,2,3,42); dim(x)<-c(2, 2); y<-list(x, 1, 2, 3); dim(y)<-c(2, 2); y } [,1] [,2] [1,] List,4 2 [2,] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testQuotes# #{ e <- quote(x(y=z)); e[2] } z() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testQuotes# #{ e <- quote(x(y=z)); e[[2]] } z ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testQuotes# #{ e <- quote(x(y=z)); names(e[2]) } [1] "y" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testQuotes# #{ e <- quote(x(y=z)); typeof(e[2]) } [1] "language" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testQuotes# #{ e <- quote(x(y=z)); typeof(e[[2]]) } [1] "symbol" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[as.raw(1), 1]]<-7 } Error in `[[<-`(`*tmp*`, as.raw(1), 1, value = 7) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[as.raw(1), 1]]<-c(7,42) } Error in x[[as.raw(1), 1]] <- c(7, 42) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[[as.raw(1), 1]]<-integer() } Error in x[[as.raw(1), 1]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[as.raw(1), 1]<-7 } Error in `[<-`(`*tmp*`, as.raw(1), 1, value = 7) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[as.raw(1), 1]<-NULL } Error in `[<-`(`*tmp*`, as.raw(1), 1, value = NULL) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[as.raw(1), 1]<-c(7,42) } Error in `[<-`(`*tmp*`, as.raw(1), 1, value = c(7, 42)) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-c(1,2,3,4); dim(x)<-c(2,2); x[as.raw(1), 1]<-integer() } Error in `[<-`(`*tmp*`, as.raw(1), 1, value = integer(0)) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); x[[as.raw(1)]]<-NULL } Error in x[[as.raw(1)]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-c(1,2,3,4); x[[as.raw(1)]]<-c(1) } Error in x[[as.raw(1)]] <- c(1) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); x[[as.raw(1)]]<-c(1,2) } Error in x[[as.raw(1)]] <- c(1, 2) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); x[[as.raw(1)]]<-c(1,2,3) } Error in x[[as.raw(1)]] <- c(1, 2, 3) : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorMessage# #{ x<-c(1,2,3,4); x[[as.raw(1)]]<-integer() } Error in x[[as.raw(1)]] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-c(1,2,3,4); x[as.raw(1)]<-NULL } Error in x[as.raw(1)] <- NULL : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-c(1,2,3,4); x[as.raw(1)]<-c(1) } Error in x[as.raw(1)] <- c(1) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-c(1,2,3,4); x[as.raw(1)]<-c(1,2) } Error in x[as.raw(1)] <- c(1, 2) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-c(1,2,3,4); x[as.raw(1)]<-c(1,2,3) } Error in x[as.raw(1)] <- c(1, 2, 3) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-c(1,2,3,4); x[as.raw(1)]<-integer() } Error in x[as.raw(1)] <- integer() : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[as.raw(1), 1]]<-7 } Error in `[[<-`(`*tmp*`, as.raw(1), 1, value = 7) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorMessage# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[as.raw(1), 1]]<-NULL } Error in `[[<-`(`*tmp*`, as.raw(1), 1, value = NULL) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[as.raw(1), 1]]<-c(7,42) } Error in `[[<-`(`*tmp*`, as.raw(1), 1, value = c(7, 42)) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[[as.raw(1), 1]]<-integer() } Error in `[[<-`(`*tmp*`, as.raw(1), 1, value = integer(0)) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[as.raw(1), 1]<-7 } Error in `[<-`(`*tmp*`, as.raw(1), 1, value = 7) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[as.raw(1), 1]<-NULL } Error in `[<-`(`*tmp*`, as.raw(1), 1, value = NULL) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[as.raw(1), 1]<-c(7,42) } Error in `[<-`(`*tmp*`, as.raw(1), 1, value = c(7, 42)) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex#Output.IgnoreErrorContext# #{ x<-list(1,2,3,4); dim(x)<-c(2,2); x[as.raw(1), 1]<-integer() } Error in `[<-`(`*tmp*`, as.raw(1), 1, value = integer(0)) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-list(1,2,3,4); x[[as.raw(1)]]<-NULL } Error in x[[as.raw(1)]] <- NULL : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-list(1,2,3,4); x[[as.raw(1)]]<-c(1) } Error in x[[as.raw(1)]] <- c(1) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-list(1,2,3,4); x[[as.raw(1)]]<-c(1,2) } Error in x[[as.raw(1)]] <- c(1, 2) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-list(1,2,3,4); x[[as.raw(1)]]<-c(1,2,3) } Error in x[[as.raw(1)]] <- c(1, 2, 3) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-list(1,2,3,4); x[[as.raw(1)]]<-integer() } Error in x[[as.raw(1)]] <- integer() : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-list(1,2,3,4); x[as.raw(1)]<-NULL } Error in x[as.raw(1)] <- NULL : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-list(1,2,3,4); x[as.raw(1)]<-c(1) } Error in x[as.raw(1)] <- c(1) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-list(1,2,3,4); x[as.raw(1)]<-c(1,2) } Error in x[as.raw(1)] <- c(1, 2) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-list(1,2,3,4); x[as.raw(1)]<-c(1,2,3) } Error in x[as.raw(1)] <- c(1, 2, 3) : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testRawIndex# #{ x<-list(1,2,3,4); x[as.raw(1)]<-integer() } Error in x[as.raw(1)] <- integer() : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleAsVector# #{ x<-1; x[-1L] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleAsVector# #{ x<-1; x[-2L] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleAsVector# #{ x<-1; x[0L] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleAsVector# #{ x<-1; x[1L] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleAsVector# #{ x<-1; x[2L] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleAsVector# #{ x<-1; x[FALSE] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleAsVector# #{ x<-1; x[NA] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleAsVector# #{ x<-1; x[NaN] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleAsVector# #{ x<-1; x[TRUE] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-1:3; x[1.1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-1:3; x[2.1] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-1:3; x[3.1] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-3:1; x[1.1] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-3:1; x[2.1] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-3:1; x[3.1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-3:1; x[NA_real_] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-3:1; x[NaN] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-c(1,2,3); x[1.1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-c(1,2,3); x[2.1] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-c(1,2,3); x[3.1] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-c(1L,2L,3L); x[1.1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-c(1L,2L,3L); x[2.1] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleIndexOnVector# #{ x<-c(1L,2L,3L); x[3.1] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleNegativeIndexOnVector# #{ x<-1:3; x[-1.1] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleNegativeIndexOnVector# #{ x<-1:3; x[-2.1] } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleNegativeIndexOnVector# #{ x<-1:3; x[-3.1] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleNegativeIndexOnVector# #{ x<-c(1,2,3); x[-1.1] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleNegativeIndexOnVector# #{ x<-c(1,2,3); x[-2.1] } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleNegativeIndexOnVector# #{ x<-c(1,2,3); x[-3.1] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleNegativeIndexOnVector# #{ x<-c(1L,2L,3L); x[-1.1] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleNegativeIndexOnVector# #{ x<-c(1L,2L,3L); x[-2.1] } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarDoubleNegativeIndexOnVector# #{ x<-c(1L,2L,3L); x[-3.1] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorContext# # { x <- 1:3 ; x[[NULL]] } Error in x[[NULL]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ b <- c(1+2i,3+4i) ; dim(b) <- c(2,1) ; b[1] <- 3+1i ; b } [,1] [1,] 3+1i [2,] 3+4i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ b <- list(1+2i,3+4i) ; dim(b) <- c(2,1) ; b["hello"] <- NULL ; b } [[1]] [1] 1+2i [[2]] [1] 3+4i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(1:3, 1L, 10) ; f(c(1,2), "hello", TRUE) ; f(1:2, 1, 3:4) } Error in b[[i]] <- v : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorMessage# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(1:3, 1L, 10) ; f(c(1,2), "hello", TRUE) ; f(1:2, as.integer(NA), 3:4) } Error in b[[i]] <- v : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorMessage# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(1:3, 1L, 10) ; f(c(1,2), "hello", TRUE) ; f(1:2, list(), 3) } Error in b[[i]] <- v : attempt to select less than one element in OneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(1:3, 1L, 10) ; f(c(1,2), "hello", TRUE) ; f(1:2, list(1), 3) } Error in b[[i]] <- v : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(1:3, 1L, 10) ; f(c(1,2), "hello", TRUE) ; f(1:2, 1+2i, 3) } Error in b[i] <- v : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorMessage# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:2,-1) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:2,-2) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorMessage# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:2,-3) } Error in x[[i]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorMessage# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:3,-1) } Error in x[[i]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:3,4) } Error in x[[i]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:3,NA) } Error in x[[i]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorContext# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:3,c(3,3)) } Error in x[[i]] : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorContext# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:3,c(TRUE,FALSE)) } Error in x[[i]] : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorMessage# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:4,-3) } Error in x[[i]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorMessage# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(2,-2) } Error in x[[i]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorMessage# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(2,-3) } Error in x[[i]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(list(1,2),1+0i) } Error in x[[i]] : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorContext# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(list(1,2),FALSE) } Error in x[[i]] : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[[i]] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(list(1,2),TRUE) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[[i]]} ; f(list(1,2,3,4), 3); f(f,2) } Error in x[[i]] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:2,-2) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:2,-4) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:2,0) } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:2,NA) } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:3,c(1,2)) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(1:3,c(TRUE,FALSE)) } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(as.raw(c(10,11)),-4) } [1] 0a 0b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(as.raw(c(10,11)),0) } raw(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(as.raw(c(10,11)),4) } [1] 00 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c("a","b"),-4) } [1] "a" "b" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c("a","b"),0) } character(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c("a","b"),4) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c("a","b"),NA) } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(1+2i,3+4i),-4) } [1] 1+2i 3+4i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(1+2i,3+4i),4) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(1+2i,3+4i),NA) } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(TRUE,FALSE),-2) } [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(TRUE,FALSE),-4) } [1] TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(TRUE,FALSE),0) } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(TRUE,FALSE),4) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(TRUE,FALSE),NA) } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(a="a",b="b"),0) } named character(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(a=1+2i,b=3+4i),4) } NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(a=1L,b=2L),0) } named integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(a=TRUE,b=FALSE),0) } named logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(c(a=TRUE,b=FALSE),4) } NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(integer(), NA) } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(list(), NA) } [[1]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(list(1,2),-4) } [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(list(1,2),4) } [[1]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; f(list(a=1,b=2),4) } $ NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; z <- c(1+2i,3+4i) ; attr(z, "my") <- 1 ; f(z,-10) } [1] 1+2i 3+4i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; z <- c(1,3) ; attr(z, "my") <- 1 ; f(z,-10) } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; z <- c(1L,3L) ; attr(z, "my") <- 1 ; f(z,-10) } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; z <- c(TRUE,FALSE) ; attr(z, "my") <- 1 ; f(z,-10) } [1] TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; z <- c(a="a",b="b") ; attr(z, "my") <- 1 ; f(z,-10) } a b "a" "b" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; f(1:4, 2L) ; f(c(a=1), "a") ; z <- c(a=as.raw(10),b=as.raw(11)) ; attr(z, "my") <- 1 ; f(z,-10) } a b 0a 0b ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; x <- c(a=1,b=2) ; f(x,"a") ; f(function(){3},"b") } Error in x[i] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; x <- c(a=1,b=2) ; f(x,"a") ; f(x,2) } b 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ f <- function(x,i) { x[i] } ; x <- c(a=1,b=2) ; f(x,"a") } a 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- 1 ; attr(x, "hi") <- 2; x[2] <- 2; attr(x, "hi") } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- 1:2 ; x[as.integer(NA)] <- 3:4 } Error in x[as.integer(NA)] <- 3:4 : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- 1:3 ; x[2] <- integer() } Error in x[2] <- integer() : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- 1:3 ; x[TRUE] <- 10 ; x } [1] 10 10 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Output.IgnoreErrorContext# #{ x <- 1:3 ; x[[FALSE]] <- 10 ; x } Error in x[[FALSE]] <- 10 : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- 1:3 ; x[[NA]] <- 10 ; x } Error in x[[NA]] <- 10 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- 1:3 ; x[[TRUE]] <- 10 ; x } [1] 10 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- 1:3 ; x[[TRUE]] <- 1:2 } Error in x[[TRUE]] <- 1:2 : more elements supplied than there are to replace ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- 1:4 ; y <- -1 ; x[y] } [1] 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- 1:4 ; y <- 10 ; x[y] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- as.list(1:2) ; f <- function(i) { x[[i]] <- NULL ; x } ; f(1) ; f(as.raw(10)) } Error in x[[i]] <- NULL : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- as.list(1:2) ; f <- function(i) { x[i] <- NULL ; x } ; f(1) ; f(NULL) } [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(1,4) ; y <- -1 ; x[y] } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(1,4) ; y <- -1L ; x[y] } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(1,4) ; y <- 10 ; x[y] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(1,4) ; y <- 10L ; x[y] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(TRUE, FALSE, NA) ; x[0] } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a="A", b="B", c="C") ; x[-2] } a c "A" "C" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a="A", b="B", c="C") ; x[0] } named character(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a="A", b="B", c="C") ; x[10] } NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1+1i, b=2+2i, c=3+3i) ; x[0] } named complex(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1+1i, b=2+2i, c=3+3i) ; x[10] } NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1+2i, b=2+3i, c=3) ; x[-2] } a c 1+2i 3+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1, b=2, c=3) ; x[-2] } a c 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1, b=2, c=3) ; x[0] } named numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1, b=2, c=3) ; x[10] } NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1, b=2, c=3) ; x[2] } b 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1, b=2, c=3) ; x[[2]] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1,b=2) ; y <- 2 ; x[y] } b 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1,b=2) ; y <- 2L ; x[y] } b 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1,b=2,c=3,d=4) ; x["b"] } b 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1,b=2,c=3,d=4) ; x["d"] } d 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1L, b=2L, c=3L) ; x[-2] } a c 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1L, b=2L, c=3L) ; x[0] } named integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=1L, b=2L, c=3L) ; x[10] } NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=TRUE, b=FALSE, c=NA) ; x[-2] } a c TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=TRUE, b=FALSE, c=NA) ; x[0] } named logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=as.raw(10), b=as.raw(11), c=as.raw(12)) ; x[-2] } a c 0a 0c ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(a=as.raw(10), b=as.raw(11), c=as.raw(12)) ; x[0] } named raw(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex#Ignored.ReferenceError# #{ x <- c(a=as.raw(10), b=as.raw(11), c=as.raw(12)) ; x[10] } 00 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- c(as.raw(10), as.raw(11), as.raw(12)) ; x[-2] } [1] 0a 0c ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- function(){3} ; y <- 3 ; x[[y]] } Error in x[[y]] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- list(1,2,3,4) ; y <- 3 ; x[[y]] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- list(1,2,3,4) ; y <- 3 ; x[y] } [[1]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- list(1,4) ; y <- -1 ; x[y] } [[1]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- list(1,4) ; y <- 4 ; x[y] } [[1]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- list(1L, 2L, 3L) ; x[10] } [[1]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- list(a=1,b=4) ; y <- 2 ; x[y] } $b [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x <- list(a=1L, b=2L, c=3L) ; x[0] } named list() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-1:4; x[c(-0.5)] } [1] 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-1:4; x[c(-1.5)] } [1] 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-1:4; x[c(1.4,1.8)] } [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-5:1 ; y <- -1L; x[y] } [1] 4 3 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-5:1 ; y <- 2L; x[[y]] } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-5:1 ; y <- 6L; x[y] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-as.list(5:1) ; y <- 1:2; x[[y]] } Error in x[[y]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-as.list(5:1) ; y <- 2L; x[[y]] } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-c(TRUE,TRUE,FALSE); x[0-2] } [1] TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-function() {1} ; x[2L] } Error in x[2L] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-function() {1} ; y <- 2; x[y] } Error in x[y] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIndex# #{ x<-function() {1} ; y <- 2; y[x] } Error in y[x] : invalid subscript type 'closure' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[-1L] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[-2L] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[0L] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[1L] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[2L] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[FALSE] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[NA] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[NA_integer_] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[NA_real_] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[NaN] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntAsVector# #{ x<-1L; x[TRUE] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-1:3; x[1L] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-1:3; x[2L] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-1:3; x[3L] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-3:1; x[1L] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-3:1; x[2L] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-3:1; x[3L] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-3:1; x[NA_integer_] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-c(1,2,3); x[1L] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-c(1,2,3); x[2L] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-c(1,2,3); x[3L] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-c(1L,2L,3L); x[1L] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-c(1L,2L,3L); x[2L] } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexOnVector# #{ x<-c(1L,2L,3L); x[3L] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(1,2,3); x[2.3] <- "hello"; x } [1] "1" "hello" "3" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(1,2,3); x[2.3] <- 100; x } [1] 1 100 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(1,2,3); x[2.3] <- 100i; x } [1] 1+ 0i 0+100i 3+ 0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(1,2,3); x[2.3] <- FALSE; x } [1] 1 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(1L,2L,3L); x[2.3] <- "hello"; x } [1] "1" "hello" "3" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(1L,2L,3L); x[2.3] <- 100; x } [1] 1 100 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(1L,2L,3L); x[2.3] <- 100L; x } [1] 1 100 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(1L,2L,3L); x[2.3] <- 100i; x } [1] 1+ 0i 0+100i 3+ 0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(1L,2L,3L); x[2.3] <- FALSE; x } [1] 1 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(TRUE,TRUE,FALSE); x[2.3] <- "hello"; x } [1] "TRUE" "hello" "FALSE" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(TRUE,TRUE,FALSE); x[2.3] <- 100; x } [1] 1 100 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(TRUE,TRUE,FALSE); x[2.3] <- 100L; x } [1] 1 100 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(TRUE,TRUE,FALSE); x[2.3] <- 100i; x } [1] 1+ 0i 0+100i 0+ 0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntIndexScalarValueUpdateOnVector# #{ x<-c(TRUE,TRUE,FALSE); x[2.3] <- FALSE; x } [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntNegativeIndexOnVector# #{ x<-1:3; x[-1L] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntNegativeIndexOnVector# #{ x<-1:3; x[-2L] } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntNegativeIndexOnVector# #{ x<-1:3; x[-3L] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntNegativeIndexOnVector# #{ x<-c(1,2,3); x[-1L] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntNegativeIndexOnVector# #{ x<-c(1,2,3); x[-2L] } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntNegativeIndexOnVector# #{ x<-c(1,2,3); x[-3L] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntNegativeIndexOnVector# #{ x<-c(1L,2L,3L); x[-1L] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntNegativeIndexOnVector# #{ x<-c(1L,2L,3L); x[-2L] } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarIntNegativeIndexOnVector# #{ x<-c(1L,2L,3L); x[-3L] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarLogicOnVector# #{ x<-1:3; x[FALSE] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarLogicOnVector# #{ x<-1:3; x[TRUE] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarLogicOnVector# #{ x<-c(1,2,3); x[FALSE] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarLogicOnVector# #{ x<-c(1,2,3); x[TRUE] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarLogicOnVector# #{ x<-c(1L,2L,3L); x[FALSE] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarLogicOnVector# #{ x<-c(1L,2L,3L); x[TRUE] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-1:3; typeof(x[NA]) } [1] "integer" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-1:3; x[-0.1] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-1:3; x[-4.1] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-1:3; x[-4L] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-1:3; x[0.1] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-1:3; x[0L] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-1:3; x[0] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-1:3; x[4.1] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-1:3; x[4L] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-1:3; x[NA] } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1,2,3); typeof(x[NA]) } [1] "double" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1,2,3); x[-0.1] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1,2,3); x[-4.1] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1,2,3); x[-4L] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1,2,3); x[0.1] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1,2,3); x[0L] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1,2,3); x[0] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1,2,3); x[4.1] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1,2,3); x[4L] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1,2,3); x[NA] } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1L,2L,3L); typeof(x[NA]) } [1] "integer" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1L,2L,3L); x[-0.1] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1L,2L,3L); x[-4.1] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1L,2L,3L); x[-4L] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1L,2L,3L); x[0.1] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1L,2L,3L); x[0L] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1L,2L,3L); x[0] } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1L,2L,3L); x[4.1] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1L,2L,3L); x[4L] } [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarOutOfBoundsOnVector# #{ x<-c(1L,2L,3L); x[NA] } [1] NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# # { b <- c(1,2) ; x <- b ; f <- function(b,v) { b[2L] <- v ; b } ; f(b,10) ; f(1:3,13L) } [1] 1 13 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# # { x <- as.raw(c(10,11)) ; x["a"] <- NA ; x } Error in x["a"] <- NA : incompatible types (from logical to raw) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# # { x <- c(a=1+2i, b=3+4i) ; x["a"] <- as.raw(13) ; x } Error in x["a"] <- as.raw(13) : incompatible types (from raw to complex) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ a <- c(1L,2L,3L); a <- 1:5; a[3] <- TRUE; a } [1] 1 2 1 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorMessage# #{ b <- as.raw(1) ; b[[-3]] <- as.raw(13) ; b } Error in b[[-3]] <- as.raw(13) : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- as.raw(c(1,2)) ; b[3] <- 3 ; b } Error in b[3] <- 3 : incompatible types (from double to raw) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- as.raw(c(1,2)) ; b[3] <- as.raw(13) ; b } [1] 01 02 0d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- as.raw(c(1,2)) ; b[[-1]] <- as.raw(13) ; b } [1] 01 0d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- as.raw(c(1,2)) ; b[[-2]] <- as.raw(13) ; b } [1] 0d 02 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorMessage# #{ b <- as.raw(c(1,2)) ; b[[-3]] <- as.raw(13) ; b } Error in b[[-3]] <- as.raw(13) : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- as.raw(c(1,2)) ; b[as.double(NA)] <- as.raw(13) ; b } [1] 01 02 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorMessage# #{ b <- as.raw(c(1,2,3)) ; b[[-2]] <- as.raw(13) ; b } Error in b[[-2]] <- as.raw(13) : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c("a","b") ; z <- b ; b[[-1L]] <- "xx" ; b } [1] "a" "xx" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c("a","b") ; z <- b ; b[[3L]] <- "xx" ; b } [1] "a" "b" "xx" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1+2i,3+4i) ; b[3] <- 2 ; b } [1] 1+2i 3+4i 2+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; b[0L] <- 3 ; b } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; b[0] <- 1+2i ; b } [1] 1+0i 2+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; b[3] <- 2+3i ; b } [1] 1+0i 2+0i 2+3i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; b[3] <- as.raw(13) ; b } Error in b[3] <- as.raw(13) : incompatible types (from raw to double) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; b[5L] <- 3 ; b } [1] 1 2 NA NA 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; x <- b ; b[2L] <- 3 ; b } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; x <- b ; f <- function(b,v) { b[2L] <- v ; b } ; f(b,10) ; f(b,13L) } [1] 1 13 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; x <- b ; f <- function(b,v) { b[2L] <- v ; b } ; f(b,10) ; f(c(1,2),10) } [1] 1 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; x <- b ; f <- function(b,v) { b[2L] <- v ; b } ; f(b,10L) ; f(1:3,13L) } [1] 1 13 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; x <- b ; f <- function(b,v) { b[2L] <- v ; b } ; f(b,10L) ; f(b,13) } [1] 1 13 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; z <- b ; b[-10L] <- FALSE ; b } [1] 0 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; z <- b ; b[-2] <- 3L ; b } [1] 3 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; z <- b ; b[3L] <- 3L ; b } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; z <- b ; b[3L] <- FALSE ; b } [1] 1 2 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1,2) ; z <- c(10,11) ; attr(z,"my") <- 4 ; b[2] <- z ; b } [1] 1 10 Warning message: In b[2] <- z : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1L,2L) ; b[0] <- 13L ; b } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1L,2L) ; b[2] <- FALSE ; b } [1] 1 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(1L,2L) ; b[3] <- 13L ; b } [1] 1 2 13 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(TRUE,NA) ; b[3] <- FALSE ; b } [1] TRUE NA FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(TRUE,NA) ; z <- b ; b[-10L] <- FALSE ; b } [1] FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- c(TRUE,NA) ; z <- b ; b[4L] <- FALSE ; b } [1] TRUE NA NA FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- list(1+2i,3+4i) ; dim(b) <- c(2,1) ; b[3] <- NULL ; b } [[1]] [1] 1+2i [[2]] [1] 3+4i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- list(TRUE,NA) ; z <- b ; b[[-1L]] <- FALSE ; b } [[1]] [1] TRUE [[2]] [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ b <- list(TRUE,NA) ; z <- b ; b[[4L]] <- FALSE ; b } [[1]] [1] TRUE [[2]] [1] NA [[3]] NULL [[4]] [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ e < new.env(); e[["abc"]] <- 3} Error: object 'e' not found ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ e < new.env(); e[["abc"]] <- NULL} Error: object 'e' not found ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorContext# #{ f <- function() { a[3] <- 4 } ; f() } Error in a[3] <- 4 : object 'a' not found ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,i) { b[i] <- 1 } ; f(1:3,2) ; f(1:2, f) } Error in b[i] <- 1 : invalid subscript type 'closure' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,i) { b[i] <- 1 } ; f(1:3,2) ; f(f, 3) } Error in b[i] <- 1 : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorContext# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(1:2,"hi",3L) ; f(1:2,2,10) ; f(1:2,1:3, 10) } Error in `[[<-`(`*tmp*`, i, value = v) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorContext# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(1:2,"hi",3L) ; f(1:2,2,10) ; f(as.list(1:2),1:3, 10) } Error in `[[<-`(`*tmp*`, i, value = v) : recursive indexing failed at level 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorContext# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(1:2,"hi",3L) ; f(1:2,c(2),10) ; f(1:2,0, 10) } Error in b[[i]] <- v : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(1:2,"hi",3L) ; f(1:2,c(2),10) ; f(1:2,2, 10) } [1] 1 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; v } ; f(1:2,"hi",3L) ; f(1:2,c(2),10) ; f(1:2,as.integer(NA), 10) } Error in b[[i]] <- v : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; b <- c(10L,2L) ; b[0] <- TRUE ; b } [1] 10 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; b <- c(10L,2L) ; b[3] <- TRUE ; b } [1] 10 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(1:2,"hi",3L) ; f(1:2,-2,10) } [1] 10 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(1:2,"hi",3L) ; f(1:2,2,10) ; f(1:2,as.integer(NA), 10) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[2] <- v ; b } ; f(c(1,2),FALSE) ; f(10,3) } [1] 10 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[2] <- v ; b } ; f(c(1,2),FALSE) ; f(10L,3) } [1] 10 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[2] <- v ; b } ; f(c(1L,2L),10L) ; f(1,3) } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[2] <- v ; b } ; f(c(1L,2L),10L) ; f(1L,3) } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[2] <- v ; b } ; f(c(1L,2L),TRUE) ; f(10,3) } [1] 10 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[2] <- v ; b } ; f(c(1L,2L),TRUE) ; f(1L,3) } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[2] <- v ; b } ; f(c(TRUE,NA),FALSE) ; f(3,3) } [1] 3 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[2] <- v ; b } ; f(c(TRUE,NA),FALSE) ; f(c(FALSE,TRUE),3) } [1] 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[2] <- v } ; f(1:3,2) ; f(1:2, f) } Error in b[2] <- v : incompatible types (from closure to integer) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[[2]] <- v ; b } ; f(c("a","b"),"d") ; f(1:3,"x") } [1] "1" "x" "3" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Ignored.Unstable# #{ f <- function(b,v) { b[[2]] <- v ; b } ; f(c("a","b"),"d") ; f(c("a","b"),NULL) } Error in b[[2]] <- v : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[[2]] <- v ; b } ; f(list(TRUE,NA),FALSE) ; f(3,3) } [1] 3 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[[2]] <- v ; b } ; f(list(TRUE,NA),FALSE) ; f(list(),NULL) } list() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f <- function(b,v) { b[[2]] <- v ; b } ; f(list(TRUE,NA),FALSE) ; f(list(3),NULL) } [[1]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f<-function(x,i,v) { x<-1:5; x[i]<-v; x} ; f(c(1L,2L),1,3L) ; f(c(1L,2L),2,3) } [1] 1 3 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f<-function(x,i,v) { x<-1:5; x[i]<-v; x} ; f(c(1L,2L),1,3L) ; f(c(1L,2L),8,3L) } [1] 1 2 3 4 5 NA NA 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f<-function(x,i,v) { x<-1:5; x[i]<-v; x} ; f(c(1L,2L),1,FALSE) ; f(c(1L,2L),2,3) } [1] 1 3 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ f<-function(x,i,v) { x<-1:5; x[i]<-v; x} ; f(c(1L,2L),1,FALSE) ; f(c(1L,2L),8,TRUE) } [1] 1 2 3 4 5 NA NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- 1:2 ; x["a"] <- 10 ; x } a 1 2 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- 1:2 ; x["a"] <- 10+3i ; x } a 1+0i 2+0i 10+3i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- 1:2 ; x["a"] <- FALSE ; x } a 1 2 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- 1:2; x[[as.integer(NA)]] <- 10 ; x } Error in x[[as.integer(NA)]] <- 10 : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- 1:3 ; x[2] <- "hi"; x } [1] "1" "hi" "3" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Ignored.Unstable#Output.IgnoreErrorContext# #{ x <- 4:10 ; x[["z"]] <- NULL ; x } Error in x[["z"]] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- as.list(1:2) ; x[["z"]] <- NULL ; x } [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- as.raw(c(10,11)) ; x["a"] <- as.raw(13) ; x } a 0a 0b 0d ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- c(1,2,3) ; x[2] <- "hi"; x } [1] "1" "hi" "3" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- c(2,3,4) ; x[1] <- 3+4i ; x } [1] 3+4i 3+0i 4+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- c(TRUE,FALSE,FALSE) ; x[2] <- "hi"; x } [1] "TRUE" "hi" "FALSE" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- c(a=1+2i, b=3+4i) ; x["a"] <- "hi" ; x } a b "hi" "3+4i" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- c(a=1+2i, b=3+4i) ; x["a"] <- 10 ; x } a b 10+0i 3+4i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- c(a=1,a=2) ; x["a"] <- 10L ; x } a a 10 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- c(aa=TRUE) ; x["a"] <- list(2L) ; x } $aa [1] TRUE $a [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- c(aa=TRUE) ; x[["a"]] <- list(2L) ; x } $aa [1] TRUE $a $a[[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- c(aa=TRUE,b=FALSE) ; x["a"] <- 2L ; x } aa b a 1 0 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- c(b=2,a=3) ; z <- x ; x["a"] <- 1 ; x } b a 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorMessage# #{ x <- list(1) ; x[[-1]] <- NULL ; x } Error in x[[-1]] <- NULL : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorMessage# #{ x <- list(1) ; x[[-2]] <- NULL ; x } Error in x[[-2]] <- NULL : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(1,2) ; dim(x) <- c(2,1) ; x[2] <- NULL ; x } [[1]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(1,2) ; dim(x) <- c(2,1) ; x[3] <- NULL ; x } [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(1,2) ; dim(x) <- c(2,1) ; x[[2]] <- NULL ; x } [[1]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(1,2) ; dim(x) <- c(2,1) ; x[[3]] <- NULL ; x } [,1] [1,] 1 [2,] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(1,2) ; x[-1] <- NULL ; x } [[1]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(1,2) ; x[0] <- NULL ; x } [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(1,2) ; x[NA] <- NULL ; x } [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorContext# #{ x <- list(1,2) ; x[[0]] <- NULL ; x } Error in x[[0]] <- NULL : attempt to select less than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(1,2) ; x[as.integer(NA)] <- NULL ; x } [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorMessage# #{ x <- list(1,2,3) ; x[[-1]] <- NULL ; x } Error in x[[-1]] <- NULL : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorMessage# #{ x <- list(1,2,3) ; x[[-5]] <- NULL ; x } Error in x[[-5]] <- NULL : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorMessage# #{ x <- list(3,4) ; x[[-10]] <- NULL ; x } Error in x[[-10]] <- NULL : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(3,4) ; x[[-1]] <- NULL ; x } [[1]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(3,4) ; x[[-2]] <- NULL ; x } [[1]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(a=3,b=4) ; x["z"] <- NULL ; x } $a [1] 3 $b [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x <- list(a=3,b=4) ; x[["a"]] <- NULL ; x } $b [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x<-1:2; x[[0-2]]<-100; x } [1] 100 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x<-1:3; x[1]<-100L; x } [1] 100 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x<-1:5; x[2]<-1000; x[3] <- TRUE; x[8]<-3L; x } [1] 1 1000 1 4 5 NA NA 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x<-5:1; x[0-2]<-1000; x } [1] 1000 4 1000 1000 1000 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x<-c(); x[[TRUE]] <- 2; x } [[1]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x<-c(1,2,3); x[2L]<-100; x } [1] 1 100 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x<-c(1,2,3); x[2L]<-100L; x } [1] 1 100 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate# #{ x<-c(1,2,3); x[2]<-FALSE; x } [1] 1 0 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testScalarUpdate#Output.IgnoreErrorContext# #{ x[3] <<- 10 } Error in x[3] <<- 10 : object 'x' not found ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSequenceIntIndexOnVector# #{ x<-c(1,2,3); x[0:3] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSequenceIntIndexOnVector# #{ x<-c(1,2,3); x[1:1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSequenceIntIndexOnVector# #{ x<-c(1,2,3); x[1:2] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSequenceIntIndexOnVector# #{ x<-c(1,2,3); x[1:3] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSequenceIntIndexOnVector# #{ x<-c(1,2,3); x[2:3] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSequenceIntIndexOnVector# #{ x<-c(1L,2L,3L); x[0:3] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSequenceIntIndexOnVector# #{ x<-c(1L,2L,3L); x[1:1] } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSequenceIntIndexOnVector# #{ x<-c(1L,2L,3L); x[1:2] } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSequenceIntIndexOnVector# #{ x<-c(1L,2L,3L); x[1:3] } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSequenceIntIndexOnVector# #{ x<-c(1L,2L,3L); x[2:3] } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ a <- 'hello'; a[[5]] <- 'done'; a[[3]] <- 'muhuhu'; a; } [1] "hello" NA "muhuhu" NA "done" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ a <- 'hello'; a[[5]] <- 'done'; b <- a; b[[3]] <- 'muhuhu'; b; } [1] "hello" NA "muhuhu" NA "done" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ b <- c(11,12) ; b[""] <- 100 ; b } 11 12 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ b <- c(a=1+2i,b=3+4i) ; dim(b) <- c(2,1) ; b[c("a","b")] <- 3+1i ; b } a b 1+2i 3+4i 3+1i 3+1i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ b <- list(1+2i,3+4i) ; dim(b) <- c(2,1) ; b[c("hello","hi")] <- NULL ; b } [[1]] [1] 1+2i [[2]] [1] 3+4i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate#Output.IgnoreErrorContext# #{ f <- function(b, i, v) { b[[i]] <- v ; b } ; f(1+2i,3:1,4:6) ; f(c(X=1L,a=2L),c("X","b",NA),NULL) } Error in `[[<-`(`*tmp*`, i, value = 4:6) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1+2i,3:1,4:6) ; b <- list(1L,2L) ; attr(b,"my") <- 21 ; f(b,c("X","b",NA),NULL) } [[1]] [1] 1 [[2]] [1] 2 attr(,"my") [1] 21 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1+2i,3:1,4:6) ; b <- list(b=1L,2L) ; attr(b,"my") <- 21 ; f(b,c("X","b",NA),NULL) } [[1]] [1] 2 attr(,"my") [1] 21 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1+2i,3:1,4:6) ; b <- list(b=1L,2L) ; attr(b,"my") <- 21 ; f(b,c("ZZ","ZZ",NA),NULL) } $b [1] 1 [[2]] [1] 2 attr(,"my") [1] 21 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1+2i,3:1,4:6) ; f(c(X=1,a=2),c("X","b",NA),c(TRUE,NA)) } X a b 1 2 NA 1 Warning message: In b[i] <- v : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1+2i,3:1,4:6) ; f(c(X=1L,a=2L),c("X","b",NA),c(TRUE,NA,FALSE)) } X a b 1 2 NA 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1+2i,3:1,4:6) ; f(list(X=1L,a=2L),c("X","b",NA),NULL) } $a [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(1:3,"a",4) } a 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(NULL,"a",4) } a 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(NULL,c("a","X"),4:5) } a X 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(as.complex(c(13,14)),as.character(NA),as.complex(23)) } 13+0i 14+0i 23+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(as.complex(c(13,14)),c("","",""),as.complex(23)) } 13+0i 14+0i 23+0i 23+0i 23+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(as.complex(c(13,14)),c("","",NA),as.complex(23)) } 13+0i 14+0i 23+0i 23+0i 23+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(as.complex(c(13,14)),character(),as.complex(23)) } [1] 13+0i 14+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(as.raw(11:13),c("a","X"),list(3,TRUE)) } [[1]] [1] 0b [[2]] [1] 0c [[3]] [1] 0d $a [1] 3 $X [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(as.raw(c(13,14)),c("a","X","a"),as.raw(23)) } a X 0d 0e 17 17 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(as.raw(c(13,14)),c("a","X","a"),c(3,TRUE,FALSE)) } Error in b[i] <- v : incompatible types (from double to raw) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(c(1,a=2),c("a","X","a"),list(3,TRUE,FALSE)) } [[1]] [1] 1 $a [1] FALSE $X [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(c(X=1,a=2),c("X","b",NA),1:3) } X a b 1 2 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(c(X=1,a=2),c("X","b",NA),as.complex(10)) } X a b 10+0i 2+0i 10+0i 10+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(c(X=1,a=2),c("X","b",NA),as.raw(10)) } Error in b[i] <- v : incompatible types (from raw to double) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(c(X=1,a=2),c("X","b",NA),list(3,TRUE,FALSE)) } $X [1] 3 $a [1] 2 $b [1] TRUE $ [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(c(X=1,a=2),c("a","X","a"),list(3,TRUE,FALSE)) } $X [1] TRUE $a [1] FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(c(X=1,a=2),c("a","X","a","b"),list(3,TRUE,FALSE)) } $X [1] TRUE $a [1] FALSE $b [1] 3 Warning message: In b[i] <- v : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(double(),c("a","X"),4:5) } a X 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testStringUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,3:1,4:6) ; f(double(),c("a","X"),list(3,TRUE)) } $a [1] 3 $X [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSuperUpdate# #{ x <- 1:3 ; f <- function() { x[2] <- 10 ; x[2] <<- 100 ; x[2] <- 1000 } ; f() ; x } [1] 1 100 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testSuperUpdate# #{ x <- 1:3 ; f <- function() { x[2] <<- 100 } ; f() ; x } [1] 1 100 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testUpdateOther# #{ a <- c(TRUE, FALSE); b <- c(a=3, b=4); a[b] <- c(TRUE, FALSE); a } [1] TRUE FALSE TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testUpdateOther# #{ f <- function(a, i1, i2) {a[i1, i2]}; a <- rep(c('1'),14); dim(a) <- c(2,7); dimnames(a) <- list(c('a','b'), rep('c',7)); temp <- f(a,,1); dimnames(a) <- list(NULL, rep('c',7)); f(a,,1) } [1] "1" "1" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testUpdateOther# #{ x<-as.pairlist(list(7,42)); x[character(0)]<-list(); typeof(x) } [1] "list" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testUpdateOther# #{ x<-c(1,2); f<-function() { x<-c(100, 200); x[1]<-4; print(x) } ; f(); x } [1] 4 200 [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testUpdateOther# #{ x<-c(1,2); f<-function() { x<-c(100, 200); x[1]<<-4; print(x) } ; f(); x } [1] 100 200 [1] 4 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testUpdateOther# #{ x<-expression(y, z, 7 + 42); x[character(0)]<-list(); typeof(x) } [1] "expression" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testUpdateOther# #{ x<-quote(foo(42)); x[character(0)]<-list(); typeof(x) } [1] "language" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# # { f <- function(b,i) { b[i] } ; f(c(a=1,b=2,c=3), c(TRUE,NA)) } a c 1 NA 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ (1:5)[3:4] } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorContext# #{ a <- c(1,2,3) ; x <- integer() ; a[[x]] } Error in a[[x]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ a <- c(1,2,3) ; x <- integer() ; a[x] } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b) { b[integer()] } ; f(c(TRUE,FALSE,TRUE)) ; f(f) } Error in b[integer()] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[[i]] } ; f(list(1,list(2)),c(2,1)) ; f(1:3,list(1)) } Error in b[[i]] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3, c("h","hi")) ; f(1:3,TRUE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3, c("h","hi")) ; f(function(){3},"hi") } Error in b[i] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3, c(TRUE,FALSE)) ; f(f, c(TRUE,NA)) } Error in b[i] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3, c(TRUE,FALSE,NA)) } [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3, c(TRUE,FALSE,NA,NA,NA)) } [1] 1 NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3, c(TRUE,FALSE,TRUE)) ; f(1:3,3:1) } [1] 3 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3, c(TRUE,FALSE,TRUE)) ; f(c(a=1,b=2,c=3),3:1) } c b a 3 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3, c(TRUE,FALSE,TRUE)) ; f(function(){2},3:1) } Error in b[i] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3, logical()) } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3,c(2,1)) ; f(1:3,NULL) } integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3,c(2,1)) ; f(1:3,as.raw(c(10,11))) } Error in b[i] : invalid subscript type 'raw' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(1:3,c(2,1)) ; f(1:3,c(TRUE,FALSE)) } [1] 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(c(1,2,3), c("hello","hi")) } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(c(1,2,3), character()) } numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(c(a=1,b=2,c=3), c(TRUE,NA,FALSE,FALSE,TRUE)) } a 1 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(c(a=1,b=2,c=3), character()) } named numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; f(c(a=1L,b=2L,c=3L), logical()) } named integer(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(b,i) { b[i] } ; x <- c(1+2i,3+4i,5+6i) ; f(x,c(1,2)) ; f(x,c(1+2i)) } Error in b[i] : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorMessage# #{ f <- function(i) { l[[i]] } ; l <- list(1, 1:3) ; f(c(2,-4)) } Error in l[[i]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(i) { l[[i]] } ; l <- list(1, 1:3) ; f(c(2,NA)) } Error in l[[i]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorMessage# #{ f <- function(i) { l[[i]] } ; l <- list(1, 2) ; f(c(2,-1)) } Error in l[[i]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(i) { l[[i]] } ; l <- list(1, as.list(1:3)) ; f(c(2,NA)) } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(i) { l[[i]] } ; l <- list(1, c(2,3)) ; f(c(2,-1)) } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f <- function(i) { l[[i]] } ; l <- list(1, c(2,3)) ; f(c(2,-2)) } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorMessage# #{ f <- function(i) { l[[i]] } ; l <- list(1, c(2,3)) ; f(c(2,-4)) } Error in l[[i]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorContext# #{ f <- function(i) { l[[i]] } ; l <- list(1, c(2,3)) ; f(c(2,0)) } Error in l[[i]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorMessage# #{ f <- function(i) { l[[i]] } ; l <- list(1, f) ; f(c(2,1)) } Error in f(c(2, 1)) : invalid type/length (closure/1) in vector allocation ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f<-function(i) { x<-1:5 ; x[i] } ; f(1) ; f(3:4) } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f<-function(i) { x<-1:5 ; x[i] } ; f(1) ; f(1L) ; f(TRUE) } [1] 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f<-function(i) { x<-1:5 ; x[i] } ; f(1) ; f(TRUE) ; f(1L) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f<-function(i) { x<-1:5 ; x[i] } ; f(1) ; f(TRUE) ; f(c(3,2)) } [1] 3 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f<-function(i) { x<-1:5 ; x[i] } ; f(c(TRUE,FALSE)) ; f(3:4) } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f<-function(x, i) { x[i] } ; f(1:3,0-3) ; f(1:5,c(0,0,0,0-2)) } [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f<-function(x, i) { x[i] } ; f(1:3,0L-3L) ; f(1:5,c(0,0,0,0-2)) } [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f<-function(x, i) { x[i] } ; f(1:3,3:1) ; f(1:5,c(0,0,0,0-2)) } [1] 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f<-function(x,l) { x[l == 3] <- 4 } ; f(c(1,2,3), c(1,2,3)) ; f(c(1,2,3), 1:3) ; f(1:3, c(3,3,2)) } ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ f<-function(x,l) { x[l == 3] } ; f(c(1,2,3), c(1,2,3)) ; f(c(1,2,3), 1:3) ; f(1:3, c(3,3,2)) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ l <- list(1,2) ; l[[c(1,1,2,3,4,3)]] } Error in l[[c(1, 1, 2, 3, 4, 3)]] : recursive indexing failed at level 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ l <- list(1,NULL) ; f <- function(i) { l[[i]] } ; f(c(2,1)) } Error in l[[i]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ l <- list(1,function(){3}) ; f <- function(i) { l[[i]] } ; f(c(2)) } function(){3} ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ l <- list(1,list(2)) ; f <- function(i) { l[[i]] } ; f(c(2,1)) ; f(1) } [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorContext# #{ l <- list(1,list(2)) ; l[[integer()]] } Error in l[[integer()]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ l <- list(list(1,2),2) ; l[[c(1,1,2,3,4,3)]] } Error in l[[c(1, 1, 2, 3, 4, 3)]] : recursive indexing failed at level 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- "hi"; y<-c(1,1) ; x[y] } [1] "hi" "hi" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- 1+2i; y<-c(1,2) ; x[y] } [1] 1+2i NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorMessage# #{ x <- 1:2; x[[list()]] } Error in x[[list()]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorMessage# #{ x <- 1:2; x[[list(-0,-1)]] } Error in x[[list(-0, -1)]] : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- 1:2; x[[list(0)]] } Error in x[[list(0)]] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- 1:3; x[function(){3}] } Error in x[function() { : invalid subscript type 'closure' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- 1:3; x[list(2,3)] } Error in x[list(2, 3)] : invalid subscript type 'list' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- 1; y<-c(1,1) ; x[y] } [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- 1L; y<-c(1,1) ; x[y] } [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- TRUE; y<-c(1,1) ; x[y] } [1] TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1+2i,3+4i,5+6i) ; x[2:3] } [1] 3+4i 5+6i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1+2i,3+4i,5+6i) ; x[c(-2,-3,-4,-5)] } [1] 1+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1+2i,3+4i,5+6i) ; x[c(-2,-3,-4,-5,-2)] } [1] 1+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1+2i,3+4i,5+6i) ; x[c(-2,-3,-4,-5,-5)] } [1] 1+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1+2i,3+4i,5+6i) ; x[c(-2,-3,NA)] } Error in x[c(-2, -3, NA)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1+2i,3+4i,5+6i) ; x[c(-2,3,NA)] } Error in x[c(-2, 3, NA)] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1+2i,3+4i,5+6i) ; x[c(2,3,NA)] } [1] 3+4i 5+6i NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1,2,3) ; x[-1:2] } Error in x[-1:2] : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1,2,3,2) ; x[c(3,4,2)==2] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1,2,3,2) ; x[c(3,4,2,NA)==2] } [1] 3 NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(1,2,3,2) ; x[x==2] } [1] 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(TRUE,FALSE,TRUE) ; x[2:3] } [1] FALSE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(TRUE,FALSE,TRUE) ; x[integer()] } logical(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorContext# #{ x <- c(a=1,b=2) ; x[[c("a","a")]] } Error in x[[c("a", "a")]] : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(a=1,b=2,c=3,d=4) ; f <- function(s) { x[c(s,s)] } ; f(TRUE) ; f(1L) ; f("b") } b b 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(a=1,b=2,c=3,d=4) ; f <- function(s) { x[s] } ; f(TRUE) ; f(1L) ; f("b") } b 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(a=1,b=2,c=3,d=4) ; x[c("b","b","d","a","a")] } b b d a a 2 2 4 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(a=1,b=2,c=3,d=4) ; x[character()] } named numeric(0) ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(a=1,x=2,b=3,y=2) ; x[c(3,4,2)==2] } b 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(a=1,x=2,b=3,y=2) ; x[c(3,4,2,1)==2] } b 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Ignored.ReferenceError# #{ x <- c(a=as.raw(10),b=as.raw(11),c=as.raw(12),d=as.raw(13)) ; f <- function(s) { x[c(s,s)] } ; f(TRUE) ; f(1L) ; f(as.character(NA)) } 00 00 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Ignored.ReferenceError# #{ x <- c(a=as.raw(10),b=as.raw(11),c=as.raw(12),d=as.raw(13)) ; f <- function(s) { x[s] } ; f(TRUE) ; f(1L) ; f(as.character(NA)) } 00 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(as.double(1:2000)) ; sum(x[rep(3, 2000)==3]) } [1] 2001000 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(as.double(1:2000)) ; x[c(1,3,3,3,1:1996)==3] } [1] 2 3 4 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- c(as.double(1:2000)) ; x[c(NA,3,3,NA,1:1996)==3] } [1] NA 2 3 NA 7 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- function(){3} ; x[3:2] } Error in x[3:2] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(1,2) ; x[[c("a","a")]] } Error in x[[c("a", "a")]] : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(1,2,list(3)) ; x[[c(3,1)]] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(1,2,list(3)) ; x[[c(3,NA)]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(1,2,list(3)) ; x[[c(4,1)]] } Error in x[[c(4, 1)]] : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(1,2,list(3)) ; x[[c(NA,1)]] } Error in x[[c(NA, 1)]] : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(1,list(3)) ; x[[c(-1,1)]] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(a=1,b=1:3) ; f <- function(i) { x[[i]] } ; f(c(2,2)) ; f(2+3i) } Error in x[[i]] : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(a=1,b=1:3) ; f <- function(i) { x[[i]] } ; f(c(2,2)) ; x <- f ; f(2+3i) } Error in x[[i]] : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(a=1,b=1:3) ; x[[2+3i]] } Error in x[[2 + (0+3i)]] : invalid subscript type 'complex' ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(a=1,b=1:3) ; x[[c("b","a")]] } Error in x[[c("b", "a")]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(a=1,b=2,d=list(x=3)) ; f <- function(i) { x[[i]] } ; f(c("d","x")) ; f("b") } [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(a=1,b=2,d=list(x=3)) ; x[[c("d","x")]] } [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(a=1,b=2,d=list(x=3)) ; x[[c("d",NA)]] } NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(a=1,b=2,d=list(x=3)) ; x[[c("z","x")]] } Error in x[[c("z", "x")]] : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(a=1,b=2,d=list(x=3)) ; x[[c("z",NA)]] } Error in x[[c("z", NA)]] : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x <- list(a=1,b=2,d=list(x=3)) ; x[[c(NA,"x")]] } Error in x[[c(NA, "x")]] : no such index at level 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorContext# #{ x <- list(a=1,b=2,d=list(x=3)) ; x[[character()]] } Error in x[[character()]] : attempt to select less than one element in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorMessage# #{ x <- list(a=1,b=function(){3},d=list(x=3)) ; f <- function(i) { x[[i]] } ; f(c("d","x")) ; f(c("b","z")) } Error in x[[i]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorMessage# #{ x <- list(a=1,b=function(){3},d=list(x=3)) ; x[[c(2,-3)]] } Error in x[[c(2, -3)]] : invalid negative subscript in get1index ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex#Output.IgnoreErrorMessage# #{ x <- list(a=1,b=function(){3},d=list(x=3)) ; x[[c(2,10)]] } Error in x[[c(2, 10)]] : subscript out of bounds ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-(1:5)[2:4] ; x[2:1] } [1] 3 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-1:5 ; x[3:4] } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-1:5 ; x[4:3] } [1] 4 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-1:5 ; x[c(TRUE,FALSE)] } [1] 1 3 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-1:5 ; x[c(TRUE,TRUE,TRUE,FALSE,FALSE,FALSE,FALSE,TRUE,NA)] } [1] 1 2 3 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-1:5 ; x[c(TRUE,TRUE,TRUE,NA)] } [1] 1 2 3 NA 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-1:5;x[c(0-2,0-3)] } [1] 1 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-1:5;x[c(0-2,0-3,0,0,0)] } [1] 1 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-1:5;x[c(2,5,4,3,3,3,0)] } [1] 2 5 4 3 3 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-1:5;x[c(2L,5L,4L,3L,3L,3L,0L)] } [1] 2 5 4 3 3 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-as.complex(c(1,2,3,4)) ; x[2:4] } [1] 2+0i 3+0i 4+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-as.raw(c(1,2,3,4)) ; x[2:4] } [1] 02 03 04 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-c(1,2) ; names(x) <- c("a","b") ; x[c(FALSE,TRUE)] } b 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-c(1,2) ; names(x) <- c("a","b") ; x[c(FALSE,TRUE,NA,FALSE)] } b 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-c(1,2,3,4) ; names(x) <- c("a","b","c","d") ; x[c(-2,-4,0)] } a c 1 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-c(1,2,3,4) ; names(x) <- c("a","b","c","d") ; x[c(10,2,3)] } b c NA 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-c(1,2,3,4) ; names(x) <- c("a","b","c","d") ; x[c(10,2,3,0)] } b c NA 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorIndex# #{ x<-c(1,2,3,4,5) ; x[4:3] } [1] 4 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# # { f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3, 1:2, f) } Error in b[i] <- v : incompatible types (from closure to integer) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# # { f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,2,3),c(TRUE,FALSE,TRUE),5:6) ; f(3:5, c(FALSE,TRUE,TRUE), c(NA,FALSE)) } [1] 3 NA 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a <- c(1,2,3) ; b <- a; a[1] <- 4L; a } [1] 4 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a <- c(1,2,3) ; b <- a; a[2] <- 4L; a } [1] 1 4 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a <- c(1,2,3) ; b <- a; a[3] <- 4L; a } [1] 1 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a <- c(2.1,2.2,2.3); b <- a; a[[2]] <- TRUE; a } [1] 2.1 1.0 2.3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a <- c(2.1,2.2,2.3); b <- a; a[[3]] <- TRUE; a } [1] 2.1 2.2 1.0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a <- c(TRUE,TRUE,TRUE); b <- a; a[[1]] <- FALSE; a } [1] FALSE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a <- c(TRUE,TRUE,TRUE); b <- a; a[[2]] <- FALSE; a } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a <- c(TRUE,TRUE,TRUE); b <- a; a[[3]] <- FALSE; a } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a = c(1, 2); a[['a']] = 67; a; } a 1 2 67 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a = c(a=1,2,3); a[['x']] = 67; a; } a x 1 2 3 67 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a<- c('a','b','c','d'); a[3:4] <- c(4,5); a} [1] "a" "b" "4" "5" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a<- c('a','b','c','d'); a[3:4] <- c(4L,5L); a} [1] "a" "b" "4" "5" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ a<- c('a','b','c','d'); a[3:4] <- c(TRUE,FALSE); a} [1] "a" "b" "TRUE" "FALSE" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- 1:3 ; b[c(3,2)] <- list(TRUE,10) ; b } [[1]] [1] 1 [[2]] [1] 10 [[3]] [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- 1:3 ; b[integer()] <- 3:5 ; b } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- 1:3 ; dim(b) <- c(1,3) ; b[integer()] <- 3:5 ; b } [,1] [,2] [,3] [1,] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- 1:4 ; b[c(3,2)] <- c(NA,NA) ; b } [1] 1 NA NA 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate#Output.IgnoreErrorContext# #{ b <- 3:4 ; b[[c(NA,1)]] <- c(2,10) ; b } Error in b[[c(NA, 1)]] <- c(2, 10) : attempt to select more than one element in integerOneIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- 3:4 ; b[c(0,1)] <- c(2,10,11) ; b } [1] 2 4 Warning message: In b[c(0, 1)] <- c(2, 10, 11) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- 3:4 ; b[c(3,2)] <- c("X","xx") ; b } [1] "3" "xx" "X" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- 3:4 ; b[c(3,2)] <- c(1+2i,3+4i) ; b } [1] 3+0i 3+4i 1+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- 3:4 ; b[c(NA)] <- c(2,7) ; b } Error in b[c(NA)] <- c(2, 7) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- 3:4 ; b[c(NA,1)] <- c(2,10) ; b } Error in b[c(NA, 1)] <- c(2, 10) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.list(3:5) ; dim(b) <- c(1,3) ; b[c(FALSE,FALSE,FALSE)] <- NULL ; b } [,1] [,2] [,3] [1,] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.list(3:5) ; dim(b) <- c(1,3) ; b[c(FALSE,TRUE,NA)] <- NULL ; b } [[1]] [1] 3 [[2]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.list(3:6) ; dim(b) <- c(1,4) ; b[c(FALSE,FALSE)] <- NULL ; b } [,1] [,2] [,3] [,4] [1,] 3 4 5 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.list(3:6) ; dim(b) <- c(1,4) ; b[c(FALSE,FALSE,TRUE)] <- NULL ; b } [[1]] [1] 3 [[2]] [1] 4 [[3]] [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.list(3:6) ; dim(b) <- c(4,1) ; b[c(TRUE,FALSE)] <- NULL ; b } [[1]] [1] 4 [[2]] [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.list(3:6) ; names(b) <- c("X","Y","Z","Q") ; b[c(FALSE,FALSE)] <- NULL ; b } $X [1] 3 $Y [1] 4 $Z [1] 5 $Q [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.list(3:6) ; names(b) <- c("X","Y","Z","Q") ; b[c(TRUE,FALSE)] <- NULL ; b } $Y [1] 4 $Q [1] 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.raw(11:13) ; b[c(3,2)] <- 2 ; b } Error in b[c(3, 2)] <- 2 : incompatible types (from double to raw) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.raw(11:13) ; b[c(3,2)] <- as.raw(2) ; b } [1] 0b 02 02 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.raw(11:13) ; b[c(3,2)] <- list(2) ; b } [[1]] [1] 0b [[2]] [1] 2 [[3]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- as.raw(1:5) ; b[c(TRUE,FALSE,TRUE)] <- c(1+2i,3+4i) ; b } Error in b[c(TRUE, FALSE, TRUE)] <- c(1 + (0+2i), 3 + (0+4i)) : incompatible types (from complex to raw) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; attr(b,"my") <- 211 ; b[c(FALSE,TRUE)] <- c("X") ; b } [1] "a" "X" "c" attr(,"my") [1] 211 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; b[c(FALSE,NA,NA)] <- c("X","y") ; b } Error in b[c(FALSE, NA, NA)] <- c("X", "y") : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; b[c(FALSE,TRUE,TRUE)] <- c("X","y","z") ; b } [1] "a" "X" "y" Warning message: In b[c(FALSE, TRUE, TRUE)] <- c("X", "y", "z") : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; b[c(TRUE,FALSE)] <- "X" ; b } [1] "X" "b" "X" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; b[c(TRUE,FALSE,NA)] <- "X" ; b } [1] "X" "b" "c" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; b[c(TRUE,FALSE,TRUE)] <- c(1+2i,3+4i) ; b } [1] "1+2i" "b" "3+4i" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; b[c(TRUE,FALSE,TRUE,NA)] <- "X" ; b } [1] "X" "b" "X" NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; b[c(TRUE,FALSE,TRUE,TRUE)] <- "X" ; b } [1] "X" "b" "X" "X" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; b[c(TRUE,TRUE,TRUE)] <- rev(as.character(b)) ; b } [1] "c" "b" "a" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; b[is.na(b)] <- c("X","z") ; b } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; b[logical()] <- "X" ; b } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; x <- b ; b[c(FALSE,TRUE,NA)] <- c("X","z") ; b } Error in b[c(FALSE, TRUE, NA)] <- c("X", "z") : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("a","b","c") ; x <- b ; b[c(FALSE,TRUE,TRUE)] <- c("X","z") ; b } [1] "a" "X" "z" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c("hello","hi") ; b[c(3,2)] <- c(2,3) ; b } [1] "hello" "3" "2" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1+2i,3+4i) ; b[c(3,2)] <- 5:6 ; b } [1] 1+2i 6+0i 5+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; x <- as.double(NA) ; attr(x,"my") <- 2 ; b[c(1,NA,2)==2] <- x ; b } [1] 1 2 NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; x <- c(2,2,-1) ; b[x==2] <- c(10,11,5) ; b } [1] 10 11 5 Warning message: In b[x == 2] <- c(10, 11, 5) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; x <- c(2,2,NA) ; b[x==2] <- c(10,11,3) ; b } Error in b[x == 2] <- c(10, 11, 3) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; attr(b,"my") <- 10 ; b[integer()] <- NULL ; b } [1] 1 2 5 attr(,"my") [1] 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; b[c(0,3,5)] <- NULL ; b } Error in b[c(0, 3, 5)] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; b[c(1)] <- NULL ; b } Error in b[c(1)] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; b[c(TRUE,FALSE,FALSE)] <- NULL ; b } Error in b[c(TRUE, FALSE, FALSE)] <- NULL : replacement has length zero ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; b[c(TRUE,FALSE,TRUE)] <- list(TRUE,1+2i) ; b } [[1]] [1] TRUE [[2]] [1] 2 [[3]] [1] 1+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; b[c(TRUE,NA,TRUE)] <- list(TRUE,1+2i) ; b } Error in b[c(TRUE, NA, TRUE)] <- list(TRUE, 1 + (0+2i)) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; b[integer()] <- NULL ; b } [1] 1 2 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,2,5) ; b[logical()] <- NULL ; b } [1] 1 2 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,4,5) ; x <- c(2,2) ; b[x==2] <- c(10,11) ; b } [1] 10 11 10 Warning message: In b[x == 2] <- c(10, 11) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,4,5) ; x <- c(2,8,2) ; b[x==2] <- c(10,11) ; b } [1] 10 4 11 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(1,4,5) ; z <- b ; x <- c(2,8,2) ; b[x==2] <- c(10,11) ; b } [1] 10 4 11 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,FALSE) ; b[c(3,2)] <- 5:6 ; b } [1] 1 6 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,FALSE,FALSE,TRUE) ; b[b] <- c(TRUE,FALSE) ; b } [1] TRUE FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE) ; b[c(3,2)] <- FALSE ; b } [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE) ; b[c(TRUE,FALSE,TRUE,TRUE)] <- c(FALSE,NA,NA) ; b } [1] FALSE NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE) ; b[c(TRUE,TRUE)] <- c(FALSE,NA) ; b } [1] FALSE NA FALSE Warning message: In b[c(TRUE, TRUE)] <- c(FALSE, NA) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE,TRUE) ; attr(b,"my") <- 10 ; b[c(TRUE,FALSE,TRUE,NA)] <- FALSE ; b } [1] FALSE NA FALSE TRUE attr(,"my") [1] 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE,TRUE) ; b[c(TRUE,FALSE)] <- c(FALSE,NA) ; b } [1] FALSE NA NA TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE,TRUE) ; b[c(TRUE,FALSE,FALSE)] <- c(FALSE,NA) ; b } [1] FALSE NA FALSE NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE,TRUE) ; b[c(TRUE,FALSE,TRUE,FALSE)] <- b ; b } [1] TRUE NA NA TRUE Warning message: In b[c(TRUE, FALSE, TRUE, FALSE)] <- b : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE,TRUE) ; b[c(TRUE,FALSE,TRUE,NA)] <- FALSE ; b } [1] FALSE NA FALSE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE,TRUE) ; b[c(TRUE,NA)] <- c(FALSE,NA) ; b } Error in b[c(TRUE, NA)] <- c(FALSE, NA) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE,TRUE) ; b[logical()] <- c(FALSE,NA) ; b } [1] TRUE NA FALSE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- c(TRUE,NA,FALSE,TRUE) ; z <- b ; b[c(TRUE,FALSE,TRUE,NA)] <- FALSE ; b } [1] FALSE NA FALSE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,3) ; attr(b,"my") <- 12; b[2:3] <- NULL ; b } [[1]] [1] 1 attr(,"my") [1] 12 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,3) ; attr(b,"my") <- 12; b[2] <- NULL ; b } [[1]] [1] 1 [[2]] [1] 3 attr(,"my") [1] 12 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; b[c(-1,-4,-5,-1,-5)] <- NULL ; b } [[1]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; b[c(-1,1)] <- NULL ; b } Error in b[c(-1, 1)] <- NULL : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; b[c(-1,NA)] <- NULL ; b } Error in b[c(-1, NA)] <- NULL : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; b[c(0,-1)] <- NULL ; b } [[1]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; b[c(1,1,0,NA,5,5,7)] <- NULL ; b } [[1]] [1] 2 [[2]] [1] 5 [[3]] NULL [[4]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; b[c(1,1,5)] <- NULL ; b } [[1]] [1] 2 [[2]] [1] 5 [[3]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; b[c(1,NA)] <- NULL ; b } [[1]] [1] 2 [[2]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; dim(b) <- c(1,3) ; b[c(-10,-20,0)] <- NULL ; b } list() ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; dim(b) <- c(1,3) ; b[c(0,-1)] <- NULL ; b } [[1]] [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; dim(b) <- c(1,3) ; b[c(0,0)] <- NULL ; b } [,1] [,2] [,3] [1,] 1 2 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; dim(b) <- c(1,3) ; b[c(0,0,-1,-2,-3)] <- NULL ; b } [,1] [,2] [,3] [1,] 1 2 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; dim(b) <- c(1,3) ; b[c(0,3,5)] <- NULL ; b } [[1]] [1] 1 [[2]] [1] 2 [[3]] NULL ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(1,2,5) ; dim(b) <- c(1,3) ; b[c(TRUE,FALSE,TRUE)] <- list(TRUE,1+2i) ; b } [,1] [,2] [,3] [1,] TRUE 2 1+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ b <- list(x=1,y=2,z=5) ; b[c(0,-1)] <- NULL ; b } $x [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ buf <- character() ; buf[[1]] <- "hello" ; buf[[3]] <- "world" ; buf } [1] "hello" NA "world" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ buf <- double() ; buf[[1]] <- 23 ; buf } [1] 23 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ buf <- integer() ; buf[[1]] <- 4L ; buf } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate#Ignored.Unimplemented# #{ f <- function(a) { a }; x<-1:5 ; x[x[4]<-2] <- ({x[4]<-100; f(x)[4]}) ; x } [1] 1 100 3 100 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate#Output.ImprovedErrorContext# #{ f <- function(b, i, v) { b[[i]] <- v ; b } ; f(c(1,2,3),c(TRUE,FALSE,TRUE),5:6) ; f(3:5, c(FALSE,NA), 4:5) } Error in `[[<-`(`*tmp*`, i, value = 5:6) : attempt to select more than one element in vectorIndex ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2, seq(1L,-8L,-2L),c(TRUE,FALSE,NA)) } Error in b[i] <- v : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2, seq(1L,6L,2L),c(TRUE,FALSE,NA)) } [1] 1 2 0 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(1:2,1:2,c(3,4)) ; f(1:8, c(1L,4L,7L), c(10,100,1000)) } [1] 10 2 3 100 5 6 1000 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(1:2,1:2,c(3,4)) ; f(1:8, seq(1L,7L,3L), c(10,100,1000)) } [1] 10 2 3 100 5 6 1000 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(1:2,1:2,c(3,4)) ; f(c(3,4), 1:2, c("hello","hi")) } [1] "hello" "hi" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(1:2,1:2,c(3,4)) ; f(c(3,4), 1:2, c(NA,NA)) } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(1:2,1:2,c(3,4)) ; f(c(3,4,8), -1:-2, 10) } [1] 3 4 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(1:2,1:2,c(3,4)) ; f(c(3,4,8), 1:2, list(3,TRUE)) } [[1]] [1] 3 [[2]] [1] TRUE [[3]] [1] 8 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(1:2,1:2,c(3,4)) ; f(c(3,4,8), 3:4, 10) } [1] 3 4 10 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(1:2,1:2,c(3,4)) ; f(c(TRUE,FALSE,NA), 1:2, c(FALSE,TRUE)) } [1] FALSE TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(1:2,1:2,c(3,4)) ; z <- f(1:8, c(1L,4L,7L), list(10,100,1000)) ; sum(as.double(z)) } [1] 1134 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(1:2,1:2,c(3,4)) ; z <- f(1:8, seq(1L,7L,3L), list(10,100,1000)) ; sum(as.double(z)) } [1] 1134 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); f(f, 1:2, 1:3) } Error in b[i] <- v : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); l <- c(3,5L) ; dim(l) <- c(2,1) ; f(5:6,1:2,c(3,4)) ; f(l, 1:2, c(3,TRUE)) } [,1] [1,] 3 [2,] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); l <- list(3,5L) ; dim(l) <- c(2,1) ; f(5:6,1:2,c(3,4)) ; f(l, 1:2, list(3,TRUE)) } [,1] [1,] 3 [2,] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); l <- list(3,5L) ; dim(l) <- c(2,1) ; f(5:6,1:2,c(3,4)) ; f(list(3,TRUE), 1:2, l) } [[1]] [1] 3 [[2]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:2,1:2,3:4); l <- list(3,5L) ; dim(l) <- c(2,1) ; f(5:6,1:2,c(3,4)) ; m <- c(3,TRUE) ; dim(m) <- c(1,2) ; f(m, 1:2, l) } [[1]] [1] 3 [[2]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3, 1:2, 3:4); f(3:4, 2:1, c(NA,FALSE)) } [1] 0 NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3, 1:2, 3:4); f(c(TRUE,FALSE), 2:1, 1:2) } [1] 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; f(3:5, c(FALSE,TRUE,TRUE), 4:6) } [1] 3 4 5 Warning message: In b[i] <- v : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; f(3:5, c(FALSE,TRUE,TRUE), c(NA,FALSE)) } [1] 3 NA 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; f(c("a","XX","b"), c(FALSE,TRUE,TRUE), 21:22) } [1] "a" "21" "22" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; f(c(10,12,3), c(FALSE,TRUE,TRUE), c("hi",NA)) } [1] "10" "hi" NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; f(c(10,12,3), c(FALSE,TRUE,TRUE), c(1+2i,10)) } [1] 10+0i 1+2i 10+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; f(c(3+4i,5+6i), c(FALSE,TRUE,TRUE), c("hi",NA)) } [1] "3+4i" "hi" NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; f(c(3+4i,5+6i), c(FALSE,TRUE,TRUE), c(NA,1+10i)) } [1] 3+ 4i NA 1+10i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; f(c(TRUE,FALSE), c(FALSE,TRUE,TRUE), c(NA,2L)) } [1] 1 NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; f(c(TRUE,TRUE,FALSE), c(FALSE,TRUE,TRUE), c(TRUE,NA)) } [1] TRUE TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; x <- 10:12 ; dim(x) <- c(1,3) ; f(x, c(FALSE,TRUE,TRUE), as.raw(21:22)) } Error in b[i] <- v : incompatible types (from raw to integer) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; x <- as.raw(10:12) ; dim(x) <- c(1,3) ; f(x, c(FALSE,TRUE,TRUE), 21:22) } Error in b[i] <- v : incompatible types (from integer to raw) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; x <- as.raw(10:12) ; dim(x) <- c(1,3) ; f(x, c(FALSE,TRUE,TRUE), as.raw(21:22)) } [,1] [,2] [,3] [1,] 0a 15 16 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:3,c(TRUE,FALSE,TRUE),5:6) ; x <- list(1,2,5) ; dim(x) <- c(1,3) ; f(x, c(FALSE,TRUE,TRUE), list(TRUE,1+2i)) } [,1] [,2] [,3] [1,] 1 TRUE 1+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(1:5, seq(1L,6L,2L),c(TRUE,FALSE,NA)) } [1] 1 2 0 4 NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(as.character(-3:3),c(1L,4L,7L),c("A","a","XX")) } [1] "A" "-2" "-1" "a" "1" "2" "XX" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(as.character(-3:3),seq(1L,7L,3L),c("A","a","XX")) } [1] "A" "-2" "-1" "a" "1" "2" "XX" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(as.double(1:5), c(7L,4L,1L),c(TRUE,FALSE,NA)) } [1] NA 2 3 0 5 NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(as.double(1:5), seq(1L,6L,2L),c(TRUE,FALSE,NA)) } [1] 1 2 0 4 NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(as.double(1:5), seq(7L,1L,-3L),c(TRUE,FALSE,NA)) } [1] NA 2 3 0 5 NA 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(as.logical(-3:3),c(1L,4L,7L),c(TRUE,NA,FALSE)) } [1] TRUE TRUE TRUE NA TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(as.logical(-3:3),seq(1L,7L,3L),c(TRUE,NA,FALSE)) } [1] TRUE TRUE TRUE NA TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(as.raw(10:11), 1:2, c(10+1i, 11)) } Error in b[i] <- v : incompatible types (from complex to raw) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(as.raw(1:3), 1:2, as.raw(40:41)) } [1] 28 29 03 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c("a","b"),2:1,1+2i) } [1] "1+2i" "1+2i" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c("hello","hi","X"), -1:-2, "ZZ") } [1] "hello" "hi" "ZZ" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c("hello","hi","X"), 1:2, c("ZZ","xx")) ; f(1:4,1:2,NA) } [1] NA NA 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c("hello","hi","X"), 1:2, c("ZZ","xx")) ; f(as.character(1:2),1:2,NA) } [1] NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c("hello","hi","X"), 3:4, "ZZ") } [1] "hello" "hi" "ZZ" "ZZ" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1+2i,2+3i), 1:2, as.raw(10:11)) } Error in b[i] <- v : incompatible types (from raw to complex) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1+2i,2+3i), 1:2, c(10+1i,2+4i)) } [1] 10+1i 2+4i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,2,3),c(TRUE,FALSE,TRUE),5:6) ; f(3:5, c(FALSE,NA), 4) } [1] 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,2,3),c(TRUE,FALSE,TRUE),5:6) ; f(3:5, c(FALSE,NA), 4:5) } Error in b[i] <- v : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,2,3),c(TRUE,FALSE,TRUE),5:6) ; f(3:5, c(FALSE,TRUE,TRUE), 4:6) } [1] 3 4 5 Warning message: In b[i] <- v : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,3,10), c(2L,4L),c(TRUE,FALSE)) } [1] 1 1 10 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,3,10), seq(2L,4L,2L),c(TRUE,FALSE)) } [1] 1 1 10 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,3,10),-1:0,c(TRUE,FALSE)) } [1] 1 1 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,3,10),1:2,1+2i) } [1] 1+2i 1+2i 10+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,3,10),1:2,c(3,NA)) } [1] 3 NA 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,3,10),1:2,c(3L,NA)) } [1] 3 NA 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,3,10),1:2,c(TRUE,FALSE)) ; f(c(10,4), 2:1, as.raw(10)) } Error in b[i] <- v : incompatible types (from raw to double) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,3,10),1:2,c(TRUE,FALSE)) ; f(c(10L,4L), 2:1, 1+2i) } [1] 1+2i 1+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1,3,10),1:2,c(TRUE,FALSE)) } [1] 1 0 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1L,3L,10L),1:2,c(TRUE,FALSE)) ; f(c(10,4), 2:1, 1+2i) } [1] 1+2i 1+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1L,3L,10L),1:2,c(TRUE,FALSE)) ; f(c(10L,4L), 2:1, as.raw(10)) } Error in b[i] <- v : incompatible types (from raw to integer) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1L,3L,10L),1:2,c(TRUE,FALSE)) } [1] 1 0 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1L,3L,10L),2:1,1+2i) } [1] 1+2i 1+2i 10+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1L,3L,10L),2:1,c(3,NA)) } [1] NA 3 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(1L,3L,10L),2:1,c(3L,NA)) } [1] NA 3 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(TRUE,FALSE),2:1,c(NA,NA)) ; f(10:11,1:2,c(NA,FALSE)) } [1] NA 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(TRUE,FALSE),2:1,c(NA,NA)) ; f(c(TRUE,FALSE),1:2,3:4) } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(TRUE,FALSE,NA),2:1,1+2i) } [1] 1+2i 1+2i NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(TRUE,NA,FALSE),2:0,c(TRUE,NA)) } [1] NA TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(TRUE,NA,FALSE),2:1,c(TRUE,NA)) } [1] NA TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(c(TRUE,NA,FALSE),3:4,c(TRUE,NA)) } [1] TRUE NA TRUE NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, 10) ; f(1:2, 1:2, 11) } [1] 11 11 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, 11L) } [[1]] [1] 11 [[2]] [1] 11 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, TRUE) ; f(list(1,2), -1:1, c(2,10,5)) } Error in b[i] <- v : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, TRUE) ; f(list(1,2), 1:2, as.raw(10))} [[1]] [1] 0a [[2]] [1] 0a ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, TRUE) } [[1]] [1] TRUE [[2]] [1] TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, c(TRUE,NA)) ; f(1:2, 1:2, c(10,5))} [1] 10 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, c(TRUE,NA)) ; f(1:2, c(0,0), as.raw(c(11,23)))} Error in b[i] <- v : incompatible types (from raw to integer) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, c(TRUE,NA)) ; f(1:2, c(0,0), c(1+2i,3+4i))} [1] 1+0i 2+0i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, c(TRUE,NA)) ; f(list(1,2), -10:10, 1:3) } Error in b[i] <- v : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, c(TRUE,NA)) ; f(list(1,2), 1:2, c(1+2i,3+4i))} [[1]] [1] 1+2i [[2]] [1] 3+4i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2), 1:2, c(TRUE,NA)) ; f(list(1,2), 1:3, c(2,10,5)) } [[1]] [1] 2 [[2]] [1] 10 [[3]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2),1:2,3:4) } [[1]] [1] 3 [[2]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2),1:2,c(1+2i,3+2i)) } [[1]] [1] 1+2i [[2]] [1] 3+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2),1:2,c(4,3)) } [[1]] [1] 4 [[2]] [1] 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2,3,4), seq(1L,4L,2L), c(TRUE,NA)) } [[1]] [1] TRUE [[2]] [1] 2 [[3]] [1] NA [[4]] [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b, i, v) { b[i] <- v ; b } ; f(list(1,2,3,4,5), 4:3, c(TRUE,NA)) } [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] NA [[4]] [1] TRUE [[5]] [1] 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[[i]] <- v ; b } ; f(1:2,"hi",3L) ; f(1:2,c(2),10) ; f(1:2, -1, 10) } [1] 1 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[b] <- b ; b } ; f(c(TRUE,FALSE,FALSE,TRUE)) ; f(1:3) } [1] 1 2 3 Warning message: In b[b] <- b : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(3:4, c(1,2), c(10,11)) ; f(4:5, as.integer(NA), 2) } [1] 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(3:4, c(1,2), c(10,11)) ; f(4:5, c(1,-1), 2) } Error in b[i] <- v : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(3:4, c(1,2), c(10,11)) ; f(4:5, c(NA,-1), 2) } Error in b[i] <- v : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(c("a","b","c"),c(TRUE,FALSE),c("A","X")) ; f(1:3,c(TRUE,FALSE),4) } [1] 4 2 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(c("a","b","c"),c(TRUE,FALSE),c("A","X")) ; f(c("A","X"),c(TRUE,FALSE),4) } [1] "4" "X" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(c("a","b","c"),c(TRUE,FALSE),c("A","X")) ; f(c("A","X"),c(TRUE,FALSE),f) } Error in b[i] <- v : incompatible types (from closure to character) in subassignment type fix ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(c("a","b","c"),c(TRUE,FALSE),c("A","X")) ; f(f,c(TRUE,FALSE),4) } Error in b[i] <- v : object of type 'closure' is not subsettable ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(c(TRUE,FALSE,FALSE,TRUE),c(TRUE,FALSE), NA) ; f(1:4, c(TRUE,TRUE), NA) } [1] NA NA NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(c(TRUE,FALSE,FALSE,TRUE),c(TRUE,FALSE), NA) ; f(c(FALSE,FALSE,TRUE), c(TRUE,TRUE), c(1,2,3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(list(1,2), c(TRUE,FALSE), list(1+2i)) ; f(1:2, c(TRUE,FALSE), list(TRUE)) } [[1]] [1] TRUE [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(list(1,2), c(TRUE,FALSE), list(1+2i)) ; f(as.list(1:2), c(TRUE,FALSE), 1+2i) } [[1]] [1] 1+2i [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(list(1,2), c(TRUE,FALSE), list(1+2i)) ; f(as.list(1:2), c(TRUE,FALSE), 10) } [[1]] [1] 10 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(list(1,2), c(TRUE,FALSE), list(1+2i)) ; f(as.list(1:2), c(TRUE,FALSE), 10L) } [[1]] [1] 10 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(list(1,2), c(TRUE,FALSE), list(1+2i)) ; f(as.list(1:2), c(TRUE,FALSE), TRUE) } [[1]] [1] TRUE [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(list(1,2), c(TRUE,FALSE), list(1+2i)) } [[1]] [1] 1+2i [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(list(1,2), c(TRUE,NA), 10) } [[1]] [1] 10 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(list(1,2), c(TRUE,NA), c(10,11)) } Error in b[i] <- v : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; f(list(1,2), c(TRUE,NA), list(1+2i)) } [[1]] [1] 1+2i [[2]] [1] 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; x <- list(1,2) ; attr(x,"my") <- 10 ; f(x, 1:2, c(10,11)) } [[1]] [1] 10 [[2]] [1] 11 attr(,"my") [1] 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f <- function(b,i,v) { b[i] <- v ; b } ; x <- list(1,2) ; z <- x ; f(x, c(TRUE,NA), c(10,11)) } Error in b[i] <- v : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f<-function(b,i,v) { b[i]<-v ; b } ; f(1:4,4:1,TRUE) ; f(c(3,2,1),8,10) ; f(c(TRUE,FALSE),TRUE,FALSE) } [1] FALSE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f<-function(b,i,v) { b[i]<-v ; b } ; f(1:4,4:1,TRUE) ; f(c(3,2,1),8,10) } [1] 3 2 1 NA NA NA NA 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f<-function(i,v) { x<-1:5 ; x[[i]]<-v ; x } ; f(1,1) ; f(1L,TRUE) ; f(2,TRUE) } [1] 1 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f<-function(i,v) { x<-1:5 ; x[i]<-v ; x } ; f(1,1) ; f(1L,TRUE) ; f(2,TRUE) } [1] 1 1 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f<-function(i,v) { x<-1:5 ; x[i]<-v ; x } ; f(3:2,1) ; f(1L,TRUE) ; f(2:4,4:2) } [1] 1 4 3 2 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ f<-function(i,v) { x<-1:5 ; x[i]<-v ; x } ; f(c(3,2),1) ; f(1L,TRUE) ; f(2:4,c(4,3,2)) } [1] 1 4 3 2 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ inds <- 1:4 ; m <- 2:3 ; inds[m] <- inds[m] + 1L ; inds } [1] 1 3 4 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ inds <- 1:4 ; m <- 2:3 ; inds[m] <- inds[m] + 1L ; m <- 1:2 ; inds[m] <- inds[m] + 1L ; inds } [1] 2 4 4 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ inds <- 1:4 ; m <- 2L ; inds[m] <- inds[m] + 1L ; m <- c(1L,2L) ; inds[m] <- inds[m] + 1L ; inds } [1] 2 4 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ inds <- 1:4 ; m <- c(2L,3L) ; inds[m] <- inds[m] + 1L ; inds } [1] 1 3 4 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ l <- double() ; l[c(FALSE,TRUE)] <-2 ; l} [1] NA 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ l <- double() ; l[c(TRUE,TRUE)] <-2 ; l} [1] 2 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ v<-1:3 ; v[-1] <- c(100,101) ; v } [1] 1 100 101 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ v<-1:3 ; v[TRUE] <- 100 ; v } [1] 100 100 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ v<-1:3 ; v[TRUE] <- c(100,101,102) ; v } [1] 100 101 102 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- (0:4); x[c(NA, NA, NA)] <- c(200L, 300L); x } Error in x[c(NA, NA, NA)] <- c(200L, 300L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- 1:2 ; x[c(FALSE,FALSE,TRUE)]<-10; x } [1] 1 2 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- 1:2 ; x[c(TRUE,FALSE,FALSE,NA)] <- 3:4 ; x } Error in x[c(TRUE, FALSE, FALSE, NA)] <- 3:4 : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- 1:2 ; x[c(TRUE,FALSE,FALSE,NA)] <- 3L ; x } [1] 3 2 NA NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- 1:2 ; x[c(TRUE,FALSE,FALSE,TRUE)] <- 3:4 ; x } [1] 3 2 NA 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- 1:2 ; x[c(TRUE,NA)] <- 2:3 ; x } Error in x[c(TRUE, NA)] <- 2:3 : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- 1:2 ; x[c(TRUE,NA)] <- 3L ; x } [1] 3 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- 1:3 ; x[c(-2, 1)] <- 10 } Error in x[c(-2, 1)] <- 10 : only 0's may be mixed with negative subscripts ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c('a','b','c','d'); x[2:3] <- 'x'; x} [1] "a" "x" "x" "d" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c('a','b','c','d'); x[2:3] <- c('x','y'); x} [1] "a" "x" "y" "d" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c('a','b','c','d'); x[3:2] <- c('x','y'); x} [1] "a" "y" "x" "d" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c('a','b','c','d'); x[c(TRUE,FALSE,TRUE)] <- c('x','y','z'); x } [1] "x" "b" "y" "z" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(); f <- function(i, v) { x[i] <- v ; x } ; f(1:2,3:4); f(c("a","b"),c(TRUE,FALSE)) } a b TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(); f <- function(i, v) { x[i] <- v ; x } ; f(1:2,3:4); f(c(1,2),c(TRUE,FALSE)) } [1] TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(); x[c('a','b')] <- c('a','b'); x } a b "a" "b" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(); x[c('a','b')] <- c(1L,2L); x } a b 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(); x[c('a','b')] <- c(TRUE,FALSE); x } a b TRUE FALSE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1) ; f <- function() { x[[1]] <<- x[[1]] + 1 ; x } ; a <- f() ; b <- f() ; c(a,b) } [1] 2 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; x[c(TRUE,TRUE)] <- rev(x) ; x } [1] 0 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; x[is.na(x)] <- TRUE; x } [1] 1 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; attr(x,"my") <- 1 ; x[c(TRUE,TRUE)] <- c(NA,TRUE); x } [1] NA 1 attr(,"my") [1] 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; f <- function(v) { x[c(TRUE,TRUE)] <- v ; x } ; f(1:2) ; f(1+2i) } [1] 1+2i 1+2i ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; f <- function(v) { x[c(TRUE,TRUE)] <- v ; x } ; f(1:2) ; f(c(1,2)) } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; x[c(NA,TRUE)] <- c(NA,TRUE); x } Error in x[c(NA, TRUE)] <- c(NA, TRUE) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; x[c(TRUE,TRUE)] <- 3:4; x } [1] 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; x[c(TRUE,TRUE)] <- c(TRUE,NA); x } [1] 1 NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; x[logical()] <- 3:4; x } [1] 1 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; z <- x ; x[c(NA,TRUE)] <- TRUE; x } [1] 1 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1,0) ; z <- x ; x[c(NA,TRUE)] <- c(NA,TRUE); x } Error in x[c(NA, TRUE)] <- c(NA, TRUE) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(NA, 0, NA)] <- c(400L, 500L, 600L); x } Error in x[c(NA, 0, NA)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L, 2L, 3L, 4L, 5L); x[c(NA, 2, 10)] <- c(400L, 500L, 600L); x } Error in x[c(NA, 2, 10)] <- c(400L, 500L, 600L) : NAs are not allowed in subscripted assignments ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L,1L,1L,1L); x[c(TRUE,TRUE,FALSE)] <- c('a','b','c'); x} [1] "a" "b" "1" "c" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L,2L) ; x[TRUE] <- 3L ; x } [1] 3 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L,2L) ; x[c(TRUE,FALSE)] <- 3L ; x } [1] 3 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L,2L) ; x[c(TRUE,NA)] <- 3L ; x } [1] 3 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L,2L) ; x[logical()] <- 3L ; x } [1] 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L,2L,3L,4L) ; x[is.na(x)] <- 5:6 ; x } [1] 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L,2L,3L,4L) ; attr(x,"my") <- 0 ; x[c(TRUE,FALSE)] <- 5:6 ; x } [1] 5 2 6 4 attr(,"my") [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L,2L,3L,4L) ; x[c(TRUE,FALSE)] <- 5:6 ; x } [1] 5 2 6 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(1L,2L,3L,4L) ; x[c(TRUE,FALSE)] <- rev(x) ; x } [1] 4 2 3 4 Warning message: In x[c(TRUE, FALSE)] <- rev(x) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(TRUE,TRUE,TRUE,TRUE); x[2:3] <- c(FALSE,FALSE); x } [1] TRUE FALSE FALSE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(TRUE,TRUE,TRUE,TRUE); x[3:2] <- c(FALSE,TRUE); x } [1] TRUE TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(TRUE,TRUE,TRUE,TRUE); x[c(TRUE,TRUE,FALSE)] <- c(10L,20L,30L); x } [1] 10 20 1 30 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(TRUE,TRUE,TRUE,TRUE); x[c(TRUE,TRUE,FALSE)] <- list(10L,20L,30L); x } [[1]] [1] 10 [[2]] [1] 20 [[3]] [1] TRUE [[4]] [1] 30 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(a=1,b=2) ; x[2:3]<-10; x } a b 1 10 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(a=1,b=2) ; x[3]<-10; x } a b 1 2 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(a=1,b=2) ; x[c(2,3)]<-10; x } a b 1 10 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(a=1,b=2) ; x[c(FALSE,FALSE,TRUE)]<-10; x } a b 1 2 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(a=1,b=2,c=3) ; x[2:3]<-10; x } a b c 1 10 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(a=1,b=2,c=3) ; x[2]<-10; x } a b c 1 10 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(a=1,b=2,c=3) ; x[c(2,3)]<-10; x } a b c 1 10 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- c(a=1,b=2,c=3) ; x[c(TRUE,TRUE,FALSE)]<-10; x } a b c 10 10 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- list(); x[c('a','b')] <- c('a','b'); x } $a [1] "a" $b [1] "b" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- list(); x[c('a','b')] <- list('a','b'); x } $a [1] "a" $b [1] "b" ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- list(1,0) ; attr(x,"my") <- 20 ; x[c(TRUE,FALSE)] <- c(11,12) ; x } [[1]] [1] 11 [[2]] [1] 0 attr(,"my") [1] 20 Warning message: In x[c(TRUE, FALSE)] <- c(11, 12) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- list(1,0) ; x[as.logical(x)] <- c(10,11); x } [[1]] [1] 10 [[2]] [1] 0 Warning message: In x[as.logical(x)] <- c(10, 11) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- list(1,0) ; x[c(TRUE,FALSE)] <- x[2:1] ; x } [[1]] [1] 0 [[2]] [1] 0 Warning message: In x[c(TRUE, FALSE)] <- x[2:1] : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- list(1,0) ; x[c(TRUE,TRUE)] <- c(TRUE,NA); x } [[1]] [1] TRUE [[2]] [1] NA ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- list(1,0) ; x[is.na(x)] <- c(10,11); x } [[1]] [1] 1 [[2]] [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- list(1,0) ; x[is.na(x)] <- c(10L,11L); x } [[1]] [1] 1 [[2]] [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- list(1,0) ; x[logical()] <- c(TRUE,NA); x } [[1]] [1] 1 [[2]] [1] 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- list(1,2) ; attr(x,"my") <- 10; x[c(TRUE,TRUE)] <- c(10,11,12); x } [[1]] [1] 10 [[2]] [1] 11 attr(,"my") [1] 10 Warning message: In x[c(TRUE, TRUE)] <- c(10, 11, 12) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x <- matrix(1:2) ; x[c(FALSE,FALSE,TRUE)]<-10; x } [1] 1 2 10 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate#Output.IgnoreWarningContext# #{ x = c(1,2,3,4); x[x %% 2 == 0] <- c(1,2,3,4); } Warning message: In x[x%%2 == 0] <- c(1, 2, 3, 4) : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-11:9 ; x[c(TRUE, FALSE, TRUE)] <- c(1000,2000); x } [1] 1000 10 2000 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-1:3 ; y<-(x[2]<-100) ; y } [1] 100 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-1:3; x[c(TRUE, FALSE, TRUE)] <- c(TRUE,FALSE); x } [1] 1 2 0 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-1:5 ; x[3] <- (x[4]<-100) ; x } [1] 1 2 100 100 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-1:5 ; x[x[4]<-2] <- (x[4]<-100) ; x } [1] 1 100 3 100 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-1:5; x[4:3]<-c(300L,400L); x } [1] 1 2 400 300 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-1:5; x[c(0-2,0-3,0-3,0-100,0)]<-256; x } [1] 256 2 3 256 256 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-1:5; x[c(4,2,3)]<-c(256L,257L,258L); x } [1] 1 257 258 256 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-5:1 ; x[x[2]<-2] <- (x[3]<-50) ; x } [1] 5 50 50 2 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-5:1 ; x[x[2]<-2] } [1] 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-5:1; x[3:4]<-c(300,400); x } [1] 5 4 300 400 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-5:1; x[3:4]<-c(300L,400L); x } [1] 5 4 300 400 1 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c() ; x[c("a","b","c","d")]<-c(1,2); x } a b c d 1 2 1 2 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(1,2,3,4,5); x[3:4]<-c(300,400); x } [1] 1 2 300 400 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(1,2,3,4,5); x[4:3]<-c(300L,400L); x } [1] 1 2 400 300 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(1,2,3,4,5); x[c(TRUE,FALSE)] <- 1000; x } [1] 1000 2 1000 4 1000 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(1,2,3,4,5); x[c(TRUE,FALSE,TRUE,TRUE,0)] <- c(1000,2000,3000); x } [1] 3000 2 3 4 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(1,2,3,4,5); x[c(TRUE,FALSE,TRUE,TRUE,FALSE)] <- c(1000,2000,3000); x } [1] 1000 2 2000 3000 5 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(1,2,3,4,5,6); x[c(TRUE,TRUE,FALSE)] <- c(1000L,2000L) ; x } [1] 1000 2000 3 1000 2000 6 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(TRUE,TRUE,FALSE); x[c(TRUE, FALSE, TRUE)] <- c(1000,2000); x } [1] 1000 1 2000 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(TRUE,TRUE,FALSE); x[c(TRUE, FALSE, TRUE)] <- c(FALSE,TRUE); x } [1] FALSE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(TRUE,TRUE,FALSE,TRUE) ; x[3:2] <- TRUE; x } [1] TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(a=1,b=2,c=3) ; x["d"]<-4 ; x } a b c d 1 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(a=1,b=2,c=3) ; x[["b"]]<-200; x } a b c 1 200 3 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(a=1,b=2,c=3) ; x[["d"]]<-200; x } a b c d 1 2 3 200 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(a=1,b=2,c=3) ; x[c("d","a","d","a")]<-c(4,5) ; x } a b c d 5 2 3 4 ##com.oracle.truffle.r.test.library.base.TestSimpleVectors.testVectorUpdate# #{ x<-c(a=1,b=2,c=3) ; x[c("d","e")]<-c(4,5) ; x } a b c d e 1 2 3 4 5 ##com.oracle.truffle.r.test.library.base.foreign.TestRegisterFunction.testDotC# #if (!any(R.version$engine == "FastR")) { T } else { .fastr.register.functions('testLib', environment(), 0, list(cfun1=function() {1})); .C(cfun1)==1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.foreign.TestRegisterFunction.testDotC# #if (!any(R.version$engine == "FastR")) { T } else { .fastr.register.functions('testLib', environment(), 0, list(cfun2=function() {2}, cfun3=function() {3}));.fastr.register.functions('testLib', environment(), 0, list(cfun4=function() {4})); .C(cfun2)==2 && .C(cfun3)==3 && .C(cfun4)==4 } [1] TRUE ##com.oracle.truffle.r.test.library.base.foreign.TestRegisterFunction.testDotCall# #if (!any(R.version$engine == "FastR")) { T } else { .fastr.register.functions('testLib', environment(), 1, list(callfun1=function() {1})); .Call(callfun1)==1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.foreign.TestRegisterFunction.testDotCall# #if (!any(R.version$engine == "FastR")) { T } else { .fastr.register.functions('testLib', environment(), 1, list(callfun2=function() {2}, callfun3=function() {3}));.fastr.register.functions('testLib', environment(), 1, list(callfun4=function() {4})); .Call(callfun2)==2 && .Call(callfun3)==3 && .Call(callfun4)==4 } [1] TRUE ##com.oracle.truffle.r.test.library.base.foreign.TestRegisterFunction.testDotCall# #if (!any(R.version$engine == "FastR")) { T } else { .fastr.register.functions('testLib', environment(), 1, list(callfunptr=function() {5})); assign('callptr', getNativeSymbolInfo('callfunptr', 'testLib')$address); .Call(callptr)==5 } [1] TRUE ##com.oracle.truffle.r.test.library.base.foreign.TestRegisterFunction.testDotExternal# #if (!any(R.version$engine == "FastR")) { T } else { .fastr.register.functions('testLib', environment(), 3, list(externalfun1=function() {1})); .External(externalfun1)==1 } [1] TRUE ##com.oracle.truffle.r.test.library.base.foreign.TestRegisterFunction.testDotExternal# #if (!any(R.version$engine == "FastR")) { T } else { .fastr.register.functions('testLib', environment(), 3, list(externalfun2=function() {2}, externalfun3=function() {3}));.fastr.register.functions('testLib', environment(), 3, list(externalfun4=function() {4})); .External(externalfun2)==2 && .External(externalfun3)==3 && .External(externalfun4)==4 } [1] TRUE ##com.oracle.truffle.r.test.library.base.foreign.TestRegisterFunction.testDotFortran# #if (!any(R.version$engine == "FastR")) { T } else { .fastr.register.functions('testLib', environment(), 2, list(ffun5=function() {5})); .Fortran(ffun5)==5 } [1] TRUE ##com.oracle.truffle.r.test.library.base.foreign.TestRegisterFunction.testDotFortran# #if (!any(R.version$engine == "FastR")) { T } else { .fastr.register.functions('testLib', environment(), 2, list(ffun6=function() {6}, ffun7=function() {7}));.fastr.register.functions('testLib', environment(), 2, list(ffun8=function() {8})); .Fortran(ffun6)==6 && .Fortran(ffun7)==7 && .Fortran(ffun8)==8 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.InteropArrayConversionTest.runRSourceTests# #{ source("tmptest/fastr/interop-array-conversion-test.R") } ##com.oracle.truffle.r.test.library.fastr.InteropArrayConversionTest.testGlobalFrame# #sys.frame() ##com.oracle.truffle.r.test.library.fastr.TestContextKind.test1#Context.NonShared# #{ Sys.setenv(MY_ENV_VAR = '1') } ##com.oracle.truffle.r.test.library.fastr.TestContextKind.test2#Context.NonShared# #{ Sys.getenv('MY_ENV_VAR') } [1] "" ##com.oracle.truffle.r.test.library.fastr.TestContextKind.testAddSymbolToGlobalEnv# #'x' %in% names(.GlobalEnv) [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestContextKind.testAddSymbolToGlobalEnv# #x <- 42 ##com.oracle.truffle.r.test.library.fastr.TestContextKind.testDigitsOption# #{ 23.123456789 } [1] 23.12346 ##com.oracle.truffle.r.test.library.fastr.TestContextKind.testDigitsOption# #{ getOption('digits') } [1] 7 ##com.oracle.truffle.r.test.library.fastr.TestContextKind.testDigitsOption# #{ options(digits = 3); getOption('digits') } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestContextKind.testErrorOption#Context.NonShared# #{ non_existing_var } Error: object 'non_existing_var' not found ##com.oracle.truffle.r.test.library.fastr.TestContextKind.testErrorOption#Context.NonShared# #{ options(error = quote(cat('Err occured<<>>'))); non_existing_var } Error: object 'non_existing_var' not found Err occured ##com.oracle.truffle.r.test.library.fastr.TestContextKind.testResetSeed# #{ set.seed(11, 'Marsaglia-Multicarry') } ##com.oracle.truffle.r.test.library.fastr.TestContextKind.testResetSeed# #{ set.seed(42); rnorm(5) } [1] 1.3709584 -0.5646982 0.3631284 0.6328626 0.4042683 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testChannelConnection# #if (!any(R.version$engine == "FastR")) { NULL } else { v <- import('_fastr_channel0'); zz <- .fastr.channelConnection(v, 'r+', 'native.enc'); writeLines('hi there', zz); close(zz); NULL } NULL ##com.oracle.truffle.r.test.library.fastr.TestInterop.testChannelConnection# #if (!any(R.version$engine == "FastR")) { c('Hello, World!', 'second line') } else { v <- import('_fastr_channel0'); zz <- .fastr.channelConnection(v, 'r+', 'native.enc'); res <- readLines(zz); close(zz); res } [1] "Hello, World!" "second line" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testDollar# #if (!any(R.version$engine == "FastR")) { '$aaa' } else { tpojo <- import('testPOJOWrite'); tpojo$stringValue <- '$aaa'; tpojo$stringValue } [1] "$aaa" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testDollar# #if (!any(R.version$engine == "FastR")) { TRUE } else { ja <- new(java.type('int[]'), 3); tos <- ja$toString(); is.character(tos) && length(tos) == 1 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestInterop.testDollar# #if (!any(R.version$engine == "FastR")) { TRUE } else { ja <- new(java.type('int[]'), 3); ts <- ja$toString; tos <- ts(); is.character(tos) && length(tos) == 1 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestInterop.testDollar# #if (!any(R.version$engine == "FastR")) { TRUE } else { tpojo <- import('testPOJO'); tos <- tpojo$toString(); is.character(tos) && length(tos) == 1 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { 1 } else { eval.polyglot('R', '1') } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { 16 } else { eval.polyglot('R', '14 + 2') } [1] 16 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { 1L } else { eval.polyglot('R', '1L') } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { TRUE } else { eval.polyglot('R', 'TRUE') } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { as.character(123) } else { eval.polyglot('R', 'as.character(123)') } [1] "123" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot("foo", "bar") :\n Language with id \'foo\' is not available. Did you start R with --polyglot or use allowPolyglotAccess when building the context?\n') } else { eval.polyglot('foo', 'bar') } Error in eval.polyglot("foo", "bar") : Language with id 'foo' is not available. Did you start R with --polyglot or use allowPolyglotAccess when building the context? ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot("foo", , "bar") :\n Language with id \'foo\' is not available. Did you start R with --polyglot or use allowPolyglotAccess when building the context?\n') } else { eval.polyglot('foo',, 'bar') } Error in eval.polyglot("foo", , "bar") : Language with id 'foo' is not available. Did you start R with --polyglot or use allowPolyglotAccess when building the context? ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot("nfi", "foo.bar") :\n Language with id \'nfi\' is not available. Did you start R with --polyglot or use allowPolyglotAccess when building the context?\n') } else { eval.polyglot('nfi', 'foo.bar') } Error in eval.polyglot("nfi", "foo.bar") : Language with id 'nfi' is not available. Did you start R with --polyglot or use allowPolyglotAccess when building the context? ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot("nfi", , "foo.bar") :\n Language with id \'nfi\' is not available. Did you start R with --polyglot or use allowPolyglotAccess when building the context?\n') } else { eval.polyglot('nfi',,'foo.bar') } Error in eval.polyglot("nfi", , "foo.bar") : Language with id 'nfi' is not available. Did you start R with --polyglot or use allowPolyglotAccess when building the context? ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot(, "bar") :\n No language id provided, please refer to ?eval.polyglot for more details.\n') } else { eval.polyglot(, 'bar') } Error in eval.polyglot(, "bar") : No language id provided, please refer to ?eval.polyglot for more details. ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEval# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot(, , "bar") :\n Could not find language corresponding to extension \'bar\', you can specify the language id explicitly, please refer to ?eval.polyglot for more details.\n') } else { eval.polyglot(,,'bar') } Error in eval.polyglot(, , "bar") : Could not find language corresponding to extension 'bar', you can specify the language id explicitly, please refer to ?eval.polyglot for more details. ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { as.character(123) } else { eval.polyglot('R', 'as.character(123)') } [1] "123" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot("js", "console.log(42)", "file.js") :<<>> Wrong arguments combination, please refer to ?eval.polyglot for more details.\n') } else { eval.polyglot('js', 'console.log(42)', 'file.js') } Error in eval.polyglot("js", "console.log(42)", "file.js") : Wrong arguments combination, please refer to ?eval.polyglot for more details. ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot("nonExistentLanguage", "code") :<<>> Language with id \'nonExistentLanguage\' is not available. Did you start R with --polyglot or use allowPolyglotAccess when building the context?\n') } else { eval.polyglot('nonExistentLanguage', 'code') } Error in eval.polyglot("nonExistentLanguage", "code") : Language with id 'nonExistentLanguage' is not available. Did you start R with --polyglot or use allowPolyglotAccess when building the context? ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot("someLanguage") :<<>> No code or path provided, please refer to ?eval.polyglot for more details.\n') } else { eval.polyglot('someLanguage') } Error in eval.polyglot("someLanguage") : No code or path provided, please refer to ?eval.polyglot for more details. ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot() :<<>> Wrong arguments combination, please refer to ?eval.polyglot for more details.\n') } else { eval.polyglot() } Error in eval.polyglot() : Wrong arguments combination, please refer to ?eval.polyglot for more details. ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot(, "abc", ) :<<>> No language id provided, please refer to ?eval.polyglot for more details.\n') } else { eval.polyglot(,'abc',) } Error in eval.polyglot(, "abc", ) : No language id provided, please refer to ?eval.polyglot for more details. ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot(code = "") :<<>> No language id provided, please refer to ?eval.polyglot for more details.\n') } else { eval.polyglot(code='') } Error in eval.polyglot(code = "") : No language id provided, please refer to ?eval.polyglot for more details. ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot(languageId = "js") :<<>> No code or path provided, please refer to ?eval.polyglot for more details.\n') } else { eval.polyglot(languageId='js') } Error in eval.polyglot(languageId = "js") : No code or path provided, please refer to ?eval.polyglot for more details. ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { cat('Error in eval.polyglot(path = f) :<<>> Could not find language corresponding to extension \'nonLanguageExtension\', you can specify the language id explicitly, please refer to ?eval.polyglot for more details.\n') } else { f<-paste0(tempfile(),'.nonLanguageExtension'); file.create(f); tryCatch(eval.polyglot(path=f), finally=file.remove(f)) } Error in eval.polyglot(path = f) : Could not find language corresponding to extension 'nonLanguageExtension', you can specify the language id explicitly, please refer to ?eval.polyglot for more details. ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { cat('[1] "Error reading file: /a/b.R"\n') } else { tryCatch(eval.polyglot(path="/a/b.R"), error = function(e) e$message) } [1] "Error reading file: /a/b.R" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { x<-c(1);cat(x) } else { fileConn<-file("_testInteropEvalFile_testScript_.R");writeLines(c("x<-c(1)","cat(x)"), fileConn);close(fileConn);eval.polyglot(languageId="R", path="_testInteropEvalFile_testScript_.R") } 1 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropEvalFile# #if (!any(R.version$engine == "FastR")) { x<-c(1);cat(x) } else { fileConn<-file("_testInteropEvalFile_testScript_.R");writeLines(c("x<-c(1)","cat(x)"), fileConn);close(fileConn);eval.polyglot(path="_testInteropEvalFile_testScript_.R") } 1 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropExport# #if (!any(R.version$engine == "FastR")) { invisible() } else { export('foo', 'foo') } ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropExport# #if (!any(R.version$engine == "FastR")) { invisible() } else { export('foo', 14 + 2) } ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropExport# #if (!any(R.version$engine == "FastR")) { invisible() } else { export('foo', 1:100) } ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropExport# #if (!any(R.version$engine == "FastR")) { invisible() } else { export('foo', new.env()) } ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 'a' } else { v <- import('testCharVariable'); v } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 'abc' } else { v <- import('testStringVariable'); v } [1] "abc" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 'character' } else { v <- import('testCharVariable'); typeof(v) } [1] "character" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 'character' } else { v <- import('testStringVariable'); typeof(v) } [1] "character" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 'double' } else { v <- import('testDoubleVariable'); typeof(v) } [1] "double" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 'double' } else { v <- import('testFloatVariable'); typeof(v) } [1] "double" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 'integer' } else { v <- import('testByteVariable'); typeof(v) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 'integer' } else { v <- import('testIntegerVariable'); typeof(v) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 'integer' } else { v <- import('testShortVariable'); typeof(v) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 'logical' } else { v <- import('testBooleanVariable'); typeof(v) } [1] "logical" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- import('testByteVariable'); v } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 2.1 } else { v <- import('testDoubleVariable'); v } [1] 2.1 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 3.1 } else { v <- import('testFloatVariable'); v } [1] 3.1 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 4 } else { v <- import('testIntegerVariable'); v } [1] 4 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { 5 } else { v <- import('testShortVariable'); v } [1] 5 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInteropImportValue# #if (!any(R.version$engine == "FastR")) { TRUE } else { v <- import('testBooleanVariable'); v } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInvocableNoReadable# #if (!any(R.version$engine == "FastR")) { cat('Error in fo$invocable : ', '<<>>', 'invalid index/identifier during foreign access: invocable', '<<>>', sep=' ') } else { foreignObjectFactory <- import('foreignObjectFactory'); fo <- foreignObjectFactory$createInvocableNotReadable(); fo$invocable } Error in fo$invocable : invalid index/identifier during foreign access: invocable ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInvocableNoReadable# #if (!any(R.version$engine == "FastR")) { cat('Error in fo$invocable : ', '<<>>', 'invalid index/identifier during foreign access: invocable', '<<>>', sep=' ') } else { foreignObjectFactory <- import('foreignObjectFactory'); fo <- foreignObjectFactory$createInvocableNotReadable(); fo$invocable() } Error in fo$invocable : invalid index/identifier during foreign access: invocable ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInvocableNoReadable# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]<<>>$invocable<<>>[not readable value]<<>><<>>') } else { foreignObjectFactory <- import('foreignObjectFactory'); fo <- foreignObjectFactory$createInvocableNotReadable(); fo } [polyglot value] $invocable [not readable value] ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInvocableNoReadable# #if (!any(R.version$engine == "FastR")) { cat('named list()<<>>') } else { foreignObjectFactory <- import('foreignObjectFactory'); fo <- foreignObjectFactory$createInvocableNotReadable(); as.list(fo) } named list() ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInvocableNoReadable# #if (!any(R.version$engine == "FastR")) { print('invocable') } else { foreignObjectFactory <- import('foreignObjectFactory'); fo <- foreignObjectFactory$createInvocableNotReadable(); names(fo) } [1] "invocable" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInvocableNoReadable# #if (!any(R.version$engine == "FastR")) { print(42) } else { foreignObjectFactory <- import('foreignObjectFactory'); fo <- foreignObjectFactory$createInvocableNotReadable(); fo@invocable() } [1] 42 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInvoke# #if (!any(R.version$engine == "FastR")) { print(72L) } else { cl <- java.type('java.math.BigInteger'); fo <- 1:100; try(fo@bitLength(), silent=TRUE); fo <- new(cl, 'FFFFFFFFFFFFFFFFFF', 16L); fo@bitLength() } [1] 72 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testInvoke# #if (!any(R.version$engine == "FastR")) { print(72L) } else { cl <- java.type('java.math.BigInteger'); fo <- new(cl, 'FFFFFFFFFFFFFFFFFF', 16L); fo@bitLength() } [1] 72 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testPrinting# #if (!any(R.version$engine == "FastR")) { c('stringValue', 'charValue', 'intValue', 'shortValue', 'booleanValue', 'longValue', 'class') } else { v <- import('testPOJO'); names(v) } [1] "stringValue" "charValue" "intValue" "shortValue" "booleanValue" [6] "longValue" "class" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testPrinting# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n$class\n[polyglot value]\n\n$stringValue\n[1] "foo"\n\n$charValue\n[1] "R"\n\n$intValue\n[1] 1\n\n$shortValue\n[1] -100\n\n$booleanValue\n[1] TRUE\n\n$longValue\n[1] 123412341234\n\n') } else { v <- import('testPOJO'); print(v) } [polyglot value] $class [polyglot value] $stringValue [1] "foo" $charValue [1] "R" $intValue [1] 1 $shortValue [1] -100 $booleanValue [1] TRUE $longValue [1] 123412341234 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testPrinting# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 -5 199\n') } else { v <- import('testIntArray'); print(v) } [polyglot value] [1] 1 -5 199 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testPrinting# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 -5 199\n') } else { v <- import('testIntArray'); v } [polyglot value] [1] 1 -5 199 ##com.oracle.truffle.r.test.library.fastr.TestInterop.testPrinting# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "a" "" "foo"\n') } else { v <- import('testStringArray'); print(v) } [polyglot value] [1] "a" "" "foo" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testSlot# #if (!any(R.version$engine == "FastR")) { '@aaa' } else { tpojo <- import('testPOJOWrite'); tpojo@stringValue <- '@aaa'; tpojo@stringValue } [1] "@aaa" ##com.oracle.truffle.r.test.library.fastr.TestInterop.testSlot# #if (!any(R.version$engine == "FastR")) { TRUE } else { ja <-new(java.type('int[]'), 3); tos <- ja@toString(); is.character(tos) && length(tos) == 1 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestInterop.testSlot# #if (!any(R.version$engine == "FastR")) { TRUE } else { ja <-new(java.type('int[]'), 3); ts <- ja@toString; tos <- ts(); is.character(tos) && length(tos) == 1 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestInterop.testSlot# #if (!any(R.version$engine == "FastR")) { TRUE } else { tpojo <- import('testPOJO'); tos <- tpojo@toString(); is.character(tos) && length(tos) == 1 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAddToList# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); l <- list(); l$foreignobject <- to; identical(to, l$foreignobject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAddToList# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); l <- list(1); l$foreignobject <- 1; l$foreignobject <- to; identical(to, l$foreignobject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAddToList# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); l <- list(1); l$foreignobject <- to; identical(to, l$foreignobject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAddToList# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); l <- list(to); is.list(l) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAllTypes# #if (!any(R.version$engine == "FastR")) { "true127a32767214748364721474836471.7976931348623157E3082.0testString" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$allTypesMethod(TRUE, .fastr.interop.asByte(127), .fastr.interop.asChar("a"), .fastr.interop.asShort(32767), 2147483647L, .fastr.interop.asLong(2147483647), 1.7976931348623157E308, .fastr.interop.asFloat(2.0), "testString") } [1] "true127a32767214748364721474836471.7976931348623157E3082.0testString" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAllTypes# #if (!any(R.version$engine == "FastR")) { "true127a32767214748364721474836471.7976931348623157E3082.0testString" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$allTypesStaticMethod(TRUE, .fastr.interop.asByte(127), .fastr.interop.asChar("a"), .fastr.interop.asShort(32767), 2147483647L, .fastr.interop.asLong(2147483647), 1.7976931348623157E308, .fastr.interop.asFloat(2.0), "testString") } [1] "true127a32767214748364721474836471.7976931348623157E3082.0testString" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArray# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.RIntArrayVectorData<<>>') } else { ja <- new(java.type('int[]'), 6); for(i in 1:6) ja[i] <- i; .fastr.inspect(array(ja, c(3, 2)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.RIntArrayVectorData ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArray# #if (!any(R.version$engine == "FastR")) { matrix(1:6, c(3, 2)) } else { ja <- new(java.type('int[]'), 6); for(i in 1:6) ja[i] <- i; array(ja, c(3, 2)) } [,1] [,2] [1,] 1 4 [2,] 2 5 [3,] 3 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArray# #if (!any(R.version$engine == "FastR")) { v <- c(1, 1, 1, 1, 2, 2, 2, 2, 3, 3, 3, 3); dim(v) <- c(2, 2, 3); array(v, c(3, 2, 2)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');array(ta$integerArray3, c(3, 2, 2)) } , , 1 [,1] [,2] [1,] 1 1 [2,] 1 2 [3,] 1 2 , , 2 [,1] [,2] [1,] 2 3 [2,] 2 3 [3,] 3 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArray# #if (!any(R.version$engine == "FastR")) { v <- c(1, 1, 2, 2, 3, 3); dim(v) <- c(2, 3); array(v, c(3, 2)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');array(ta$integerArray2, c(3, 2)) } [,1] [,2] [1,] 1 2 [2,] 1 3 [3,] 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayAsParameter# #if (!any(R.version$engine == "FastR")) { '[I' } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));ja <- .fastr.interop.asJavaArray(c(1L, 2L, 3L), 'int'); to$isIntArray(ja) } [1] "[I" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayAsParameter# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.Integer;' } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));ja <- .fastr.interop.asJavaArray(c(1L, 2L, 3L), 'java.lang.Integer'); to$isIntegerArray(ja) } [1] "[Ljava.lang.Integer;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 'test' } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to['fieldStringObject'] <- 'test'; to['fieldStringObject'] } [1] "test" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 1 } else { a <- .fastr.interop.asJavaArray(c(1,2,3)); a[1] } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 1 } else { a <- .fastr.interop.asJavaArray(c(1,2,3)); a[[1]] } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerArray[1]; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerArray[[1]]; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 123 } else { a <- .fastr.interop.asJavaArray(c(1,2,3)); a[1] <- 123; a[1] } [1] 123 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 123 } else { a <- .fastr.interop.asJavaArray(c(1,2,3)); a[[1]] <- 123; a[[1]] } [1] 123 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 123 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerArray[1] <- 123L; to$fieldIntegerArray[1] } [1] 123 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 1234 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerArray[[1]] <- 1234L; to$fieldIntegerArray[[1]] } [1] 1234 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 1234 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$int2DimArray[1,2] <- 1234L; to$int2DimArray[1,2] } [1] 1234 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 12345 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$int2DimArray[[1,2]] <- 12345L; to$int2DimArray[[1,2]] } [1] 12345 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 2 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$int2DimArray[1,2] } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { 2 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$int2DimArray[[1,2]] } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { NULL } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringArray[1] <- NULL; to$fieldStringArray[1] } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); t1 <- to[TRUE]; identical(to, t1) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldIntegerArray[c(1, 5)] : ', '<<>>', 'invalid index/identifier during foreign access: 4', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerArray[c(1, 5)] } Error in to$fieldIntegerArray[c(1, 5)] : invalid index/identifier during foreign access: 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { cat('Error in to["x"] : invalid index/identifier during foreign access: x', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to['x'] } Error in to["x"] : invalid index/identifier during foreign access: x ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { cat('Error in to[1] : invalid index/identifier during foreign access: 0.0', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to[1] } Error in to[1] : invalid index/identifier during foreign access: 0.0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]<<>>[1] 0 0 0<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerArray[TRUE] <- 0; to$fieldIntegerArray } [polyglot value] [1] 0 0 0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2 3\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerArray[TRUE]; } [polyglot value] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2 3\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$int2DimArray[1] } [polyglot value] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2 3\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$int2DimArray[[1]] } [polyglot value] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { integer(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerArray[FALSE] } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArrayReadWrite# #if (!any(R.version$engine == "FastR")) { list() } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to[FALSE] } list() ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArraysWithNullConversion# #if (!any(R.version$engine == "FastR")) { c('a', NA, 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$charObjectArrayWithNull) } [1] "a" NA "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArraysWithNullConversion# #if (!any(R.version$engine == "FastR")) { c('a', NA, 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$stringArrayWithNull) } [1] "a" NA "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArraysWithNullConversion# #if (!any(R.version$engine == "FastR")) { c(1, NA, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$byteObjectArrayWithNull) } [1] 1 NA 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArraysWithNullConversion# #if (!any(R.version$engine == "FastR")) { c(1, NA, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$longObjectArrayWithNull) } [1] 1 NA 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArraysWithNullConversion# #if (!any(R.version$engine == "FastR")) { c(1.1, NA, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$doubleObjectArrayWithNull) } [1] 1.1 NA 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArraysWithNullConversion# #if (!any(R.version$engine == "FastR")) { c(1.1, NA, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$floatObjectArrayWithNull) } [1] 1.1 NA 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArraysWithNullConversion# #if (!any(R.version$engine == "FastR")) { c(1L, NA, 3L) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$integerObjectArrayWithNull) } [1] 1 NA 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArraysWithNullConversion# #if (!any(R.version$engine == "FastR")) { c(1L, NA, 3L) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$shortObjectArrayWithNull) } [1] 1 NA 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testArraysWithNullConversion# #if (!any(R.version$engine == "FastR")) { c(T, NA, T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$booleanObjectArrayWithNull) } [1] TRUE NA TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsArray# #if (!any(R.version$engine == "FastR")) { a2 <- c('a', 'a', 'b', 'b', 'c', 'c'); dim(a2) <- c(2, 3); as.array(a2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.array(ta$stringArray2) } [,1] [,2] [,3] [1,] "a" "b" "c" [2,] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsArray# #if (!any(R.version$engine == "FastR")) { a3 <- c('a', 'a', 'a', 'a', 'b', 'b', 'b', 'b', 'c', 'c', 'c', 'c'); dim(a3) <- c(2, 2, 3); as.array(a3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.array(ta$stringArray3) } , , 1 [,1] [,2] [1,] "a" "a" [2,] "a" "a" , , 2 [,1] [,2] [1,] "b" "b" [2,] "b" "b" , , 3 [,1] [,2] [1,] "c" "c" [2,] "c" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsArray# #if (!any(R.version$engine == "FastR")) { as.array(c('a', 'b', 'c')) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.array(ta$stringArray) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsArray# #if (!any(R.version$engine == "FastR")) { as.array(list(1, 'a', '1')) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.array(ta$heterogenousPrimitiveArray) } [[1]] [1] 1 [[2]] [1] "a" [[3]] [1] "1" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsDataFrame# #if (!any(R.version$engine == "FastR")) { a1 <- c('a', 'b', 'c'); as.data.frame(a1) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); a1 <- ta$stringArray; as.data.frame(a1) } a1 1 a 2 b 3 c ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsDataFrame# #if (!any(R.version$engine == "FastR")) { a2 <- 'a', 'a', 'b', 'b', 'c', 'c'; dim(a2) <- c(2,3); as.data.frame(a2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); a2 <- ta$stringArray2; as.data.frame(a2) } Error: unexpected ',' in "if (!any(R.version$engine == "FastR")) { a2 <- 'a'," ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsDataFrame# #if (!any(R.version$engine == "FastR")) { a3 <- 'a', 'a', 'a', 'a', 'b', 'b', 'b', 'b', 'c', 'c', 'c', 'c'; dim(a3) <- c(2, 2, 3); as.data.frame(a3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); a3 <- ta$stringArray3; as.data.frame(a3) } Error: unexpected ',' in "if (!any(R.version$engine == "FastR")) { a3 <- 'a'," ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsDataFrame# #if (!any(R.version$engine == "FastR")) { as.data.frame(list(b=c(T, F, T), i=c(1, 2, 3))) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClass'); as.data.frame(talc) } b i 1 TRUE 1 2 FALSE 2 3 TRUE 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsDataFrame# #if (!any(R.version$engine == "FastR")) { as.data.frame(list(x=c(1, 2, 3), y=(T, T, T))) } else { tdfpo <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestDFProxyObject'); as.data.frame(tdfpo) } Error: unexpected ',' in "if (!any(R.version$engine == "FastR")) { as.data.frame(list(x=c(1, 2, 3), y=(T," ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsDataFrame# #if (!any(R.version$engine == "FastR")) { as.data.frame(list(x=c(1, 2, 3), y=(T, T, T))) } else { tpa <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestProxyArray'); as.data.frame(c(1,2,3)) } Error: unexpected ',' in "if (!any(R.version$engine == "FastR")) { as.data.frame(list(x=c(1, 2, 3), y=(T," ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsDataFrame#Output.IgnoreErrorContext# #if (!any(R.version$engine == "FastR")) { b2 <- c(T, T, F, F, T, T); i <- c(1,2,3); dim(b2) <- c(2, 3); as.data.frame(list(b=b2, i=i, n=NULL)) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixed'); as.data.frame(talc) } Error in (function (..., row.names = NULL, check.rows = FALSE, check.names = TRUE, : arguments imply differing number of rows: 2, 3, 0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsDataFrame# #if (!any(R.version$engine == "FastR")) { b2 <- c(T, T, F, F, T, T); i2 <- c(1, 1, 2, 2, 3, 3); dim(b2) <- c(2, 3); dim(i2) <- c(2, 3); as.data.frame(list(b=b2, i=i2)) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClass2'); as.data.frame(talc) } b.1 b.2 b.3 i.1 i.2 i.3 1 TRUE FALSE TRUE 1 2 3 2 TRUE FALSE TRUE 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsDataFrame# #if (!any(R.version$engine == "FastR")) { b3 <- c(T, T, T, T, F, F, F, F, T, T, T, T); i3 <- c(1, 1, 1, 1, 2, 2, 2, 2, 3, 3, 3, 3); dim(b3) <- c(2, 2, 3); dim(i3) <- c(2, 2, 3); as.data.frame(list(b=b3, i=i3)) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClass3'); as.data.frame(talc) } b.1 b.2 b.3 b.4 b.5 b.6 i.1 i.2 i.3 i.4 i.5 i.6 1 TRUE TRUE FALSE FALSE TRUE TRUE 1 1 2 2 3 3 2 TRUE TRUE FALSE FALSE TRUE TRUE 1 1 2 2 3 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsDataFrame# #if (!any(R.version$engine == "FastR")) { ma <- list(1L, 'a', '1'); as.data.frame(ma) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); ma <- ta$heterogenousPrimitiveArray; as.data.frame(ma) } X1L X.a. X.1. 1 1 a 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray, ); typeof(v) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray2, ); typeof(v) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray2, ); typeof(v[[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray2, ); typeof(v[[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); typeof(v) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); typeof(v[[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); typeof(v[[1]][[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); typeof(v[[1]][[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); typeof(v[[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); typeof(v[[2]][[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); typeof(v[[2]][[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 2 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray2, ); length(v) } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 2 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); length(v) } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { 3 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray, ); length(v) } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { NULL } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixedWithObject'); as.list(talc)$n } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray, ); is.polyglot.value(v[[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray, ); is.polyglot.value(v[[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray, ); is.polyglot.value(v[[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray2, ); is.polyglot.value(v[[1]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray2, ); is.polyglot.value(v[[1]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray2, ); is.polyglot.value(v[[1]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray2, ); is.polyglot.value(v[[2]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray2, ); is.polyglot.value(v[[2]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray2, ); is.polyglot.value(v[[2]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[1]][[1]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[1]][[1]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[1]][[1]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[1]][[2]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[1]][[2]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[1]][[2]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[2]][[1]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[2]][[1]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[2]][[1]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[2]][[2]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[2]][[2]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.list(ta$objectArray3, ); is.polyglot.value(v[[2]][[2]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { TRUE } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixedWithObject'); is.polyglot.value(as.list(talc)$o) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { b2 <- matrix(c(T, T, F, F, T, T), 2, 3); i <- c(1, 2, 3); oa <- list(c(T, F, T), c('a', 'b', 'c')); list(b=b2, i=i, oa=oa, n=NULL) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixed'); as.list(talc) } $b [,1] [,2] [,3] [1,] TRUE FALSE TRUE [2,] TRUE FALSE TRUE $i [1] 1 2 3 $oa $oa[[1]] [1] TRUE FALSE TRUE $oa[[2]] [1] "a" "b" "c" $n NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { b2 <- matrix(c(T, T, F, F, T, T), 2, 3); i2 <- matrix(c(1, 1, 2, 2, 3, 3), 2, 3); list(b=b2, i=i2) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClass2'); as.list(talc) } $b [,1] [,2] [,3] [1,] TRUE FALSE TRUE [2,] TRUE FALSE TRUE $i [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { b3 <- array(c(T, T, T, T, F, F, F, F, T, T, T, T), c(2, 2, 3)); i3 <- array(c(1, 1, 1, 1, 2, 2, 2, 2, 3, 3, 3, 3), c(2, 2, 3)); list(b=b3, i=i3) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClass3'); as.list(talc) } $b , , 1 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE , , 2 [,1] [,2] [1,] FALSE FALSE [2,] FALSE FALSE , , 3 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE $i , , 1 [,1] [,2] [1,] 1 1 [2,] 1 1 , , 2 [,1] [,2] [1,] 2 2 [2,] 2 2 , , 3 [,1] [,2] [1,] 3 3 [2,] 3 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixedWithObject'); as.list(talc)$i } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { c(2, 3, 4, 5) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.list(ta$integerArray2x3x4x5) } [1] 2 3 4 5 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { list('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.list(ta$stringArray) } [[1]] [1] "a" [[2]] [1] "b" [[3]] [1] "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { list(1, 'a', '1')) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.list(ta$heterogenousPrimitiveArray) } Error: unexpected ')' in "if (!any(R.version$engine == "FastR")) { list(1, 'a', '1'))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { list(T, F, T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.list(ta$booleanArray) } [[1]] [1] TRUE [[2]] [1] FALSE [[3]] [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { list(b=c(T, F, T), i=c(1, 2, 3)) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClass'); as.list(talc) } $b [1] TRUE FALSE TRUE $i [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { list(c('a', 'b', 'c'), c('a', 'b', 'c')) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.list(ta$stringArray2) } [[1]] [1] "a" "b" "c" [[2]] [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { list(c('a', 'b', 'c'), c(1, 2, 3)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.list(ta$heterogenousPrimitiveArray2HomDimensions) } [[1]] [1] "a" "b" "c" [[2]] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { list(c(T, F, T) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixedWithObject'); as.list(talc)$oa } Error: unexpected '}' in "if (!any(R.version$engine == "FastR")) { list(c(T, F, T) }" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { list(c(T, F, T), c(T, F, T)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.list(ta$booleanArray2) } [[1]] [1] TRUE FALSE TRUE [[2]] [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { list(list(c('a', 'b', 'c'), c('a', 'b', 'c')), list(c('a', 'b', 'c'), c('a', 'b', 'c'))) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.list(ta$stringArray3) } [[1]] [[1]][[1]] [1] "a" "b" "c" [[1]][[2]] [1] "a" "b" "c" [[2]] [[2]][[1]] [1] "a" "b" "c" [[2]][[2]] [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { list(list(c(T, F, T), c(T, F, T)), list(c(T, F, T), c(T, F, T))) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.list(ta$booleanArray3) } [[1]] [[1]][[1]] [1] TRUE FALSE TRUE [[1]][[2]] [1] TRUE FALSE TRUE [[2]] [[2]][[1]] [1] TRUE FALSE TRUE [[2]][[2]] [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsList# #if (!any(R.version$engine == "FastR")) { matrix(c(T, T, F, F, T, T), 2, 3) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixedWithObject'); as.list(talc)$b } [,1] [,2] [,3] [1,] TRUE FALSE TRUE [2,] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsMatrix# #if (!any(R.version$engine == "FastR")) { a2 <- c('a', 'a', 'b', 'b', 'c', 'c'); dim(a2) <- c(2, 3); as.matrix(a2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.matrix(ta$stringArray2) } [,1] [,2] [,3] [1,] "a" "b" "c" [2,] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsMatrix# #if (!any(R.version$engine == "FastR")) { a3 <- c('a', 'a', 'a', 'a', 'b', 'b', 'b', 'b', 'c', 'c', 'c', 'c'); dim(a3) <- c(2, 2, 3); as.matrix(a3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.matrix(ta$stringArray3) } [,1] [1,] "a" [2,] "a" [3,] "a" [4,] "a" [5,] "b" [6,] "b" [7,] "b" [8,] "b" [9,] "c" [10,] "c" [11,] "c" [12,] "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsMatrix# #if (!any(R.version$engine == "FastR")) { as.matrix(c('a', 'b', 'c')) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.matrix(ta$stringArray) } [,1] [1,] "a" [2,] "b" [3,] "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsMatrix# #if (!any(R.version$engine == "FastR")) { as.matrix(list(1, 'a', '1')) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.matrix(ta$heterogenousPrimitiveArray) } [,1] [1,] 1 [2,] "a" [3,] "1" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsMatrix# #if (!any(R.version$engine == "FastR")) { as.matrix(list(b=c(T, F, T), i=c(1L, 2L, 3L))) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClass'); as.matrix(talc) } [,1] b Logical,3 i Integer,3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsMatrix# #if (!any(R.version$engine == "FastR")) { as.matrix(list(c('a', 'b', 'c'), c(1L, 2L, 3L))) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.matrix(ta$heterogenousPrimitiveArray2HomDimensions) } [,1] [1,] Character,3 [2,] Integer,3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsRaw# #if (!any(R.version$engine == "FastR")) { as.raw(c(0x80, 0x00, 0x7f)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.raw(ta$byteArrayMinMax) } [1] 80 00 7f ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "character" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticCharArray); typeof(v) } [1] "character" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "character" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticStringArray); typeof(v) } [1] "character" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "double" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticDoubleArray); typeof(v) } [1] "double" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "double" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticFloatArray); typeof(v) } [1] "double" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "double" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticLongArray); typeof(v) } [1] "double" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "double" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$objectDoubleArray); typeof(v) } [1] "double" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "integer" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticByteArray); typeof(v) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "integer" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticIntegerArray); typeof(v) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "integer" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticShortArray); typeof(v) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "integer" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$objectIntArray); typeof(v) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { "logical" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticBooleanArray); typeof(v) } [1] "logical" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'integer' } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$hasNullIntArray); typeof(v) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray, ); typeof(v) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray2, ); typeof(v) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray2, ); typeof(v[[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray2, ); typeof(v[[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); typeof(v) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); typeof(v[[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); typeof(v[[1]][[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); typeof(v[[1]][[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); typeof(v[[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); typeof(v[[2]][[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); typeof(v[[2]][[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$hasNullIntArray); v[1] } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 2 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray2, ); length(v) } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 2 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); length(v) } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 3 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray, ); length(v) } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { 3 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$hasNullIntArray); v[3] } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { NA } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$hasNullIntArray); v[2] } [1] NA ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray, ); is.polyglot.value(v[[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray, ); is.polyglot.value(v[[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray, ); is.polyglot.value(v[[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray2, ); is.polyglot.value(v[[1]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray2, ); is.polyglot.value(v[[1]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray2, ); is.polyglot.value(v[[1]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray2, ); is.polyglot.value(v[[2]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray2, ); is.polyglot.value(v[[2]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray2, ); is.polyglot.value(v[[2]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[1]][[1]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[1]][[1]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[1]][[1]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[1]][[2]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[1]][[2]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[1]][[2]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[2]][[1]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[2]][[1]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[2]][[1]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[2]][[2]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[2]][[2]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$objectArray3, ); is.polyglot.value(v[[2]][[2]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticBooleanArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticByteArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticCharArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticDoubleArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticFloatArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticIntegerArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticLongArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticShortArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$fieldStaticStringArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$objectArray); is.list(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$objectDoubleArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); v <- as.vector(to$objectIntArray); is.vector(v) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { c(T, T, F, F, T, T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$booleanArray2) } [1] TRUE TRUE FALSE FALSE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { c(T, T, T, T, F, F, F, F, T, T, T, T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$booleanArray3) } [1] TRUE TRUE TRUE TRUE FALSE FALSE FALSE FALSE TRUE TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(talc) : ', '<<>>', 'no method for coercing this polyglot value to a vector', '<<>>', sep=' ') } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixed'); as.vector(talc) } Error in as.vector(talc) : no method for coercing this polyglot value to a vector ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { cat('[1] -9.223372e+18 2.000000e+00 2.147484e+09<<>>') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$longArrayMinMax) } [1] -9.223372e+18 2.000000e+00 2.147484e+09 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { character() } else { as.vector(new(java.type('java.lang.Integer[]'), 0L), 'character'); } character(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { integer() } else { as.vector(new(java.type('java.lang.Integer[]'), 1)) } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { list(1, 'a', '1') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$heterogenousPrimitiveArray) } [[1]] [1] 1 [[2]] [1] "a" [[3]] [1] "1" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { list(1, 2.1, 'a', TRUE, NULL) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); as.vector(to$mixedTypesArray) } [[1]] [1] 1 [[2]] [1] 2.1 [[3]] [1] "a" [[4]] [1] TRUE [[5]] NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { list(c('a', 'b', 'c'), c(1, 2, 3)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$heterogenousPrimitiveArray2HomDimensions) } [[1]] [1] "a" "b" "c" [[2]] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { list(c(1, 2, 3), c('a', 'b', 'c', 'd')) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$heterogenousArray2NotSquare) } [[1]] [1] 1 2 3 [[2]] [1] "a" "b" "c" "d" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { list(c(T, F, T), c(T, F, T)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$booleanArray2, 'list') } [[1]] [1] TRUE FALSE TRUE [[2]] [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { list(list(1, 'a', '1'), list(1, 'a', 'b', 2)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$heterogenousArray2NotSquare2) } [[1]] [[1]][[1]] [1] 1 [[1]][[2]] [1] "a" [[1]][[3]] [1] "1" [[2]] [[2]][[1]] [1] 1 [[2]][[2]] [1] "a" [[2]][[3]] [1] "b" [[2]][[4]] [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { list(list(1, 'a', '1'), list(2, 'b', '2')) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$heterogenousPrimitiveArray2) } [[1]] [[1]][[1]] [1] 1 [[1]][[2]] [1] "a" [[1]][[3]] [1] "1" [[2]] [[2]][[1]] [1] 2 [[2]][[2]] [1] "b" [[2]][[3]] [1] "2" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { list(list(c(1, 2, 3), list(2, 'b', '2')), list(c('a', 'b', 'c'), list(2, 'b', '2'))) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$heterogenousPrimitiveArray3) } [[1]] [[1]][[1]] [1] 1 2 3 [[1]][[2]] [[1]][[2]][[1]] [1] 2 [[1]][[2]][[2]] [1] "b" [[1]][[2]][[3]] [1] "2" [[2]] [[2]][[1]] [1] "a" "b" "c" [[2]][[2]] [[2]][[2]][[1]] [1] 2 [[2]][[2]][[2]] [1] "b" [[2]][[2]][[3]] [1] "2" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsVectorFromArray# #if (!any(R.version$engine == "FastR")) { list(list(c(T, F, T), c(T, F, T)), list(c(T, F, T), c(T, F, T))) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$booleanArray3, 'list') } [[1]] [[1]][[1]] [1] TRUE FALSE TRUE [[1]][[2]] [1] TRUE FALSE TRUE [[2]] [[2]][[1]] [1] TRUE FALSE TRUE [[2]][[2]] [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character("1.10000002384186") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticFloatObject) } [1] "1.10000002384186" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character("1.79769313486231e+308") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticDoubleObject) } [1] "1.79769313486231e+308" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character("NaN") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticNaNObject) } [1] "NaN" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character("a string") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticStringObject) } [1] "a string" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character("a") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticCharObject) } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(127) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticByteObject) } [1] "127" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(2147483647) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticIntegerObject) } [1] "2147483647" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { as.character(2147483648) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticLongObject) } [1] "2147483648" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(32767) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticShortObject) } [1] "32767" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(NULL) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticNullObject) } character(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStaticBooleanObject) } [1] "TRUE" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c("1", "2", "3")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStringIntArray); } [1] "1" "2" "3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c("1.1", "2.1", "3.1")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldDoubleArray); } [1] "1.1" "2.1" "3.1" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c("1.10000002384186", "2.09999990463257", "3.09999990463257")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldFloatArray); } [1] "1.10000002384186" "2.09999990463257" "3.09999990463257" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c("TRUE", "TRUE", "FALSE")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStringBooleanArray); } [1] "TRUE" "TRUE" "FALSE" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldCharArray); } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldStringArray); } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldByteArray); } [1] "1" "2" "3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldIntegerArray); } [1] "1" "2" "3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldLongArray); } [1] "1" "2" "3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldShortArray); } [1] "1" "2" "3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.character(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to$fieldBooleanArray); } [1] "TRUE" "FALSE" "TRUE" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex("a string") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticStringObject) } [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex("a") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticCharObject) } [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(1.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticFloatObject) } [1] 1.1+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(1.7976931348623157E308) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticDoubleObject) } [1] 1.797693e+308+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(127) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticByteObject) } [1] 127+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(2147483647) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticIntegerObject) } [1] 2147483647+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(2147483648) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticLongObject) } [1] 2147483648+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(32767) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticShortObject) } [1] 32767+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(NULL) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticNullObject) } complex(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(NaN) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticNaNObject) } [1] NaN+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStaticBooleanObject) } [1] 1+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(c("1", "2", "3")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStringIntArray); } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.complex(c("TRUE", "TRUE", "FALSE")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStringBooleanArray); } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.complex(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldCharArray); } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.complex(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldStringArray); } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldByteArray); } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldIntegerArray); } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldLongArray); } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldShortArray); } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldDoubleArray); } [1] 1.1+0i 2.1+0i 3.1+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldFloatArray); } [1] 1.1+0i 2.1+0i 3.1+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.complex(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to$fieldBooleanArray); } [1] 1+0i 0+0i 1+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double("a string") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticStringObject) } [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double("a") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticCharObject) } [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(1.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticFloatObject) } [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(1.7976931348623157E308) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticDoubleObject) } [1] 1.797693e+308 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(127) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticByteObject) } [1] 127 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(2147483647) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticIntegerObject) } [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(2147483648) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticLongObject) } [1] 2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(32767) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticShortObject) } [1] 32767 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(NULL) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticNullObject) } numeric(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(NaN) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticNaNObject) } [1] NaN ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStaticBooleanObject) } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(c("1", "2", "3")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStringIntArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.double(c("TRUE", "TRUE", "FALSE")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStringBooleanArray); } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.double(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldCharArray); } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.double(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldStringArray); } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldByteArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldIntegerArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldLongArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldShortArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldDoubleArray); } [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldFloatArray); } [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.double(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to$fieldBooleanArray); } [1] 1 0 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression("a string") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticStringObject) } expression("a string") ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression("a") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticCharObject) } expression("a") ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(1.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticFloatObject) } expression(1.1) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { as.expression(1.7976931348623157E308) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticDoubleObject) } expression(1.79769313486232e+308) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(127) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticByteObject) } expression(127) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(2147483647) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticIntegerObject) } expression(2147483647) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { as.expression(2147483648) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticLongObject) } expression(2147483648) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(32767) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticShortObject) } expression(32767) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(NULL) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticNullObject) } expression(NULL) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(NaN) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticNaNObject) } expression(NaN) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStaticBooleanObject) } expression(TRUE) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c("1", "2", "3")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStringIntArray); } expression("1", "2", "3") ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c("TRUE", "TRUE", "FALSE")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStringBooleanArray); } expression("TRUE", "TRUE", "FALSE") ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldCharArray); } expression("a", "b", "c") ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldStringArray); } expression("a", "b", "c") ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldByteArray); } expression(1, 2, 3) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldIntegerArray); } expression(1, 2, 3) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldLongArray); } expression(1, 2, 3) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldShortArray); } expression(1, 2, 3) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldDoubleArray); } expression(1.1, 2.1, 3.1) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldFloatArray); } expression(1.1, 2.1, 3.1) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.expression(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to$fieldBooleanArray); } expression(TRUE, FALSE, TRUE) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer("a string") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticStringObject) } [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer("a") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticCharObject) } [1] NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(1.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticFloatObject) } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(1.7976931348623157E308) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticDoubleObject) } [1] NA Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(127) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticByteObject) } [1] 127 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(2147483647) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticIntegerObject) } [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(2147483648) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticLongObject) } [1] NA Warning message: NAs introduced by coercion to integer range ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(32767) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticShortObject) } [1] 32767 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(NULL) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticNullObject) } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(NaN) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticNaNObject) } [1] NA ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStaticBooleanObject) } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(c("1", "2", "3")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStringIntArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.integer(c("TRUE", "TRUE", "FALSE")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStringBooleanArray); } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.integer(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldCharArray); } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.integer(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldStringArray); } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldByteArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldIntegerArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldLongArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldShortArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldDoubleArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldFloatArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.integer(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to$fieldBooleanArray); } [1] 1 0 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical("a string") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticStringObject) } [1] NA ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical("a") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticCharObject) } [1] NA ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(1.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticFloatObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(1.7976931348623157E308) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticDoubleObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(127) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticByteObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(2147483647) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticIntegerObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(2147483648) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticLongObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(32767) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticShortObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(NULL) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticNullObject) } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(NaN) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticNaNObject) } [1] NA ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStaticBooleanObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c("1", "2", "3")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStringIntArray); } [1] NA NA NA ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c("TRUE", "TRUE", "FALSE")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStringBooleanArray); } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldCharArray); } [1] NA NA NA ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldStringArray); } [1] NA NA NA ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldByteArray); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldIntegerArray); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldLongArray); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldShortArray); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldDoubleArray); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldFloatArray); } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.logical(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to$fieldBooleanArray); } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.raw("a string") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticStringObject) } [1] 00 Warning messages: 1: NAs introduced by coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.raw("a") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticCharObject) } [1] 00 Warning messages: 1: NAs introduced by coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(1.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticFloatObject) } [1] 01 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.raw(1.7976931348623157E308) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticDoubleObject) } [1] 00 Warning messages: 1: NAs introduced by coercion to integer range 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(127) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticByteObject) } [1] 7f ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(2147483647) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticIntegerObject) } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.raw(2147483648) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticLongObject) } [1] 00 Warning messages: 1: NAs introduced by coercion to integer range 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(32767) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticShortObject) } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(NULL) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticNullObject) } raw(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.raw(NaN) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticNaNObject) } [1] 00 Warning message: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStaticBooleanObject) } [1] 01 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(c("1", "2", "3")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStringIntArray); } [1] 01 02 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.raw(c("TRUE", "TRUE", "FALSE")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStringBooleanArray); } [1] 00 00 00 Warning messages: 1: NAs introduced by coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.raw(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldCharArray); } [1] 00 00 00 Warning messages: 1: NAs introduced by coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.raw(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldStringArray); } [1] 00 00 00 Warning messages: 1: NAs introduced by coercion 2: out-of-range values treated as 0 in coercion to raw ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldByteArray); } [1] 01 02 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldIntegerArray); } [1] 01 02 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldLongArray); } [1] 01 02 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldShortArray); } [1] 01 02 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldDoubleArray); } [1] 01 02 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldFloatArray); } [1] 01 02 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.raw(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to$fieldBooleanArray); } [1] 01 00 01 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol("a string") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticStringObject) } `a string` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol("a") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticCharObject) } a ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { as.symbol(1.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticFloatObject) } `1.1` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { as.symbol(1.7976931348623157E308) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticDoubleObject) } `1.797693e+308` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(127) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticByteObject) } `127` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(2147483647) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticIntegerObject) } `2147483647` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { as.symbol(2147483648) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticLongObject) } `2147483648` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(32767) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticShortObject) } `32767` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreErrorContext# #if (!any(R.version$engine == "FastR")) { as.symbol(NULL) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticNullObject) } Error in as.symbol(NULL) : invalid type/length (symbol/0) in vector allocation ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(NaN) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticNaNObject) } `NaN` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStaticBooleanObject) } `TRUE` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(c("1", "2", "3")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStringIntArray); } `1` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(c("TRUE", "TRUE", "FALSE")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStringBooleanArray); } `TRUE` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldCharArray); } a ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldStringArray); } a ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldByteArray); } `1` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldIntegerArray); } `1` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldLongArray); } `1` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldShortArray); } `1` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldDoubleArray); } `1.1` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { as.symbol(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldFloatArray); } `1.1` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.symbol(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to$fieldBooleanArray); } `TRUE` ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector("a string") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticStringObject) } [1] "a string" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector("a") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticCharObject) } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(1.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticFloatObject) } [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(1.7976931348623157E308) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticDoubleObject) } [1] 1.797693e+308 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(127) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticByteObject) } [1] 127 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(2147483647) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticIntegerObject) } [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(2147483648) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticLongObject) } [1] 2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(32767) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticShortObject) } [1] 32767 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(NULL) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticNullObject) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(NaN) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticNaNObject) } [1] NaN ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStaticBooleanObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c("1", "2", "3")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStringIntArray); } [1] "1" "2" "3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c("TRUE", "TRUE", "FALSE")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStringBooleanArray); } [1] "TRUE" "TRUE" "FALSE" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldCharArray); } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldStringArray); } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldByteArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldIntegerArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldLongArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c(1, 2, 3)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldShortArray); } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldDoubleArray); } [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldFloatArray); } [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { as.vector(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to$fieldBooleanArray); } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { cat('Error in as.character(to) : ', '<<>>', 'no method for coercing this polyglot value to a vector', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(to); } Error in as.character(to) : no method for coercing this polyglot value to a vector ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { cat('Error in as.complex(to) : ', '<<>>', 'cannot coerce type \'polyglot.value\' to vector of type \'complex\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(to); } Error in as.complex(to) : cannot coerce type 'polyglot.value' to vector of type 'complex' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { cat('Error in as.double(to) : ', '<<>>', 'no method for coercing this polyglot value to a vector', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(to); } Error in as.double(to) : no method for coercing this polyglot value to a vector ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX#Output.IgnoreErrorContext# #if (!any(R.version$engine == "FastR")) { cat('Error in as.expression(to) : ', '<<>>', 'no method for coercing this polyglot value to a vector', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.expression(to); } Error in as.expression(to) : no method for coercing this polyglot value to a vector ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { cat('Error in as.integer(to) : ', '<<>>', 'no method for coercing this polyglot value to a vector', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(to); } Error in as.integer(to) : no method for coercing this polyglot value to a vector ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { cat('Error in as.logical(to) : ', '<<>>', 'no method for coercing this polyglot value to a vector', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.logical(to); } Error in as.logical(to) : no method for coercing this polyglot value to a vector ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { cat('Error in as.raw(to) : ', '<<>>', 'cannot coerce type \'polyglot.value\' to vector of type \'raw\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.raw(to); } Error in as.raw(to) : cannot coerce type 'polyglot.value' to vector of type 'raw' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { cat('Error in as.symbol(to) : ', '<<>>', 'no method for coercing this polyglot value to a vector', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.symbol(to); } Error in as.symbol(to) : no method for coercing this polyglot value to a vector ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAsXXX# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(to) : ', '<<>>', 'no method for coercing this polyglot value to a vector', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.vector(to); } Error in as.vector(to) : no method for coercing this polyglot value to a vector ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAttributes# #if (!any(R.version$engine == "FastR")) { NULL } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); attributes(to) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAttributes# #if (!any(R.version$engine == "FastR")) { cat('Error in attr(to, "a") <- "a" : polyglot value cannot be attributed', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); attr(to, 'a')<-'a' } Error in attr(to, "a") <- "a" : polyglot value cannot be attributed ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testAttributes# #if (!any(R.version$engine == "FastR")) { cat('Error in attr(to, which = "a") : polyglot value cannot be attributed', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); attr(to, which = 'a') } Error in attr(to, which = "a") : polyglot value cannot be attributed ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCRBind# #if (!any(R.version$engine == "FastR")) { v <- c(1, 2, 3); cbind(v) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- ta$integerArray; cbind(v) } v [1,] 1 [2,] 2 [3,] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCRBind# #if (!any(R.version$engine == "FastR")) { v <- c(1, 2, 3); cbind(v, 1) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- ta$integerArray; cbind(v, 1) } v [1,] 1 1 [2,] 2 1 [3,] 3 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCRBind# #if (!any(R.version$engine == "FastR")) { v <- c(1, 2, 3); rbind(v) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- ta$integerArray; rbind(v) } [,1] [,2] [,3] v 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCRBind# #if (!any(R.version$engine == "FastR")) { v <- c(1, 2, 3); rbind(v, 1) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- ta$integerArray; rbind(v, 1) } [,1] [,2] [,3] v 1 2 3 1 1 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCRBind# #if (!any(R.version$engine == "FastR")) { v1 <- c(1, 1, 2, 2, 3, 3); dim(v1) <- c(2,3); v2 <- c('a', 'a', 'b', 'b', 'c', 'c'); dim(v2) <- c(2,3); cbind(v1, v2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v1 <- ta$integerArray2; v2 <- ta$stringArray2; cbind(v1, v2) } [,1] [,2] [,3] [,4] [,5] [,6] [1,] "1" "2" "3" "a" "b" "c" [2,] "1" "2" "3" "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCRBind# #if (!any(R.version$engine == "FastR")) { v1 <- c(1, 1, 2, 2, 3, 3); dim(v1) <- c(2,3); v2 <- c('a', 'a', 'b', 'b', 'c', 'c'); dim(v2) <- c(2,3); rbind(v1, v2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v1 <- ta$integerArray2; v2 <- ta$stringArray2; rbind(v1, v2) } [,1] [,2] [,3] [1,] "1" "2" "3" [2,] "1" "2" "3" [3,] "a" "b" "c" [4,] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCRBind# #if (!any(R.version$engine == "FastR")) { v1 <- c(1, 1, 2, 2, 3, 3); dim(v1) <- c(2,3); v2 <- c('a', 'b', 'c'); cbind(v1, v2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v1 <- ta$integerArray2; v2 <- ta$stringArray; cbind(v1, v2) } v2 [1,] "1" "2" "3" "a" [2,] "1" "2" "3" "b" Warning message: In cbind(v1, v2) : number of rows of result is not a multiple of vector length (arg 2) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCRBind# #if (!any(R.version$engine == "FastR")) { v1 <- c(1, 1, 2, 2, 3, 3); dim(v1) <- c(2,3); v2 <- c('a', 'b', 'c'); rbind(v1, v2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v1 <- ta$integerArray2; v2 <- ta$stringArray; rbind(v1, v2) } [,1] [,2] [,3] "1" "2" "3" "1" "2" "3" v2 "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCRBind#Output.IgnoreWhitespace# #if (!any(R.version$engine == "FastR")) { v1 <- c(1, 2, 3); v2 <- c('a', 'b', 'c'); cbind(v1, v2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v1 <- ta$integerArray; v2 <- ta$stringArray; cbind(v1, v2) } v1 v2 [1,] "1" "a" [2,] "2" "b" [3,] "3" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCRBind#Output.IgnoreWhitespace# #if (!any(R.version$engine == "FastR")) { v1 <- c(1, 2, 3); v2 <- c('a', 'b', 'c'); rbind(v1, v2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v1 <- ta$integerArray; v2 <- ta$stringArray; rbind(v1, v2) } [,1] [,2] [,3] v1 "1" "2" "3" v2 "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCastPipelines# #if (!any(R.version$engine == "FastR")) { 12 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');sum(ta$integerArray2) } [1] 12 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCastPipelines# #if (!any(R.version$engine == "FastR")) { 6 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');sum(ta$integerArray) } [1] 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCastPipelines# #if (!any(R.version$engine == "FastR")) { cat('Error in sum(ta$integerArray2NotSquare) : ', '<<>>', 'A non rectangular array cannot be converted to a vector, only to a list.', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');sum(ta$integerArray2NotSquare) } Error in sum(ta$integerArray2NotSquare) : A non rectangular array cannot be converted to a vector, only to a list. ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testClassAsParameter#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { "com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$classAsArg(java.type(com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass)) } [1] "com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testClassUpdate# #if (!any(R.version$engine == "FastR")) { 'test' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); jia <- ta$integerArray; class(jia) <- 'test'; class(jia) } [1] "test" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testClassUpdate# #if (!any(R.version$engine == "FastR")) { cat('Error in class(jo) <- \"test\" : ', '<<>>', 'invalid \'type\' (polyglot.value) of argument', '<<>>', sep=' ') } else { jo <- new('java.lang.Object'); class(jo) <- 'test'; } Error in class(jo) <- "test" : invalid 'type' (polyglot.value) of argument ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { 'list' } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'); t <- .fastr.interop.new(tc); t1 <- .fastr.interop.new(tc); class(c(t, t1)) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { 'list' } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); class(c(1, t)) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { 'list' } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); class(c(t, 1)) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { 'list' } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); class(c(to)) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c("a", "b", "c") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldCharArray) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c("a", "b", "c") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldStringArray) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c("a", "b", "c", "a", "b", "c") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldCharArray, to$fieldCharArray) } [1] "a" "b" "c" "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c("a", "b", "c", "a", "b", "c") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldStringArray, to$fieldStringArray) } [1] "a" "b" "c" "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldByteArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldLongArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldShortArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldByteArray, to$fieldByteArray) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldLongArray, to$fieldLongArray) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldShortArray, to$fieldShortArray) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldDoubleArray) } [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldFloatArray) } [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1, 1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldDoubleArray, to$fieldDoubleArray) } [1] 1.1 2.1 3.1 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1, 1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldFloatArray, to$fieldFloatArray) } [1] 1.1 2.1 3.1 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldIntegerArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L, 1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldIntegerArray, to$fieldIntegerArray) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldBooleanArray) } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineForeignObjects# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE, TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(to$fieldBooleanArray, to$fieldBooleanArray) } [1] TRUE FALSE TRUE TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineInteropTypes# #if (!any(R.version$engine == "FastR")) { 'interopt.byte' } else { class(c(.fastr.interop.asByte(123))) } [1] "interopt.byte" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineInteropTypes# #if (!any(R.version$engine == "FastR")) { 'list' } else { class(c(.fastr.interop.asByte(123), .fastr.interop.asByte(234))) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineInteropTypes# #if (!any(R.version$engine == "FastR")) { 'list' } else { class(c(.fastr.interop.asByte(123), 1)) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testCombineInteropTypes# #if (!any(R.version$engine == "FastR")) { 'list' } else { class(c(1, .fastr.interop.asByte(123))) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.character(c(1.1, 2.1, 3.1))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.character(as.vector(to$fieldDoubleArray))) } [1] "as.character(c(1.1, 2.1, 3.1))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.character(c(1L, 2L, 3L))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.character(as.vector(to$fieldIntegerArray))) } [1] "as.character(c(1L, 2L, 3L))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.character(c(TRUE, FALSE, TRUE))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.character(as.vector(to$fieldBooleanArray))) } [1] "as.character(c(TRUE, FALSE, TRUE))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.complex(c(1.1, 2.1, 3.1))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.complex(as.vector(to$fieldDoubleArray))) } [1] "as.complex(c(1.1, 2.1, 3.1))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.complex(c(1L, 2L, 3L))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.complex(as.vector(to$fieldIntegerArray))) } [1] "as.complex(c(1L, 2L, 3L))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.complex(c(TRUE, FALSE, TRUE))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.complex(as.vector(to$fieldBooleanArray))) } [1] "as.complex(c(TRUE, FALSE, TRUE))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.complex(c(\"a\", \"b\", \"c\"))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.complex(as.vector(to$fieldStringArray))) } [1] "as.complex(c(\"a\", \"b\", \"c\"))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.double(c(1L, 2L, 3L))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.double(as.vector(to$fieldIntegerArray))) } [1] "as.double(c(1L, 2L, 3L))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.double(c(TRUE, FALSE, TRUE))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.double(as.vector(to$fieldBooleanArray))) } [1] "as.double(c(TRUE, FALSE, TRUE))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.double(c(\"a\", \"b\", \"c\"))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.double(as.vector(to$fieldStringArray))) } [1] "as.double(c(\"a\", \"b\", \"c\"))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.integer(c(1.1, 2.1, 3.1))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.integer(as.vector(to$fieldDoubleArray))) } [1] "as.integer(c(1.1, 2.1, 3.1))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.integer(c(TRUE, FALSE, TRUE))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.integer(as.vector(to$fieldBooleanArray))) } [1] "as.integer(c(TRUE, FALSE, TRUE))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { "as.integer(c(\"a\", \"b\", \"c\"))" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));deparse(as.integer(as.vector(to$fieldStringArray))) } [1] "as.integer(c(\"a\", \"b\", \"c\"))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { as.character(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.character(as.vector(to$fieldDoubleArray))))) } [1] "1.1" "2.1" "3.1" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { as.character(c(1L, 2L, 3L)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.character(as.vector(to$fieldIntegerArray))))) } [1] "1" "2" "3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { as.character(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.character(as.vector(to$fieldBooleanArray))))) } [1] "TRUE" "FALSE" "TRUE" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure#Output.IgnoreWarningContext# #if (!any(R.version$engine == "FastR")) { as.complex(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.complex(as.vector(to$fieldStringArray))))) } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { as.complex(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.complex(as.vector(to$fieldDoubleArray))))) } [1] 1.1+0i 2.1+0i 3.1+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { as.complex(c(1L, 2L, 3L)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.complex(as.vector(to$fieldIntegerArray))))) } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { as.complex(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.complex(as.vector(to$fieldBooleanArray))))) } [1] 1+0i 0+0i 1+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure#Output.IgnoreWarningContext# #if (!any(R.version$engine == "FastR")) { as.double(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.double(as.vector(to$fieldStringArray))))) } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { as.double(c(1L, 2L, 3L)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.double(as.vector(to$fieldIntegerArray))))) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { as.double(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.double(as.vector(to$fieldBooleanArray))))) } [1] 1 0 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure#Output.IgnoreWarningContext# #if (!any(R.version$engine == "FastR")) { as.integer(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.integer(as.vector(to$fieldStringArray))))) } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { as.integer(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.integer(as.vector(to$fieldDoubleArray))))) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDeparseForeignArrayClosure# #if (!any(R.version$engine == "FastR")) { as.integer(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));eval(parse(text=deparse(as.integer(as.vector(to$fieldBooleanArray))))) } [1] 1 0 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { NULL } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta$heterogenousPrimitiveArray) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { NULL } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta$integerArray) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { NULL } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta$integerArray2NotSquare) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { NULL } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta$integerArray3NotSquare) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { NULL } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { c(2, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta$heterogenousPrimitiveArray3) } [1] 2 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { c(2, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta$integerArray3) } [1] 2 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { c(2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta$heterogenousPrimitiveArray2) } [1] 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { c(2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta$heterogenousPrimitiveArray2HomDimensions) } [1] 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { c(2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta$integerArray2) } [1] 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDim# #if (!any(R.version$engine == "FastR")) { c(2, 3, 4, 5) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); dim(ta$integerArray2x3x4x5) } [1] 2 3 4 5 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDoubleNA# #if (!any(R.version$engine == "FastR")) { NaN } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleNALongbits } [1] NaN ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDoubleNA# #if (!any(R.version$engine == "FastR")) { NaN } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleNaN } [1] NaN ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDoubleNA# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.na(to$fieldDoubleNALongbits) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDoubleNA# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.na(to$fieldDoubleNaN) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDoubleNA# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.nan(to$fieldDoubleNALongbits) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testDoubleNA# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.nan(to$fieldDoubleNaN) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testElseIf# #if (!any(R.version$engine == "FastR")) { c(1,1,1) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); ifelse(ta$integerArray, 1, 2) } [1] 1 1 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testElseIf# #if (!any(R.version$engine == "FastR")) { c(1,2,1) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); ifelse(ta$booleanArray, 1, 2) } [1] 1 2 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testElseIf# #if (!any(R.version$engine == "FastR")) { c(NA, NA, NA) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); ifelse(ta$stringArray, 1, 2) } [1] NA NA NA ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testElseIf# #if (!any(R.version$engine == "FastR")) { cat('Error in as.logical(test) : ', '<<>>', 'no method for coercing this polyglot value to a vector', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); ifelse(ta) } Error in as.logical(test) : no method for coercing this polyglot value to a vector ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('42Error in polyglot evaluation : java.lang.RuntimeException: msg<<>>') } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');f <- function() {on.exit(cat('42')); to$exception('java.lang.RuntimeException', 'msg')}; f() } 42Error in polyglot evaluation : java.lang.RuntimeException: msg ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in java.type("no.class") : ', '<<>>', ' java.lang.ClassNotFoundException: no.class not found', '<<>>', sep='') } else { java.type('no.class') } Error in java.type("no.class") : java.lang.ClassNotFoundException: no.class not found ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException<<>>3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:65)<<>>2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:58)<<>>1: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.exception(TestExceptionsClass.java:50)', '<<>>', sep='') } else { options(polyglotError = 'traceback'); to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');to$exception('java.io.IOException') } Error in polyglot evaluation : java.io.IOException 3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:65) 2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:58) 1: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.exception(TestExceptionsClass.java:50) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException<<>>4: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:65)<<>>3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:58)<<>>2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.(TestExceptionsClass.java:35)<<>>1: new("com.oracle.truffle.r.test.library.fastr.TestExceptionsClass", ', '<<>>', sep='') } else { options(polyglotError = 'traceback'); new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.io.IOException') } Error in polyglot evaluation : java.io.IOException 4: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:65) 3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:58) 2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.(TestExceptionsClass.java:35) 1: new("com.oracle.truffle.r.test.library.fastr.TestExceptionsClass", ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException', '<<>>', sep='') } else { new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.io.IOException') } Error in polyglot evaluation : java.io.IOException ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException', '<<>>', sep='') } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');to$exception('java.io.IOException') } Error in polyglot evaluation : java.io.IOException ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException', '<<>>', sep='') } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');tryCatch(to$exception('java.io.IOException'), error = function(e) cat(paste0(e$message, '<<>>'))) } Error in polyglot evaluation : java.io.IOException ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException', '<<>>', sep='') } else { tryCatch(new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.io.IOException'), error = function(e) cat(paste0(e$message, '<<>>'))) } Error in polyglot evaluation : java.io.IOException ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException: msg<<>>2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:65)<<>>1: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.exception(TestExceptionsClass.java:54)', '<<>>', sep='') } else { options(polyglotError = 'traceback'); to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');to$exception('java.io.IOException', 'msg') } Error in polyglot evaluation : java.io.IOException: msg 2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:65) 1: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.exception(TestExceptionsClass.java:54) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException: msg<<>>3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:65)<<>>2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.(TestExceptionsClass.java:41)<<>>1: new("com.oracle.truffle.r.test.library.fastr.TestExceptionsClass", ', '<<>>', sep='') } else { options(polyglotError = 'traceback'); new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.io.IOException', 'msg') } Error in polyglot evaluation : java.io.IOException: msg 3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:65) 2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.(TestExceptionsClass.java:41) 1: new("com.oracle.truffle.r.test.library.fastr.TestExceptionsClass", ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException: msg', '<<>>', sep='') } else { new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.io.IOException', 'msg') } Error in polyglot evaluation : java.io.IOException: msg ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException: msg', '<<>>', sep='') } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');to$exception('java.io.IOException', 'msg') } Error in polyglot evaluation : java.io.IOException: msg ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException: msg', '<<>>', sep='') } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');tryCatch(to$exception('java.io.IOException', 'msg'), error = function(e) cat(paste0(e$message, '<<>>'))) } Error in polyglot evaluation : java.io.IOException: msg ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.io.IOException: msg', '<<>>', sep='') } else { tryCatch(new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.io.IOException', 'msg'), error = function(e) cat(paste0(e$message, '<<>>'))) } Error in polyglot evaluation : java.io.IOException: msg ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException<<>>3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:63)<<>>2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:58)<<>>1: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.exception(TestExceptionsClass.java:50)', '<<>>', sep='') } else { options(polyglotError = 'traceback'); to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');to$exception('java.lang.RuntimeException') } Error in polyglot evaluation : java.lang.RuntimeException 3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:63) 2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:58) 1: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.exception(TestExceptionsClass.java:50) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException<<>>4: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:63)<<>>3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:58)<<>>2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.(TestExceptionsClass.java:35)<<>>1: new("com.oracle.truffle.r.test.library.fastr.TestExceptionsClass", ', '<<>>', sep='') } else { options(polyglotError = 'traceback'); new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.lang.RuntimeException') } Error in polyglot evaluation : java.lang.RuntimeException 4: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:63) 3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:58) 2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.(TestExceptionsClass.java:35) 1: new("com.oracle.truffle.r.test.library.fastr.TestExceptionsClass", ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException', '<<>>', sep='') } else { new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.lang.RuntimeException') } Error in polyglot evaluation : java.lang.RuntimeException ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException', '<<>>', sep='') } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');to$exception('java.lang.RuntimeException') } Error in polyglot evaluation : java.lang.RuntimeException ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException', '<<>>', sep='') } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');tryCatch(to$exception('java.lang.RuntimeException'), error = function(e) cat(paste0(e$message, '<<>>'))) } Error in polyglot evaluation : java.lang.RuntimeException ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException', '<<>>', sep='') } else { tryCatch(new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.lang.RuntimeException'), error = function(e) cat(paste0(e$message, '<<>>'))) } Error in polyglot evaluation : java.lang.RuntimeException ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException: msg<<>>2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:63)<<>>1: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.exception(TestExceptionsClass.java:54)', '<<>>', sep='') } else { options(polyglotError = 'traceback'); to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');to$exception('java.lang.RuntimeException', 'msg') } Error in polyglot evaluation : java.lang.RuntimeException: msg 2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:63) 1: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.exception(TestExceptionsClass.java:54) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException: msg<<>>3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:63)<<>>2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.(TestExceptionsClass.java:41)<<>>1: new("com.oracle.truffle.r.test.library.fastr.TestExceptionsClass", ', '<<>>', sep='') } else { options(polyglotError = 'traceback'); new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.lang.RuntimeException', 'msg') } Error in polyglot evaluation : java.lang.RuntimeException: msg 3: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.throwEx(TestExceptionsClass.java:63) 2: at com.oracle.truffle.r.test.library.fastr.TestExceptionsClass.(TestExceptionsClass.java:41) 1: new("com.oracle.truffle.r.test.library.fastr.TestExceptionsClass", ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException: msg', '<<>>', sep='') } else { new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.lang.RuntimeException', 'msg') } Error in polyglot evaluation : java.lang.RuntimeException: msg ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException: msg', '<<>>', sep='') } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');to$exception('java.lang.RuntimeException', 'msg') } Error in polyglot evaluation : java.lang.RuntimeException: msg ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException: msg', '<<>>', sep='') } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass');tryCatch(to$exception('java.lang.RuntimeException', 'msg'), error = function(e) cat(paste0(e$message, '<<>>'))) } Error in polyglot evaluation : java.lang.RuntimeException: msg ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('Error in polyglot evaluation : java.lang.RuntimeException: msg', '<<>>', sep='') } else { tryCatch(new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass', 'java.lang.RuntimeException', 'msg'), error = function(e) cat(paste0(e$message, '<<>>'))) } Error in polyglot evaluation : java.lang.RuntimeException: msg ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #if (!any(R.version$engine == "FastR")) { cat('java.lang.ClassNotFoundException: no.class not found<<>>') } else { tryCatch(java.type('no.class'), error = function(e) cat(paste0(e$message, '<<>>'))) } java.lang.ClassNotFoundException: no.class not found ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testException# #options(error = NULL) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testExecutableIsFunction# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.function(to$methodInteger) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray, T); typeof(v) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray2, T); typeof(v) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray2, T); typeof(v[[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray2, T); typeof(v[[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); typeof(v) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); typeof(v[[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); typeof(v[[1]][[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); typeof(v[[1]][[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); typeof(v[[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); typeof(v[[2]][[1]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 'list' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); typeof(v[[2]][[2]]) } [1] "list" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 2 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray2, T); length(v) } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 2 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); length(v) } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { 3 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray, T); length(v) } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { NULL } else { .fastr.interop.asVector(1) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { NULL } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixedWithObject'); .fastr.interop.asVector(talc, T)$n } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray, T); is.polyglot.value(v[[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray, T); is.polyglot.value(v[[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray, T); is.polyglot.value(v[[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray2, T); is.polyglot.value(v[[1]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray2, T); is.polyglot.value(v[[1]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray2, T); is.polyglot.value(v[[1]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray2, T); is.polyglot.value(v[[2]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray2, T); is.polyglot.value(v[[2]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray2, T); is.polyglot.value(v[[2]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[1]][[1]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[1]][[1]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[1]][[1]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[1]][[2]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[1]][[2]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[1]][[2]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[2]][[1]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[2]][[1]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[2]][[1]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[2]][[2]][[1]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[2]][[2]][[2]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- .fastr.interop.asVector(ta$objectArray3, T); is.polyglot.value(v[[2]][[2]][[3]]) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { b2 <- matrix(c(T, T, F, F, T, T), 2, 3); i <- c(1, 2, 3); oa <- ; list(b=b2, i=i, oa=oa, n=NULL) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixed'); .fastr.interop.asVector(talc, T) } Error: unexpected ';' in "if (!any(R.version$engine == "FastR")) { b2 <- matrix(c(T, T, F, F, T, T), 2, 3); i <- c(1, 2, 3); oa <- ;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { b2 <- matrix(c(T, T, F, F, T, T), 2, 3); i <- c(1, 2, 3); oa <- ; list(b=b2, i=i, oa=oa, n=NULL) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixedWithObject'); .fastr.interop.asVector(talc, T)$o } Error: unexpected ';' in "if (!any(R.version$engine == "FastR")) { b2 <- matrix(c(T, T, F, F, T, T), 2, 3); i <- c(1, 2, 3); oa <- ;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { b2 <- matrix(c(T, T, F, F, T, T), 2, 3); i2 <- matrix(c(1, 1, 2, 2, 3, 3), 2, 3); list(b=b2, i=i2) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClass2'); .fastr.interop.asVector(talc, T) } $b [,1] [,2] [,3] [1,] TRUE FALSE TRUE [2,] TRUE FALSE TRUE $i [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { b3 <- array(c(T, T, T, T, F, F, F, F, T, T, T, T), c(2, 2, 3)); i3 <- array(c(1, 1, 1, 1, 2, 2, 2, 2, 3, 3, 3, 3), c(2, 2, 3)); list(b=b3, i=i3) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClass3'); .fastr.interop.asVector(talc, T) } $b , , 1 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE , , 2 [,1] [,2] [1,] FALSE FALSE [2,] FALSE FALSE , , 3 [,1] [,2] [1,] TRUE TRUE [2,] TRUE TRUE $i , , 1 [,1] [,2] [1,] 1 1 [2,] 1 1 , , 2 [,1] [,2] [1,] 2 2 [2,] 2 2 , , 3 [,1] [,2] [1,] 3 3 [2,] 3 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { c(1, 1, 1, 1, 2, 2, 2, 2, 3, 3, 3, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$shortArray3, recursive=TRUE, dropDimensions=TRUE) } [1] 1 1 1 1 2 2 2 2 3 3 3 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { c(1, 1, 2, 2, 3, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$shortArray2, recursive=TRUE, dropDimensions=TRUE) } [1] 1 1 2 2 3 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$shortArray, recursive=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$shortArray, recursive=TRUE, dropDimensions=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$shortArray, recursive=TRUE, dropDimensions=TRUE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixedWithObject'); .fastr.interop.asVector(talc, T)$i } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { cat('[[1]]<<>>[polyglot value]<<>><<>>[[2]]<<>>[polyglot value]<<>><<>>') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$shortArray2, recursive=FALSE) } [[1]] [polyglot value] [[2]] [polyglot value] ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { cat('[[1]]<<>>[polyglot value]<<>><<>>[[2]]<<>>[polyglot value]<<>><<>>') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$shortArray3, recursive=FALSE) } [[1]] [polyglot value] [[2]] [polyglot value] ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { character() } else { ja <- new(java.type('java.lang.String[]'), 0L); .fastr.interop.asVector(ja) } character(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { character() } else { ja <- new(java.type('java.lang.String[]'), 1L); .fastr.interop.asVector(ja) } character(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { list(1, 'a', '1')) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$heterogenousPrimitiveArray) } Error: unexpected ')' in "if (!any(R.version$engine == "FastR")) { list(1, 'a', '1'))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { list(c('a', 'b', 'c'), c(1, 2, 3)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$heterogenousPrimitiveArray2HomDimensions, T) } [[1]] [1] "a" "b" "c" [[2]] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { list(c(T, F, T), c('a', 'b', 'c')) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixedWithObject'); .fastr.interop.asVector(talc, T)$oa } [[1]] [1] TRUE FALSE TRUE [[2]] [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { matrix(c(T, T, F, F, T, T), c(2,3)) } else { talc <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestAsListClassMixedWithObject'); .fastr.interop.asVector(talc, T)$b } [,1] [,2] [,3] [1,] TRUE FALSE TRUE [2,] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { v <- c(1, 1, 1, 1, 2, 2, 2, 2, 3, 3, 3, 3)); dim(v) <- c(2, 2, 3); v } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$shortArray3, recursive=TRUE, dropDimensions=FALSE) } Error: unexpected ')' in "if (!any(R.version$engine == "FastR")) { v <- c(1, 1, 1, 1, 2, 2, 2, 2, 3, 3, 3, 3))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFastrInteropAsVector# #if (!any(R.version$engine == "FastR")) { v <- c(1, 1, 2, 2, 3, 3)); dim(v) <- c(2, 3); v } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); .fastr.interop.asVector(ta$shortArray2, recursive=TRUE, dropDimensions=FALSE) } Error: unexpected ')' in "if (!any(R.version$engine == "FastR")) { v <- c(1, 1, 2, 2, 3, 3))" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { "a string" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringObject } [1] "a string" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { "a" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldChar } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { "a" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldCharObject } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { -2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldDoubleIntegerMin } [1] -2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { -2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldDoubleIntegerMinObject } [1] -2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { -2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerMin } [1] -2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { -2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerMinObject } [1] -2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 1.1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldFloat } [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 1.1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldFloatObject } [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 1.7976931348623157E308 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldDouble } [1] 1.797693e+308 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 1.7976931348623157E308 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldDoubleObject } [1] 1.797693e+308 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 127 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldByte } [1] 127 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 127 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldByteObject } [1] 127 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 2147483647 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldInteger } [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 2147483647 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerObject } [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldLong } [1] 2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldLongObject } [1] 2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 32767 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldShort } [1] 32767 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { 32767 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldShortObject } [1] 32767 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { NULL } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldNullObject } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { NaN } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldDoubleNALongbits } [1] NaN ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { NaN } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldDoubleNaN } [1] NaN ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldBoolean } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldBooleanObject } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]<<>>[[1]]<<>>[1] 1<<>><<>>[[2]]<<>>[1] 2.1<<>><<>>[[3]]<<>>[1] "a"<<>><<>>[[4]]<<>>[1] TRUE<<>><<>>[[5]]<<>>NULL<<>><<>>', sep='') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$mixedTypesArray } [polyglot value] [[1]] [1] 1 [[2]] [1] 2.1 [[3]] [1] "a" [[4]] [1] TRUE [[5]] NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] TRUE FALSE TRUE\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldBooleanArray } [polyglot value] [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "1" "2" "3"\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringIntArray } [polyglot value] [1] "1" "2" "3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "TRUE" "TRUE" "FALSE"\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringBooleanArray } [polyglot value] [1] "TRUE" "TRUE" "FALSE" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "a" "b" "c"\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldCharArray } [polyglot value] [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "a" "b" "c"\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringArray } [polyglot value] [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2 3\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldByteArray } [polyglot value] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2 3\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldIntegerArray } [polyglot value] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2 3\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldLongArray } [polyglot value] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2 3\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldShortArray } [polyglot value] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1.1 2.1 3.1\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldDoubleArray } [polyglot value] [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFields# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1.1 2.1 3.1\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldFloatArray } [polyglot value] [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFor# #if (!any(R.version$engine == "FastR")) { 'testestest' } else { pojo <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestPOJO', 'testestest'); for(v in pojo) if(is.vector(v)) print(v) } [1] "testestest" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testFor# #if (!any(R.version$engine == "FastR")) { for(i in c(1,2,3)) print(i) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));for(i in to$fieldIntegerArray) print(i) } [1] 1 [1] 2 [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 0, 1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));abs(to$fieldBooleanArray) } [1] 1 0 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));abs(to$fieldByteArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));abs(to$fieldLongArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));abs(to$fieldShortArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));abs(to$fieldDoubleArray) } [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));abs(to$fieldFloatArray) } [1] 1.1 2.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));abs(to$fieldIntegerArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in abs(to$fieldCharArray) : ', '<<>>', 'non-numeric argument to mathematical function', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));abs(to$fieldCharArray) } Error in abs(to$fieldCharArray) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in abs(to$fieldStringArray) : ', '<<>>', 'non-numeric argument to mathematical function', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));abs(to$fieldStringArray) } Error in abs(to$fieldStringArray) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in abs(to) : non-numeric argument to mathematical function', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));abs(to) } Error in abs(to) : non-numeric argument to mathematical function ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticReduceOp# #if (!any(R.version$engine == "FastR")) { c('a', 'c') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));range(to$fieldCharArray) } [1] "a" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticReduceOp# #if (!any(R.version$engine == "FastR")) { c('a', 'c') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));range(to$fieldStringArray) } [1] "a" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticReduceOp# #if (!any(R.version$engine == "FastR")) { c(0, 1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));range(to$fieldBooleanArray) } [1] 0 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticReduceOp# #if (!any(R.version$engine == "FastR")) { c(1, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));range(to$fieldByteArray) } [1] 1 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticReduceOp# #if (!any(R.version$engine == "FastR")) { c(1, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));range(to$fieldIntegerArray) } [1] 1 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticReduceOp# #if (!any(R.version$engine == "FastR")) { c(1, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));range(to$fieldLongArray) } [1] 1 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticReduceOp# #if (!any(R.version$engine == "FastR")) { c(1, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));range(to$fieldShortArray) } [1] 1 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticReduceOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));range(to$fieldDoubleArray) } [1] 1.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticReduceOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));range(to$fieldFloatArray) } [1] 1.1 3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignUnaryArithmeticReduceOp#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { cat('Error in range(to) : invalid \'type\' (polyglot.value) of argument', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));range(to) } Error in range(to) : invalid 'type' (polyglot.value) of argument ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { -c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));-(to$fieldByteArray) } [1] -1 -2 -3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { -c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));-(to$fieldLongArray) } [1] -1 -2 -3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { -c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));-(to$fieldShortArray) } [1] -1 -2 -3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { -c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));-(to$fieldDoubleArray) } [1] -1.1 -2.1 -3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { -c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));-(to$fieldFloatArray) } [1] -1.1 -2.1 -3.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { -c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));-(to$fieldIntegerArray) } [1] -1 -2 -3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { -c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));-(to$fieldBooleanArray) } [1] -1 0 -1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { 1 + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));1 + to$fieldByteArray } [1] 2 3 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { 1 + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));1 + to$fieldLongArray } [1] 2 3 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { 1 + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));1 + to$fieldShortArray } [1] 2 3 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { 1 + c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));1 + to$fieldDoubleArray } [1] 2.1 3.1 4.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { 1 + c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));1 + to$fieldFloatArray } [1] 2.1 3.1 4.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { 1 + c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));1 + to$fieldIntegerArray } [1] 2 3 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { 1 + c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));1 + to$fieldBooleanArray } [1] 2 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + 1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray + 1 } [1] 2 3 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + 1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray + 1 } [1] 2 3 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + 1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray + 1 } [1] 2 3 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(1, 2, 3) + to$fieldByteArray } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(1, 2, 3) + to$fieldLongArray } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(1, 2, 3) + to$fieldShortArray } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray + c(1, 2, 3) } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray + to$fieldByteArray } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray + c(1, 2, 3) } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray + to$fieldLongArray } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray + c(1, 2, 3) } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray + to$fieldShortArray } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(1, 2, 3) + to$fieldDoubleArray } [1] 2.1 4.1 6.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(1, 2, 3) + to$fieldFloatArray } [1] 2.1 4.1 6.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(1, 2, 3) + to$fieldIntegerArray } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) + c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(1, 2, 3) + to$fieldBooleanArray } [1] 2 2 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) + 1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray + 1 } [1] 2.1 3.1 4.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) + 1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray + 1 } [1] 2.1 3.1 4.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray + c(1, 2, 3) } [1] 2.1 4.1 6.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray + c(1, 2, 3) } [1] 2.1 4.1 6.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) + c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray + to$fieldDoubleArray } [1] 2.2 4.2 6.2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) + c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray + to$fieldFloatArray } [1] 2.2 4.2 6.2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) + 1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray + 1 } [1] 2 3 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray + c(1, 2, 3) } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) + c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray + to$fieldIntegerArray } [1] 2 4 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) + 1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray + 1 } [1] 2 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) + c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray + c(1, 2, 3) } [1] 2 2 4 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) + c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray + to$fieldBooleanArray } [1] 2 0 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in -(to$fieldCharArray) : invalid argument to unary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));-(to$fieldCharArray) } Error in -(to$fieldCharArray) : invalid argument to unary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in -(to$fieldStringArray) : invalid argument to unary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));-(to$fieldStringArray) } Error in -(to$fieldStringArray) : invalid argument to unary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in 1 + to : non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));1 + to } Error in 1 + to : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in 1 + to$fieldCharArray : non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));1 + to$fieldCharArray } Error in 1 + to$fieldCharArray : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in 1 + to$fieldStringArray : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));1 + to$fieldStringArray } Error in 1 + to$fieldStringArray : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL + to$fieldCharArray : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL + to$fieldCharArray } Error in NULL + to$fieldCharArray : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL + to$fieldStringArray : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL + to$fieldStringArray } Error in NULL + to$fieldStringArray : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in c(1, 2, 3) + to$fieldCharArray : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(1, 2, 3) + to$fieldCharArray } Error in c(1, 2, 3) + to$fieldCharArray : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in c(1, 2, 3) + to$fieldStringArray : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(1, 2, 3) + to$fieldStringArray } Error in c(1, 2, 3) + to$fieldStringArray : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to + 1 : non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to + 1 } Error in to + 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to + to : non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to + to } Error in to + to : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray + 1 : non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray + 1 } Error in to$fieldCharArray + 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray + NULL : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray + NULL } Error in to$fieldCharArray + NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray + c(1, 2, 3) : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray + c(1, 2, 3) } Error in to$fieldCharArray + c(1, 2, 3) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray + to$fieldCharArray : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray + to$fieldCharArray } Error in to$fieldCharArray + to$fieldCharArray : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray + 1 : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray + 1 } Error in to$fieldStringArray + 1 : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray + NULL : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray + NULL } Error in to$fieldStringArray + NULL : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray + c(1, 2, 3) : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray + c(1, 2, 3) } Error in to$fieldStringArray + c(1, 2, 3) : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray + to$fieldStringArray : ', '<<>>', 'non-numeric argument to binary operator', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray + to$fieldStringArray } Error in to$fieldStringArray + to$fieldStringArray : non-numeric argument to binary operator ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { integer(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL + to$fieldBooleanArray } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { integer(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL + to$fieldByteArray } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { integer(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL + to$fieldIntegerArray } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { integer(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL + to$fieldShortArray } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { integer(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray + NULL } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { integer(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray + NULL } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { integer(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray + NULL } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { integer(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray + NULL } integer(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { numeric(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL + to$fieldDoubleArray } numeric(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { numeric(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL + to$fieldFloatArray } numeric(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { numeric(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL + to$fieldLongArray } numeric(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { numeric(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray + NULL } numeric(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { numeric(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray + NULL } numeric(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorArithmeticOp# #if (!any(R.version$engine == "FastR")) { numeric(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray + NULL } numeric(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { !c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));!(to$fieldByteArray) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { !c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));!(to$fieldLongArray) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { !c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));!(to$fieldShortArray) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { !c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));!(to$fieldDoubleArray) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { !c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));!(to$fieldFloatArray) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { !c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));!(to$fieldIntegerArray) } [1] FALSE FALSE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { !c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));!(to$fieldBooleanArray) } [1] FALSE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { T & c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T & to$fieldByteArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { T & c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T & to$fieldLongArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { T & c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T & to$fieldShortArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { T & c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T & to$fieldDoubleArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { T & c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T & to$fieldFloatArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { T & c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T & to$fieldIntegerArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { T & c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T & to$fieldBooleanArray } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) & T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray & T } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) & T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray & T } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) & T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray & T } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) & c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray & to$fieldByteArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) & c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray & to$fieldLongArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) & c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray & to$fieldShortArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) & c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray & c(T, T, F) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) & c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray & c(T, T, F) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) & c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray & c(T, T, F) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) & T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray & T } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) & T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray & T } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) & c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray & to$fieldDoubleArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) & c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray & to$fieldFloatArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) & c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray & c(T, T, F) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) & c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray & c(T, T, F) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) & T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray & T } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) & c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray & to$fieldIntegerArray } [1] TRUE TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) & c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray & c(T, T, F) } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) & c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) & to$fieldByteArray } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) & c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) & to$fieldLongArray } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) & c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) & to$fieldShortArray } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) & c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) & to$fieldDoubleArray } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) & c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) & to$fieldFloatArray } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) & c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) & to$fieldIntegerArray } [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) & c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) & to$fieldBooleanArray } [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) & T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray & T } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) & c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray & c(T, T, F) } [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) & c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray & to$fieldBooleanArray } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in !(to$fieldStringArray) : invalid argument type', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));!(to$fieldStringArray) } Error in !(to$fieldStringArray) : invalid argument type ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in T & to : ', '<<>>', 'operations are possible only for numeric, logical or complex types', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T & to } Error in T & to : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in T & to$fieldStringArray : ', '<<>>', 'operations are possible only for numeric, logical or complex types', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T & to$fieldStringArray } Error in T & to$fieldStringArray : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in c(T, T, F) & to$fieldStringArray : ', '<<>>', 'operations are possible only for numeric, logical or complex types', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) & to$fieldStringArray } Error in c(T, T, F) & to$fieldStringArray : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to & T : ', '<<>>', 'operations are possible only for numeric, logical or complex types', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to & T } Error in to & T : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to & to : ', '<<>>', 'operations are possible only for numeric, logical or complex types', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to & to } Error in to & to : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray & T : ', '<<>>', 'operations are possible only for numeric, logical or complex types', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray & T } Error in to$fieldStringArray & T : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray & c(T, T, F) : ', '<<>>', 'operations are possible only for numeric, logical or complex types', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray & c(T, T, F) } Error in to$fieldStringArray & c(T, T, F) : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray & to$fieldStringArray : ', '<<>>', 'operations are possible only for numeric, logical or complex types', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray & to$fieldStringArray } Error in to$fieldStringArray & to$fieldStringArray : operations are possible only for numeric, logical or complex types ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL & to$fieldBooleanArray } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL & to$fieldByteArray } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL & to$fieldDoubleArray } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL & to$fieldFloatArray } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL & to$fieldIntegerArray } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL & to$fieldLongArray } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL & to$fieldShortArray } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL & to$fieldStringArray } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray & NULL } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray & NULL } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray & NULL } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray & NULL } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray & NULL } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray & NULL } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray & NULL } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorBooleanOp# #if (!any(R.version$engine == "FastR")) { logical(0) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray & NULL } logical(0) ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T && c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T && to$fieldByteArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T && c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T && to$fieldLongArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T && c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T && to$fieldShortArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T && c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T && to$fieldDoubleArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T && c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T && to$fieldFloatArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T && c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T && to$fieldIntegerArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T && c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T && to$fieldBooleanArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T || c("a", "b", "c") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T || to$fieldCharArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T || c("a", "b", "c") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T || to$fieldStringArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T || c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T || to$fieldByteArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T || c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T || to$fieldLongArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T || c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T || to$fieldShortArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T || c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T || to$fieldDoubleArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T || c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T || to$fieldFloatArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T || c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T || to$fieldIntegerArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { T || c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T || to$fieldBooleanArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T || to } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray || NULL } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray || NULL } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray || NULL } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray || NULL } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray || NULL } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray || NULL } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray || NULL } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) && c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray && to$fieldByteArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) && c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray && to$fieldLongArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) && c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray && to$fieldShortArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) || c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray || to$fieldByteArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) || c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray || to$fieldLongArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) || c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray || to$fieldShortArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)&& T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray && T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)&& T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray && T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)&& T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray && T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)&& c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray && c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)&& c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray && c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)&& c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray && c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)|| T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray || T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)|| T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray || T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)|| T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray || T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)|| c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray || c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)|| c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray || c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3)|| c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray || c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) && c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray && to$fieldDoubleArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) && c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray && to$fieldFloatArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) || c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray || to$fieldDoubleArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1) || c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray || to$fieldFloatArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1)&& T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray && T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1)&& T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray && T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1)&& c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray && c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1)&& c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray && c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1)|| T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray || T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1)|| T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray || T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1)|| c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray || c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1.1, 2.1, 3.1)|| c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray || c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) && c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray && to$fieldIntegerArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) || c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray || to$fieldIntegerArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L)&& T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray && T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L)&& c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray && c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L)|| T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray || T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L)|| c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray || c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) && c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) && to$fieldByteArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) && c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) && to$fieldLongArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) && c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) && to$fieldShortArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) && c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) && to$fieldDoubleArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) && c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) && to$fieldFloatArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) && c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) && to$fieldIntegerArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) && c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) && to$fieldBooleanArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) || c("a", "b", "c") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) || to$fieldCharArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) || c("a", "b", "c") } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) || to$fieldStringArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) || c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) || to$fieldByteArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) || c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) || to$fieldLongArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) || c(1, 2, 3) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) || to$fieldShortArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) || c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) || to$fieldDoubleArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) || c(1.1, 2.1, 3.1) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) || to$fieldFloatArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) || c(1L, 2L, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) || to$fieldIntegerArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(T, T, F) || c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) || to$fieldBooleanArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) && c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray && to$fieldBooleanArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) || c(TRUE, FALSE, TRUE) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray || to$fieldBooleanArray } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE)&& T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray && T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE)&& c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray && c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE)|| T } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray || T } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE)|| c(T, T, F) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray || c(T, T, F) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL && to$fieldBooleanArray : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL && to$fieldBooleanArray } Error in NULL && to$fieldBooleanArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL && to$fieldByteArray : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL && to$fieldByteArray } Error in NULL && to$fieldByteArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL && to$fieldCharArray : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL && to$fieldCharArray } Error in NULL && to$fieldCharArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL && to$fieldDoubleArray : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL && to$fieldDoubleArray } Error in NULL && to$fieldDoubleArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL && to$fieldFloatArray : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL && to$fieldFloatArray } Error in NULL && to$fieldFloatArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL && to$fieldIntegerArray : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL && to$fieldIntegerArray } Error in NULL && to$fieldIntegerArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL && to$fieldLongArray : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL && to$fieldLongArray } Error in NULL && to$fieldLongArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL && to$fieldShortArray : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL && to$fieldShortArray } Error in NULL && to$fieldShortArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL && to$fieldStringArray : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL && to$fieldStringArray } Error in NULL && to$fieldStringArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL || to$fieldBooleanArray : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL || to$fieldBooleanArray } Error in NULL || to$fieldBooleanArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL || to$fieldByteArray : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL || to$fieldByteArray } Error in NULL || to$fieldByteArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL || to$fieldCharArray : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL || to$fieldCharArray } Error in NULL || to$fieldCharArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL || to$fieldDoubleArray : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL || to$fieldDoubleArray } Error in NULL || to$fieldDoubleArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL || to$fieldFloatArray : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL || to$fieldFloatArray } Error in NULL || to$fieldFloatArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL || to$fieldIntegerArray : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL || to$fieldIntegerArray } Error in NULL || to$fieldIntegerArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL || to$fieldLongArray : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL || to$fieldLongArray } Error in NULL || to$fieldLongArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL || to$fieldShortArray : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL || to$fieldShortArray } Error in NULL || to$fieldShortArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in NULL || to$fieldStringArray : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));NULL || to$fieldStringArray } Error in NULL || to$fieldStringArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in T && to : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T && to } Error in T && to : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in T && to$fieldCharArray : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T && to$fieldCharArray } Error in T && to$fieldCharArray : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in T && to$fieldStringArray : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));T && to$fieldStringArray } Error in T && to$fieldStringArray : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in c(T, T, F) && to$fieldCharArray : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) && to$fieldCharArray } Error in c(T, T, F) && to$fieldCharArray : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in c(T, T, F) && to$fieldStringArray : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); c(T, T, F) && to$fieldStringArray } Error in c(T, T, F) && to$fieldStringArray : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to && T : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to && T } Error in to && T : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to && to : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to && to } Error in to && to : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to || T : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to || T } Error in to || T : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to || to : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to || to } Error in to || to : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldBooleanArray && NULL : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldBooleanArray && NULL } Error in to$fieldBooleanArray && NULL : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldByteArray && NULL : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldByteArray && NULL } Error in to$fieldByteArray && NULL : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray && NULL : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray && NULL } Error in to$fieldCharArray && NULL : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray && T : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray && T } Error in to$fieldCharArray && T : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray && c(T, T, F) : invalid \'x\' type in \'x && y\'', '<<>>', sep='') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray && c(T, T, F) } Error in to$fieldCharArray && c(T, T, F) : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray && to$fieldCharArray : ', '<<>>', 'invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray && to$fieldCharArray } Error in to$fieldCharArray && to$fieldCharArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray || NULL : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray || NULL } Error in to$fieldCharArray || NULL : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray || T : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray || T } Error in to$fieldCharArray || T : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray || c(T, T, F) : invalid \'x\' type in \'x || y\'', '<<>>', sep='') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray || c(T, T, F) } Error in to$fieldCharArray || c(T, T, F) : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldCharArray || to$fieldCharArray : ', '<<>>', 'invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldCharArray || to$fieldCharArray } Error in to$fieldCharArray || to$fieldCharArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldDoubleArray && NULL : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleArray && NULL } Error in to$fieldDoubleArray && NULL : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldFloatArray && NULL : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldFloatArray && NULL } Error in to$fieldFloatArray && NULL : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldIntegerArray && NULL : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerArray && NULL } Error in to$fieldIntegerArray && NULL : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldLongArray && NULL : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldLongArray && NULL } Error in to$fieldLongArray && NULL : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldShortArray && NULL : invalid \'y\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldShortArray && NULL } Error in to$fieldShortArray && NULL : invalid 'y' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray && NULL : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray && NULL } Error in to$fieldStringArray && NULL : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray && T : invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray && T } Error in to$fieldStringArray && T : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray && c(T, T, F) : invalid \'x\' type in \'x && y\'', '<<>>', sep='') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray && c(T, T, F) } Error in to$fieldStringArray && c(T, T, F) : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray && to$fieldStringArray : ', '<<>>', 'invalid \'x\' type in \'x && y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray && to$fieldStringArray } Error in to$fieldStringArray && to$fieldStringArray : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray || NULL : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray || NULL } Error in to$fieldStringArray || NULL : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray || T : invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray || T } Error in to$fieldStringArray || T : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray || c(T, T, F) : invalid \'x\' type in \'x || y\'', '<<>>', sep='') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray || c(T, T, F) } Error in to$fieldStringArray || c(T, T, F) : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testForeignVectorScalarBooleanOp# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray || to$fieldStringArray : ', '<<>>', 'invalid \'x\' type in \'x || y\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldStringArray || to$fieldStringArray } Error in to$fieldStringArray || to$fieldStringArray : invalid 'x' type in 'x || y' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testGetClassAndClassName# #if (!any(R.version$engine == "FastR")) { 'com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass' } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$class$getName() } [1] "com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testGetClassAndClassName# #if (!any(R.version$engine == "FastR")) { 'com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass' } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$getClass()$getName() } [1] "com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testGetClassAndClassName# #if (!any(R.version$engine == "FastR")) { 'java.lang.Class' } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$class$getClass()$getName() } [1] "java.lang.Class" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIdentical# #if (!any(R.version$engine == "FastR")) { FALSE } else { b1 <- .fastr.interop.asByte(1); b2 <- .fastr.interop.asByte(1); identical(b1, b2) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIdentical# #if (!any(R.version$engine == "FastR")) { FALSE } else { b1 <- .fastr.interop.asByte(1); s1 <- .fastr.interop.asShort(1); identical(b1, s1) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIdentical# #if (!any(R.version$engine == "FastR")) { TRUE } else { b1 <- .fastr.interop.asByte(1); identical(b1, b1) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIf#Output.IgnoreErrorContext# #if (!any(R.version$engine == "FastR")) { cat('Error in if (T) print(\'OK\') : argument is not interpretable as logical', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));if(to) print('OK') } Error in if (T) print('OK') : argument is not interpretable as logical ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIf# #if (!any(R.version$engine == "FastR")) { if(1) print('OK') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));if(to$fieldInteger) print('OK') } [1] "OK" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIf# #if (!any(R.version$engine == "FastR")) { if(T) print('OK') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));if(to$fieldBoolean) print('OK') } [1] "OK" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIf#Output.IgnoreWarningContext# #if (!any(R.version$engine == "FastR")) { if(c('TRUE', 'TRUE', 'FALSE')) print('OK') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));if(to$fieldStringBooleanArray) print('OK') } [1] "OK" Warning message: In if (c("TRUE", "TRUE", "FALSE")) print("OK") : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIf#Output.IgnoreWarningContext#Output.IgnoreErrorContext# #if (!any(R.version$engine == "FastR")) { if(c('a', 'b')) print('OK') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));if(to$fieldStringArray) print('OK') } Error in if (c("a", "b")) print("OK") : argument is not interpretable as logical In addition: Warning message: In if (c("a", "b")) print("OK") : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIf#Output.IgnoreWarningContext# #if (!any(R.version$engine == "FastR")) { if(c(T, F)) print('OK') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));if(to$fieldBooleanArray) print('OK') } [1] "OK" Warning message: In if (c(T, F)) print("OK") : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIf#Output.IgnoreWarningContext# #if (!any(R.version$engine == "FastR")) { if(c(T, F)) print('OK') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));if(to$fieldIntegerArray) print('OK') } [1] "OK" Warning message: In if (c(T, F)) print("OK") : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { 'double' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');typeof(as.vector(ta$integerMinArray)) } [1] "double" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { 'double' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');typeof(as.vector(ta$integerMinObjectArray)) } [1] "double" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { -2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleIntegerMin } [1] -2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { -2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldDoubleIntegerMinObject } [1] -2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { -2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerMin } [1] -2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { -2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));to$fieldIntegerMinObject } [1] -2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.na(to$fieldDoubleIntegerMin) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.na(to$fieldDoubleIntegerMinObject) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.na(to$fieldIntegerMin) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.nan(to$fieldIntegerMinObject) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.double(to$fieldDoubleIntegerMin) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.double(to$fieldDoubleIntegerMinObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.double(to$fieldIntegerMin) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.double(to$fieldIntegerMinObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { [1] 1 2 -2147483648 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$integerMinArray) } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIntegerNA# #if (!any(R.version$engine == "FastR")) { [1] 1 2 -2147483648 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');as.vector(ta$integerMinObjectArray) } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { 'a' } else { tc <- java.type('java.lang.Character'); t <- .fastr.interop.new(tc, .fastr.interop.asChar(97)); t } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { 'abc' } else { tc <- java.type('java.lang.String'); t <- .fastr.interop.new(tc, 'abc'); t } [1] "abc" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { 'polyglot.value' } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestNullClass'); t <- .fastr.interop.new(tc, NULL); class(t) } [1] "polyglot.value" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { 1 } else { tc <- java.type('java.lang.Byte'); t <- .fastr.interop.new(tc, .fastr.interop.asByte(1)); t } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { 1 } else { tc <- java.type('java.lang.Integer'); t <- .fastr.interop.new(tc, 1L); t } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { 1 } else { tc <- java.type('java.lang.Long'); t <- .fastr.interop.new(tc, .fastr.interop.asLong(1)); t } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { 1 } else { tc <- java.type('java.lang.Short'); t <- .fastr.interop.new(tc, .fastr.interop.asShort(1)); t } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { 1.1 } else { tc <- java.type('java.lang.Double'); t <- .fastr.interop.new(tc, 1.1); t } [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { 1.1 } else { tc <- java.type('java.lang.Float'); t <- .fastr.interop.new(tc, .fastr.interop.asFloat(1.1)); t } [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { TRUE } else { tc <- java.type('java.lang.Boolean'); t <- .fastr.interop.new(tc, TRUE); t } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testInteroptNew# #if (!any(R.version$engine == "FastR")) { TRUE } else { tc <- java.type('java/lang/Boolean'); t <- new(tc, TRUE); t } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsArray# #if (!any(R.version$engine == "FastR")) { FALSE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); is.array(ta$booleanArray) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); is.array(ta$booleanArray2) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); is.array(ta$booleanArray3) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsMatrix# #if (!any(R.version$engine == "FastR")) { FALSE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); is.matrix(ta$booleanArray) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsMatrix# #if (!any(R.version$engine == "FastR")) { FALSE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); is.matrix(ta$booleanArray3) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsMatrix# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); is.matrix(ta$booleanArray2) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.array(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.atomic(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.call(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.character(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.complex(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.data.frame(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.double(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.environment(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.expression(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.factor(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.function(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.integer(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.language(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.logical(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.matrix(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.mts(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.na(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.name(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.null(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.numeric(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.numeric.Date(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.numeric.POSIXt(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.numeric.difftime(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.numeric_version(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.ordered(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.package_version(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.pairlist(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.primitive(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.qr(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.raster(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.raw(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.recursive(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.relistable(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.stepfun(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.symbol(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.table(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.ts(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.tskernel(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.unsorted(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { FALSE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.vector(to) } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.object(to) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { cat('Error in is.finite(to) : ', '<<>>', 'default method not implemented for type \'polyglot.value\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.finite(to) } Error in is.finite(to) : default method not implemented for type 'polyglot.value' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { cat('Error in is.infinite(to) : ', '<<>>', 'default method not implemented for type \'polyglot.value\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.infinite(to) } Error in is.infinite(to) : default method not implemented for type 'polyglot.value' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testIsXXXForForeignObject# #if (!any(R.version$engine == "FastR")) { cat('Error in is.nan(to) : ', '<<>>', 'default method not implemented for type \'polyglot.value\'', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); is.nan(to) } Error in is.nan(to) : default method not implemented for type 'polyglot.value' ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testLengthArray# #if (!any(R.version$engine == "FastR")) { 0 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); length(ta$objectEmpty) } [1] 0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testLengthArray# #if (!any(R.version$engine == "FastR")) { 2 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); length(ta$booleanArray2) } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testLengthArray# #if (!any(R.version$engine == "FastR")) { 2 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); length(ta$booleanArray3) } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testLengthArray# #if (!any(R.version$engine == "FastR")) { 3 } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); length(ta$booleanArray) } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMatrix# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.RIntArrayVectorData<<>>') } else { ja <- new(java.type('int[]'), 6); for(i in 1:6) ja[i] <- i; .fastr.inspect(matrix(ja, c(3, 2)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.RIntArrayVectorData ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMatrix# #if (!any(R.version$engine == "FastR")) { matrix(1:6, c(3, 2)) } else { ja <- new(java.type('int[]'), 6); for(i in 1:6) ja[i] <- i; matrix(ja, c(3, 2)) } [,1] [,2] [1,] 1 4 [2,] 2 5 [3,] 3 6 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMatrix# #if (!any(R.version$engine == "FastR")) { v <- c(1, 1, 1, 1, 2, 2, 2, 2, 3, 3, 3, 3); dim(v) <- c(2, 2, 3); matrix(v, c(3, 2, 2)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');matrix(ta$integerArray3, c(3, 2, 2)) } [,1] [,2] [,3] [,4] [1,] 1 1 2 3 [2,] 1 2 2 3 [3,] 1 2 3 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMatrix# #if (!any(R.version$engine == "FastR")) { v <- c(1, 1, 2, 2, 3, 3); dim(v) <- c(2, 3); matrix(v, c(3, 2)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');matrix(ta$integerArray2, c(3, 2)) } [,1] [,2] [1,] 1 2 [2,] 1 3 [3,] 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { "a string" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodStringObject() } [1] "a string" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { "a" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodChar() } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { "a" } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodCharObject() } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 1.1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodFloat() } [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 1.1 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodFloatObject() } [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 1.7976931348623157E308 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodDouble() } [1] 1.797693e+308 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 1.7976931348623157E308 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodDoubleObject() } [1] 1.797693e+308 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 127 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodByte() } [1] 127 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 127 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodByteObject() } [1] 127 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 2147483647 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodInteger() } [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 2147483647 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodIntegerObject() } [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodLong() } [1] 2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 2147483648 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodLongObject() } [1] 2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 32767 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodShort() } [1] 32767 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { 32767 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodShortObject() } [1] 32767 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { NULL } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodReturnsNull() } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { NULL } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodVoid() } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodBoolean() } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodBooleanObject() } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "a" "b" "c"\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodStringArray() } [polyglot value] [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMethods# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2 3\n') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodIntArray() } [polyglot value] [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[1, 1] == ta$booleanArray2[1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[1, 1] == ta$booleanArray2[1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[1, 2] == ta$booleanArray2[1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[1, 2] == ta$booleanArray2[1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[1, 3] == ta$booleanArray2[1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[1, 3] == ta$booleanArray2[1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[2, 1] == ta$booleanArray2[2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[2, 1] == ta$booleanArray2[2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[2, 2] == ta$booleanArray2[2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[2, 2] == ta$booleanArray2[2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[2, 3] == ta$booleanArray2[2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray2); dim(v) <- c(2, 3); v[2, 3] == ta$booleanArray2[2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$booleanArray3[1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$booleanArray3[1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$booleanArray3[1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$booleanArray3[1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$booleanArray3[1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$booleanArray3[1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$booleanArray3[1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$booleanArray3[1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$booleanArray3[1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$booleanArray3[1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$booleanArray3[1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$booleanArray3[1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$booleanArray3[2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$booleanArray3[2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$booleanArray3[2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$booleanArray3[2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$booleanArray3[2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$booleanArray3[2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$booleanArray3[2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$booleanArray3[2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$booleanArray3[2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$booleanArray3[2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$booleanArray3[2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$booleanArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$booleanArray3[2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[1, 1] == ta$byteArray2[1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[1, 1] == ta$byteArray2[1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[1, 2] == ta$byteArray2[1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[1, 2] == ta$byteArray2[1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[1, 3] == ta$byteArray2[1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[1, 3] == ta$byteArray2[1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[2, 1] == ta$byteArray2[2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[2, 1] == ta$byteArray2[2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[2, 2] == ta$byteArray2[2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[2, 2] == ta$byteArray2[2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[2, 3] == ta$byteArray2[2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray2); dim(v) <- c(2, 3); v[2, 3] == ta$byteArray2[2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$byteArray3[1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$byteArray3[1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$byteArray3[1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$byteArray3[1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$byteArray3[1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$byteArray3[1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$byteArray3[1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$byteArray3[1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$byteArray3[1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$byteArray3[1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$byteArray3[1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$byteArray3[1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$byteArray3[2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$byteArray3[2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$byteArray3[2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$byteArray3[2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$byteArray3[2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$byteArray3[2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$byteArray3[2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$byteArray3[2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$byteArray3[2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$byteArray3[2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$byteArray3[2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$byteArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$byteArray3[2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[1, 1] == ta$charArray2[1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[1, 1] == ta$charArray2[1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[1, 2] == ta$charArray2[1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[1, 2] == ta$charArray2[1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[1, 3] == ta$charArray2[1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[1, 3] == ta$charArray2[1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[2, 1] == ta$charArray2[2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[2, 1] == ta$charArray2[2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[2, 2] == ta$charArray2[2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[2, 2] == ta$charArray2[2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[2, 3] == ta$charArray2[2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray2); dim(v) <- c(2, 3); v[2, 3] == ta$charArray2[2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$charArray3[1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$charArray3[1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$charArray3[1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$charArray3[1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$charArray3[1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$charArray3[1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$charArray3[1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$charArray3[1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$charArray3[1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$charArray3[1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$charArray3[1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$charArray3[1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$charArray3[2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$charArray3[2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$charArray3[2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$charArray3[2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$charArray3[2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$charArray3[2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$charArray3[2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$charArray3[2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$charArray3[2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$charArray3[2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$charArray3[2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$charArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$charArray3[2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[1, 1] == ta$doubleArray2[1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[1, 1] == ta$doubleArray2[1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[1, 2] == ta$doubleArray2[1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[1, 2] == ta$doubleArray2[1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[1, 3] == ta$doubleArray2[1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[1, 3] == ta$doubleArray2[1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[2, 1] == ta$doubleArray2[2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[2, 1] == ta$doubleArray2[2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[2, 2] == ta$doubleArray2[2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[2, 2] == ta$doubleArray2[2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[2, 3] == ta$doubleArray2[2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray2); dim(v) <- c(2, 3); v[2, 3] == ta$doubleArray2[2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$doubleArray3[1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$doubleArray3[1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$doubleArray3[1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$doubleArray3[1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$doubleArray3[1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$doubleArray3[1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$doubleArray3[1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$doubleArray3[1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$doubleArray3[1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$doubleArray3[1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$doubleArray3[1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$doubleArray3[1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$doubleArray3[2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$doubleArray3[2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$doubleArray3[2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$doubleArray3[2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$doubleArray3[2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$doubleArray3[2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$doubleArray3[2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$doubleArray3[2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$doubleArray3[2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$doubleArray3[2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$doubleArray3[2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$doubleArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$doubleArray3[2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[1, 1] == ta$floatArray2[1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[1, 1] == ta$floatArray2[1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[1, 2] == ta$floatArray2[1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[1, 2] == ta$floatArray2[1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[1, 3] == ta$floatArray2[1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[1, 3] == ta$floatArray2[1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[2, 1] == ta$floatArray2[2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[2, 1] == ta$floatArray2[2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[2, 2] == ta$floatArray2[2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[2, 2] == ta$floatArray2[2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[2, 3] == ta$floatArray2[2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray2); dim(v) <- c(2, 3); v[2, 3] == ta$floatArray2[2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$floatArray3[1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$floatArray3[1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$floatArray3[1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$floatArray3[1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$floatArray3[1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$floatArray3[1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$floatArray3[1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$floatArray3[1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$floatArray3[1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$floatArray3[1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$floatArray3[1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$floatArray3[1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$floatArray3[2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$floatArray3[2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$floatArray3[2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$floatArray3[2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$floatArray3[2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$floatArray3[2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$floatArray3[2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$floatArray3[2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$floatArray3[2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$floatArray3[2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$floatArray3[2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$floatArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$floatArray3[2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[1, 1] == ta$integerArray2[1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[1, 1] == ta$integerArray2[1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[1, 2] == ta$integerArray2[1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[1, 2] == ta$integerArray2[1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[1, 3] == ta$integerArray2[1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[1, 3] == ta$integerArray2[1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[2, 1] == ta$integerArray2[2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[2, 1] == ta$integerArray2[2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[2, 2] == ta$integerArray2[2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[2, 2] == ta$integerArray2[2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[2, 3] == ta$integerArray2[2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2); dim(v) <- c(2, 3); v[2, 3] == ta$integerArray2[2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 1, 1] == ta$integerArray2x3x4x5[1, 1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 1, 1] == ta$integerArray2x3x4x5[1][1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 1, 2] == ta$integerArray2x3x4x5[1, 1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 1, 2] == ta$integerArray2x3x4x5[1][1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 1, 3] == ta$integerArray2x3x4x5[1, 1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 1, 3] == ta$integerArray2x3x4x5[1][1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 1, 4] == ta$integerArray2x3x4x5[1, 1, 1, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 1, 4] == ta$integerArray2x3x4x5[1][1][1][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 1, 5] == ta$integerArray2x3x4x5[1, 1, 1, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 1, 5] == ta$integerArray2x3x4x5[1][1][1][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 2, 1] == ta$integerArray2x3x4x5[1, 1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 2, 1] == ta$integerArray2x3x4x5[1][1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 2, 2] == ta$integerArray2x3x4x5[1, 1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 2, 2] == ta$integerArray2x3x4x5[1][1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 2, 3] == ta$integerArray2x3x4x5[1, 1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 2, 3] == ta$integerArray2x3x4x5[1][1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 2, 4] == ta$integerArray2x3x4x5[1, 1, 2, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 2, 4] == ta$integerArray2x3x4x5[1][1][2][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 2, 5] == ta$integerArray2x3x4x5[1, 1, 2, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 2, 5] == ta$integerArray2x3x4x5[1][1][2][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 3, 1] == ta$integerArray2x3x4x5[1, 1, 3, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 3, 1] == ta$integerArray2x3x4x5[1][1][3][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 3, 2] == ta$integerArray2x3x4x5[1, 1, 3, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 3, 2] == ta$integerArray2x3x4x5[1][1][3][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 3, 3] == ta$integerArray2x3x4x5[1, 1, 3, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 3, 3] == ta$integerArray2x3x4x5[1][1][3][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 3, 4] == ta$integerArray2x3x4x5[1, 1, 3, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 3, 4] == ta$integerArray2x3x4x5[1][1][3][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 3, 5] == ta$integerArray2x3x4x5[1, 1, 3, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 3, 5] == ta$integerArray2x3x4x5[1][1][3][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 4, 1] == ta$integerArray2x3x4x5[1, 1, 4, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 4, 1] == ta$integerArray2x3x4x5[1][1][4][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 4, 2] == ta$integerArray2x3x4x5[1, 1, 4, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 4, 2] == ta$integerArray2x3x4x5[1][1][4][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 4, 3] == ta$integerArray2x3x4x5[1, 1, 4, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 4, 3] == ta$integerArray2x3x4x5[1][1][4][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 4, 4] == ta$integerArray2x3x4x5[1, 1, 4, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 4, 4] == ta$integerArray2x3x4x5[1][1][4][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 4, 5] == ta$integerArray2x3x4x5[1, 1, 4, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 1, 4, 5] == ta$integerArray2x3x4x5[1][1][4][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 1, 1] == ta$integerArray2x3x4x5[1, 2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 1, 1] == ta$integerArray2x3x4x5[1][2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 1, 2] == ta$integerArray2x3x4x5[1, 2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 1, 2] == ta$integerArray2x3x4x5[1][2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 1, 3] == ta$integerArray2x3x4x5[1, 2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 1, 3] == ta$integerArray2x3x4x5[1][2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 1, 4] == ta$integerArray2x3x4x5[1, 2, 1, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 1, 4] == ta$integerArray2x3x4x5[1][2][1][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 1, 5] == ta$integerArray2x3x4x5[1, 2, 1, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 1, 5] == ta$integerArray2x3x4x5[1][2][1][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 2, 1] == ta$integerArray2x3x4x5[1, 2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 2, 1] == ta$integerArray2x3x4x5[1][2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 2, 2] == ta$integerArray2x3x4x5[1, 2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 2, 2] == ta$integerArray2x3x4x5[1][2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 2, 3] == ta$integerArray2x3x4x5[1, 2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 2, 3] == ta$integerArray2x3x4x5[1][2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 2, 4] == ta$integerArray2x3x4x5[1, 2, 2, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 2, 4] == ta$integerArray2x3x4x5[1][2][2][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 2, 5] == ta$integerArray2x3x4x5[1, 2, 2, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 2, 5] == ta$integerArray2x3x4x5[1][2][2][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 3, 1] == ta$integerArray2x3x4x5[1, 2, 3, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 3, 1] == ta$integerArray2x3x4x5[1][2][3][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 3, 2] == ta$integerArray2x3x4x5[1, 2, 3, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 3, 2] == ta$integerArray2x3x4x5[1][2][3][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 3, 3] == ta$integerArray2x3x4x5[1, 2, 3, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 3, 3] == ta$integerArray2x3x4x5[1][2][3][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 3, 4] == ta$integerArray2x3x4x5[1, 2, 3, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 3, 4] == ta$integerArray2x3x4x5[1][2][3][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 3, 5] == ta$integerArray2x3x4x5[1, 2, 3, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 3, 5] == ta$integerArray2x3x4x5[1][2][3][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 4, 1] == ta$integerArray2x3x4x5[1, 2, 4, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 4, 1] == ta$integerArray2x3x4x5[1][2][4][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 4, 2] == ta$integerArray2x3x4x5[1, 2, 4, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 4, 2] == ta$integerArray2x3x4x5[1][2][4][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 4, 3] == ta$integerArray2x3x4x5[1, 2, 4, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 4, 3] == ta$integerArray2x3x4x5[1][2][4][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 4, 4] == ta$integerArray2x3x4x5[1, 2, 4, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 4, 4] == ta$integerArray2x3x4x5[1][2][4][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 4, 5] == ta$integerArray2x3x4x5[1, 2, 4, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 2, 4, 5] == ta$integerArray2x3x4x5[1][2][4][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 1, 1] == ta$integerArray2x3x4x5[1, 3, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 1, 1] == ta$integerArray2x3x4x5[1][3][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 1, 2] == ta$integerArray2x3x4x5[1, 3, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 1, 2] == ta$integerArray2x3x4x5[1][3][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 1, 3] == ta$integerArray2x3x4x5[1, 3, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 1, 3] == ta$integerArray2x3x4x5[1][3][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 1, 4] == ta$integerArray2x3x4x5[1, 3, 1, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 1, 4] == ta$integerArray2x3x4x5[1][3][1][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 1, 5] == ta$integerArray2x3x4x5[1, 3, 1, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 1, 5] == ta$integerArray2x3x4x5[1][3][1][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 2, 1] == ta$integerArray2x3x4x5[1, 3, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 2, 1] == ta$integerArray2x3x4x5[1][3][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 2, 2] == ta$integerArray2x3x4x5[1, 3, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 2, 2] == ta$integerArray2x3x4x5[1][3][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 2, 3] == ta$integerArray2x3x4x5[1, 3, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 2, 3] == ta$integerArray2x3x4x5[1][3][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 2, 4] == ta$integerArray2x3x4x5[1, 3, 2, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 2, 4] == ta$integerArray2x3x4x5[1][3][2][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 2, 5] == ta$integerArray2x3x4x5[1, 3, 2, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 2, 5] == ta$integerArray2x3x4x5[1][3][2][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 3, 1] == ta$integerArray2x3x4x5[1, 3, 3, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 3, 1] == ta$integerArray2x3x4x5[1][3][3][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 3, 2] == ta$integerArray2x3x4x5[1, 3, 3, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 3, 2] == ta$integerArray2x3x4x5[1][3][3][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 3, 3] == ta$integerArray2x3x4x5[1, 3, 3, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 3, 3] == ta$integerArray2x3x4x5[1][3][3][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 3, 4] == ta$integerArray2x3x4x5[1, 3, 3, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 3, 4] == ta$integerArray2x3x4x5[1][3][3][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 3, 5] == ta$integerArray2x3x4x5[1, 3, 3, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 3, 5] == ta$integerArray2x3x4x5[1][3][3][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 4, 1] == ta$integerArray2x3x4x5[1, 3, 4, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 4, 1] == ta$integerArray2x3x4x5[1][3][4][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 4, 2] == ta$integerArray2x3x4x5[1, 3, 4, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 4, 2] == ta$integerArray2x3x4x5[1][3][4][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 4, 3] == ta$integerArray2x3x4x5[1, 3, 4, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 4, 3] == ta$integerArray2x3x4x5[1][3][4][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 4, 4] == ta$integerArray2x3x4x5[1, 3, 4, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 4, 4] == ta$integerArray2x3x4x5[1][3][4][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 4, 5] == ta$integerArray2x3x4x5[1, 3, 4, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[1, 3, 4, 5] == ta$integerArray2x3x4x5[1][3][4][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 1, 1] == ta$integerArray2x3x4x5[2, 1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 1, 1] == ta$integerArray2x3x4x5[2][1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 1, 2] == ta$integerArray2x3x4x5[2, 1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 1, 2] == ta$integerArray2x3x4x5[2][1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 1, 3] == ta$integerArray2x3x4x5[2, 1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 1, 3] == ta$integerArray2x3x4x5[2][1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 1, 4] == ta$integerArray2x3x4x5[2, 1, 1, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 1, 4] == ta$integerArray2x3x4x5[2][1][1][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 1, 5] == ta$integerArray2x3x4x5[2, 1, 1, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 1, 5] == ta$integerArray2x3x4x5[2][1][1][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 2, 1] == ta$integerArray2x3x4x5[2, 1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 2, 1] == ta$integerArray2x3x4x5[2][1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 2, 2] == ta$integerArray2x3x4x5[2, 1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 2, 2] == ta$integerArray2x3x4x5[2][1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 2, 3] == ta$integerArray2x3x4x5[2, 1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 2, 3] == ta$integerArray2x3x4x5[2][1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 2, 4] == ta$integerArray2x3x4x5[2, 1, 2, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 2, 4] == ta$integerArray2x3x4x5[2][1][2][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 2, 5] == ta$integerArray2x3x4x5[2, 1, 2, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 2, 5] == ta$integerArray2x3x4x5[2][1][2][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 3, 1] == ta$integerArray2x3x4x5[2, 1, 3, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 3, 1] == ta$integerArray2x3x4x5[2][1][3][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 3, 2] == ta$integerArray2x3x4x5[2, 1, 3, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 3, 2] == ta$integerArray2x3x4x5[2][1][3][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 3, 3] == ta$integerArray2x3x4x5[2, 1, 3, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 3, 3] == ta$integerArray2x3x4x5[2][1][3][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 3, 4] == ta$integerArray2x3x4x5[2, 1, 3, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 3, 4] == ta$integerArray2x3x4x5[2][1][3][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 3, 5] == ta$integerArray2x3x4x5[2, 1, 3, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 3, 5] == ta$integerArray2x3x4x5[2][1][3][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 4, 1] == ta$integerArray2x3x4x5[2, 1, 4, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 4, 1] == ta$integerArray2x3x4x5[2][1][4][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 4, 2] == ta$integerArray2x3x4x5[2, 1, 4, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 4, 2] == ta$integerArray2x3x4x5[2][1][4][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 4, 3] == ta$integerArray2x3x4x5[2, 1, 4, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 4, 3] == ta$integerArray2x3x4x5[2][1][4][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 4, 4] == ta$integerArray2x3x4x5[2, 1, 4, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 4, 4] == ta$integerArray2x3x4x5[2][1][4][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 4, 5] == ta$integerArray2x3x4x5[2, 1, 4, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 1, 4, 5] == ta$integerArray2x3x4x5[2][1][4][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 1, 1] == ta$integerArray2x3x4x5[2, 2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 1, 1] == ta$integerArray2x3x4x5[2][2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 1, 2] == ta$integerArray2x3x4x5[2, 2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 1, 2] == ta$integerArray2x3x4x5[2][2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 1, 3] == ta$integerArray2x3x4x5[2, 2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 1, 3] == ta$integerArray2x3x4x5[2][2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 1, 4] == ta$integerArray2x3x4x5[2, 2, 1, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 1, 4] == ta$integerArray2x3x4x5[2][2][1][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 1, 5] == ta$integerArray2x3x4x5[2, 2, 1, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 1, 5] == ta$integerArray2x3x4x5[2][2][1][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 2, 1] == ta$integerArray2x3x4x5[2, 2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 2, 1] == ta$integerArray2x3x4x5[2][2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 2, 2] == ta$integerArray2x3x4x5[2, 2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 2, 2] == ta$integerArray2x3x4x5[2][2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 2, 3] == ta$integerArray2x3x4x5[2, 2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 2, 3] == ta$integerArray2x3x4x5[2][2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 2, 4] == ta$integerArray2x3x4x5[2, 2, 2, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 2, 4] == ta$integerArray2x3x4x5[2][2][2][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 2, 5] == ta$integerArray2x3x4x5[2, 2, 2, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 2, 5] == ta$integerArray2x3x4x5[2][2][2][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 3, 1] == ta$integerArray2x3x4x5[2, 2, 3, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 3, 1] == ta$integerArray2x3x4x5[2][2][3][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 3, 2] == ta$integerArray2x3x4x5[2, 2, 3, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 3, 2] == ta$integerArray2x3x4x5[2][2][3][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 3, 3] == ta$integerArray2x3x4x5[2, 2, 3, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 3, 3] == ta$integerArray2x3x4x5[2][2][3][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 3, 4] == ta$integerArray2x3x4x5[2, 2, 3, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 3, 4] == ta$integerArray2x3x4x5[2][2][3][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 3, 5] == ta$integerArray2x3x4x5[2, 2, 3, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 3, 5] == ta$integerArray2x3x4x5[2][2][3][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 4, 1] == ta$integerArray2x3x4x5[2, 2, 4, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 4, 1] == ta$integerArray2x3x4x5[2][2][4][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 4, 2] == ta$integerArray2x3x4x5[2, 2, 4, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 4, 2] == ta$integerArray2x3x4x5[2][2][4][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 4, 3] == ta$integerArray2x3x4x5[2, 2, 4, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 4, 3] == ta$integerArray2x3x4x5[2][2][4][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 4, 4] == ta$integerArray2x3x4x5[2, 2, 4, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 4, 4] == ta$integerArray2x3x4x5[2][2][4][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 4, 5] == ta$integerArray2x3x4x5[2, 2, 4, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 2, 4, 5] == ta$integerArray2x3x4x5[2][2][4][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 1, 1] == ta$integerArray2x3x4x5[2, 3, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 1, 1] == ta$integerArray2x3x4x5[2][3][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 1, 2] == ta$integerArray2x3x4x5[2, 3, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 1, 2] == ta$integerArray2x3x4x5[2][3][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 1, 3] == ta$integerArray2x3x4x5[2, 3, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 1, 3] == ta$integerArray2x3x4x5[2][3][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 1, 4] == ta$integerArray2x3x4x5[2, 3, 1, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 1, 4] == ta$integerArray2x3x4x5[2][3][1][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 1, 5] == ta$integerArray2x3x4x5[2, 3, 1, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 1, 5] == ta$integerArray2x3x4x5[2][3][1][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 2, 1] == ta$integerArray2x3x4x5[2, 3, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 2, 1] == ta$integerArray2x3x4x5[2][3][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 2, 2] == ta$integerArray2x3x4x5[2, 3, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 2, 2] == ta$integerArray2x3x4x5[2][3][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 2, 3] == ta$integerArray2x3x4x5[2, 3, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 2, 3] == ta$integerArray2x3x4x5[2][3][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 2, 4] == ta$integerArray2x3x4x5[2, 3, 2, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 2, 4] == ta$integerArray2x3x4x5[2][3][2][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 2, 5] == ta$integerArray2x3x4x5[2, 3, 2, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 2, 5] == ta$integerArray2x3x4x5[2][3][2][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 3, 1] == ta$integerArray2x3x4x5[2, 3, 3, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 3, 1] == ta$integerArray2x3x4x5[2][3][3][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 3, 2] == ta$integerArray2x3x4x5[2, 3, 3, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 3, 2] == ta$integerArray2x3x4x5[2][3][3][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 3, 3] == ta$integerArray2x3x4x5[2, 3, 3, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 3, 3] == ta$integerArray2x3x4x5[2][3][3][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 3, 4] == ta$integerArray2x3x4x5[2, 3, 3, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 3, 4] == ta$integerArray2x3x4x5[2][3][3][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 3, 5] == ta$integerArray2x3x4x5[2, 3, 3, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 3, 5] == ta$integerArray2x3x4x5[2][3][3][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 4, 1] == ta$integerArray2x3x4x5[2, 3, 4, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 4, 1] == ta$integerArray2x3x4x5[2][3][4][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 4, 2] == ta$integerArray2x3x4x5[2, 3, 4, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 4, 2] == ta$integerArray2x3x4x5[2][3][4][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 4, 3] == ta$integerArray2x3x4x5[2, 3, 4, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 4, 3] == ta$integerArray2x3x4x5[2][3][4][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 4, 4] == ta$integerArray2x3x4x5[2, 3, 4, 4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 4, 4] == ta$integerArray2x3x4x5[2][3][4][4] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 4, 5] == ta$integerArray2x3x4x5[2, 3, 4, 5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray2x3x4x5); dim(v) <- c(2,3,4,5); v[2, 3, 4, 5] == ta$integerArray2x3x4x5[2][3][4][5] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$integerArray3[1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$integerArray3[1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$integerArray3[1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$integerArray3[1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$integerArray3[1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$integerArray3[1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$integerArray3[1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$integerArray3[1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$integerArray3[1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$integerArray3[1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$integerArray3[1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$integerArray3[1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$integerArray3[2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$integerArray3[2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$integerArray3[2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$integerArray3[2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$integerArray3[2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$integerArray3[2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$integerArray3[2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$integerArray3[2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$integerArray3[2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$integerArray3[2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$integerArray3[2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$integerArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$integerArray3[2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[1, 1] == ta$longArray2[1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[1, 1] == ta$longArray2[1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[1, 2] == ta$longArray2[1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[1, 2] == ta$longArray2[1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[1, 3] == ta$longArray2[1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[1, 3] == ta$longArray2[1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[2, 1] == ta$longArray2[2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[2, 1] == ta$longArray2[2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[2, 2] == ta$longArray2[2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[2, 2] == ta$longArray2[2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[2, 3] == ta$longArray2[2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray2); dim(v) <- c(2, 3); v[2, 3] == ta$longArray2[2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$longArray3[1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$longArray3[1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$longArray3[1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$longArray3[1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$longArray3[1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$longArray3[1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$longArray3[1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$longArray3[1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$longArray3[1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$longArray3[1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$longArray3[1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$longArray3[1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$longArray3[2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$longArray3[2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$longArray3[2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$longArray3[2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$longArray3[2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$longArray3[2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$longArray3[2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$longArray3[2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$longArray3[2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$longArray3[2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$longArray3[2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$longArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$longArray3[2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[1, 1] == ta$shortArray2[1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[1, 1] == ta$shortArray2[1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[1, 2] == ta$shortArray2[1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[1, 2] == ta$shortArray2[1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[1, 3] == ta$shortArray2[1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[1, 3] == ta$shortArray2[1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[2, 1] == ta$shortArray2[2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[2, 1] == ta$shortArray2[2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[2, 2] == ta$shortArray2[2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[2, 2] == ta$shortArray2[2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[2, 3] == ta$shortArray2[2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray2); dim(v) <- c(2, 3); v[2, 3] == ta$shortArray2[2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$shortArray3[1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$shortArray3[1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$shortArray3[1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$shortArray3[1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$shortArray3[1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$shortArray3[1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$shortArray3[1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$shortArray3[1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$shortArray3[1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$shortArray3[1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$shortArray3[1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$shortArray3[1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$shortArray3[2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$shortArray3[2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$shortArray3[2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$shortArray3[2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$shortArray3[2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$shortArray3[2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$shortArray3[2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$shortArray3[2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$shortArray3[2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$shortArray3[2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$shortArray3[2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$shortArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$shortArray3[2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[1, 1] == ta$stringArray2[1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[1, 1] == ta$stringArray2[1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[1, 2] == ta$stringArray2[1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[1, 2] == ta$stringArray2[1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[1, 3] == ta$stringArray2[1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[1, 3] == ta$stringArray2[1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[2, 1] == ta$stringArray2[2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[2, 1] == ta$stringArray2[2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[2, 2] == ta$stringArray2[2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[2, 2] == ta$stringArray2[2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[2, 3] == ta$stringArray2[2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray2); dim(v) <- c(2, 3); v[2, 3] == ta$stringArray2[2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$stringArray3[1, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 1, 1] == ta$stringArray3[1][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$stringArray3[1, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 1, 2] == ta$stringArray3[1][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$stringArray3[1, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 1, 3] == ta$stringArray3[1][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$stringArray3[1, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 2, 1] == ta$stringArray3[1][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$stringArray3[1, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 2, 2] == ta$stringArray3[1][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$stringArray3[1, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[1, 2, 3] == ta$stringArray3[1][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$stringArray3[2, 1, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 1, 1] == ta$stringArray3[2][1][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$stringArray3[2, 1, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 1, 2] == ta$stringArray3[2][1][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$stringArray3[2, 1, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 1, 3] == ta$stringArray3[2][1][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$stringArray3[2, 2, 1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 2, 1] == ta$stringArray3[2][2][1] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$stringArray3[2, 2, 2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 2, 2] == ta$stringArray3[2][2][2] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$stringArray3[2, 2, 3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); v <- as.vector(ta$stringArray3); dim(v) <- c(2, 2, 3); v[2, 2, 3] == ta$stringArray3[2][2][3] } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(ta$booleanArray2NotSquare) : ', '<<>>', 'A non rectangular array cannot be converted to a vector, only to a list.', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$booleanArray2NotSquare) } Error in as.vector(ta$booleanArray2NotSquare) : A non rectangular array cannot be converted to a vector, only to a list. ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(ta$byteArray2NotSquare) : ', '<<>>', 'A non rectangular array cannot be converted to a vector, only to a list.', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$byteArray2NotSquare) } Error in as.vector(ta$byteArray2NotSquare) : A non rectangular array cannot be converted to a vector, only to a list. ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(ta$charArray2NotSquare) : ', '<<>>', 'A non rectangular array cannot be converted to a vector, only to a list.', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$charArray2NotSquare) } Error in as.vector(ta$charArray2NotSquare) : A non rectangular array cannot be converted to a vector, only to a list. ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(ta$doubleArray2NotSquare) : ', '<<>>', 'A non rectangular array cannot be converted to a vector, only to a list.', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$doubleArray2NotSquare) } Error in as.vector(ta$doubleArray2NotSquare) : A non rectangular array cannot be converted to a vector, only to a list. ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(ta$floatArray2NotSquare) : ', '<<>>', 'A non rectangular array cannot be converted to a vector, only to a list.', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$floatArray2NotSquare) } Error in as.vector(ta$floatArray2NotSquare) : A non rectangular array cannot be converted to a vector, only to a list. ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(ta$integerArray2NotSquare) : ', '<<>>', 'A non rectangular array cannot be converted to a vector, only to a list.', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$integerArray2NotSquare) } Error in as.vector(ta$integerArray2NotSquare) : A non rectangular array cannot be converted to a vector, only to a list. ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(ta$longArray2NotSquare) : ', '<<>>', 'A non rectangular array cannot be converted to a vector, only to a list.', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$longArray2NotSquare) } Error in as.vector(ta$longArray2NotSquare) : A non rectangular array cannot be converted to a vector, only to a list. ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(ta$shortArray2NotSquare) : ', '<<>>', 'A non rectangular array cannot be converted to a vector, only to a list.', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$shortArray2NotSquare) } Error in as.vector(ta$shortArray2NotSquare) : A non rectangular array cannot be converted to a vector, only to a list. ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testMultiDimArrays# #if (!any(R.version$engine == "FastR")) { cat('Error in as.vector(ta$stringArray2NotSquare) : ', '<<>>', 'A non rectangular array cannot be converted to a vector, only to a list.', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); as.vector(ta$stringArray2NotSquare) } Error in as.vector(ta$stringArray2NotSquare) : A non rectangular array cannot be converted to a vector, only to a list. ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNamesForForeignObject# #if (!any(R.version$engine == "FastR")) { 'class' } else { names(java.type('int[]')) } [1] "class" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNamesForForeignObject# #if (!any(R.version$engine == "FastR")) { 'class' } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestNamesClassNoMembers'); t <- .fastr.interop.new(tc); names(t) } [1] "class" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNamesForForeignObject# #if (!any(R.version$engine == "FastR")) { 'class' } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestNamesClassNoPublicMembers'); t <- .fastr.interop.new(tc); names(t) } [1] "class" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNamesForForeignObject# #if (!any(R.version$engine == "FastR")) { NULL } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestNamesClass'); names(tc$staticField) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNamesForForeignObject# #if (!any(R.version$engine == "FastR")) { NULL } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestNamesClass'); names(tc$staticMethod) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNamesForForeignObject# #if (!any(R.version$engine == "FastR")) { [1] "length" "clone" } else { names(new(java.type('int[]'), 3)) } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNamesForForeignObject# #if (!any(R.version$engine == "FastR")) { c('class', 'field', 'method', 'staticField', 'staticMethod', 'superField', 'superMethod') } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestNamesClass'); t <- .fastr.interop.new(tc); sort(names(t)) } [1] "class" "field" "method" "staticField" "staticMethod" [6] "superField" "superMethod" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNamesForForeignObject# #if (!any(R.version$engine == "FastR")) { c(TRUE, TRUE) } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestNamesClass'); c('staticField', 'staticMethod') %in% names(tc) } [1] TRUE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNamesForForeignObject# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n$exception\n[polyglot value]\n\n$class\n[polyglot value]\n\n') } else { { java.addToClasspath(paste0(Sys.getenv('R_HOME'),'/mxbuild/dists/fastr-unit-tests.jar')); tec<-new('com.oracle.truffle.r.test.library.fastr.TestExceptionsClass'); tec } } [polyglot value] $exception [polyglot value] $class [polyglot value] ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNew# #if (!any(R.version$engine == "FastR")) { 2147483647 } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'); to <- new(tc); to$fieldInteger } [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNew# #if (!any(R.version$engine == "FastR")) { 2147483647 } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'); to$fieldStaticInteger } [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNew# #if (!any(R.version$engine == "FastR")) { TRUE } else { tc <- java.type('java.lang.Boolean'); to <- new(tc, TRUE); to } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNew# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- new('java.lang.Boolean', TRUE); to } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNew# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- new('java/lang/Boolean', TRUE); to } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNew# #if (!any(R.version$engine == "FastR")) { cat('Error in .fastr.interop.new(Class, ...) : ', '<<>>', 'error during Java object instantiation', '<<>>', sep=' ') } else { to <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'); new(to) } Error in .fastr.interop.new(Class, ...) : error during Java object instantiation ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNew# #if (!any(R.version$engine == "FastR")) { cat('Error in getClass(Class, where = topenv(parent.frame())) : ', '<<>>', '“__bogus_class_name__” is not a defined class', '<<>>', sep=' ') } else { to <- new('__bogus_class_name__'); } Error in getClass(Class, where = topenv(parent.frame())) : “__bogus_class_name__” is not a defined class ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[B' } else { a <- new(java.type('byte[]'), 10L); a$getClass()$getName(); } [1] "[B" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[C' } else { a <- new(java.type('char[]'), 10L); a$getClass()$getName(); } [1] "[C" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[D' } else { a <- new(java.type('double[]'), 10L); a$getClass()$getName(); } [1] "[D" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[F' } else { a <- new(java.type('float[]'), 10L); a$getClass()$getName(); } [1] "[F" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[I' } else { a <- new(java.type('int[]'), 10L); a$getClass()$getName(); } [1] "[I" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[J' } else { a <- new(java.type('long[]'), 10L); a$getClass()$getName(); } [1] "[J" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Lcom.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass;' } else { a <- new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass[]'), 10L); a$getClass()$getName(); } [1] "[Lcom.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.Boolean;' } else { a <- new(java.type('java.lang.Boolean[]'), 10L); a$getClass()$getName(); } [1] "[Ljava.lang.Boolean;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.Byte;' } else { a <- new(java.type('java.lang.Byte[]'), 10L); a$getClass()$getName(); } [1] "[Ljava.lang.Byte;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.Character;' } else { a <- new(java.type('java.lang.Character[]'), 10L); a$getClass()$getName(); } [1] "[Ljava.lang.Character;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.Double;' } else { a <- new(java.type('java.lang.Double[]'), 10L); a$getClass()$getName(); } [1] "[Ljava.lang.Double;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.Float;' } else { a <- new(java.type('java.lang.Float[]'), 10L); a$getClass()$getName(); } [1] "[Ljava.lang.Float;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.Integer;' } else { a <- new(java.type('java.lang.Integer[]'), 10L); a$getClass()$getName(); } [1] "[Ljava.lang.Integer;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.Long;' } else { a <- new(java.type('java.lang.Long[]'), 10L); a$getClass()$getName(); } [1] "[Ljava.lang.Long;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.Short;' } else { a <- new(java.type('java.lang.Short[]'), 10L); a$getClass()$getName(); } [1] "[Ljava.lang.Short;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.String;' } else { a <- new(java.type('java.lang.String[]'), 10L); a$getClass()$getName(); } [1] "[Ljava.lang.String;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[S' } else { a <- new(java.type('short[]'), 10L); a$getClass()$getName(); } [1] "[S" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[Z' } else { a <- new(java.type('boolean[]'), 10L); a$getClass()$getName(); } [1] "[Z" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[B' } else { a <- new(java.type('byte[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[B" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[C' } else { a <- new(java.type('char[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[C" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[D' } else { a <- new(java.type('double[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[D" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[F' } else { a <- new(java.type('float[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[F" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[I' } else { a <- new(java.type('int[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[I" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[J' } else { a <- new(java.type('long[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[J" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Lcom.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass;' } else { a <- new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Lcom.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Ljava.lang.Boolean;' } else { a <- new(java.type('java.lang.Boolean[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Ljava.lang.Boolean;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Ljava.lang.Byte;' } else { a <- new(java.type('java.lang.Byte[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Ljava.lang.Byte;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Ljava.lang.Character;' } else { a <- new(java.type('java.lang.Character[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Ljava.lang.Character;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Ljava.lang.Double;' } else { a <- new(java.type('java.lang.Double[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Ljava.lang.Double;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Ljava.lang.Float;' } else { a <- new(java.type('java.lang.Float[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Ljava.lang.Float;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Ljava.lang.Integer;' } else { a <- new(java.type('java.lang.Integer[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Ljava.lang.Integer;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Ljava.lang.Long;' } else { a <- new(java.type('java.lang.Long[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Ljava.lang.Long;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Ljava.lang.Short;' } else { a <- new(java.type('java.lang.Short[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Ljava.lang.Short;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Ljava.lang.String;' } else { a <- new(java.type('java.lang.String[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Ljava.lang.String;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[S' } else { a <- new(java.type('short[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[S" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { '[[Z' } else { a <- new(java.type('boolean[][]'), c(2L, 3L)); a$getClass()$getName(); } [1] "[[Z" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('boolean[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('byte[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('char[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('double[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('float[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('int[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('java.lang.Boolean[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('java.lang.Byte[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('java.lang.Character[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('java.lang.Double[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('java.lang.Float[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('java.lang.Integer[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('java.lang.Long[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('java.lang.Short[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('java.lang.String[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('long[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 10 } else { a <- new(java.type('short[]'), 10L); length(a) } [1] 10 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('boolean[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('byte[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('char[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('double[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('float[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('int[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('java.lang.Boolean[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('java.lang.Byte[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('java.lang.Character[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('java.lang.Double[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('java.lang.Float[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('java.lang.Integer[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('java.lang.Long[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('java.lang.Short[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('java.lang.String[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('long[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 2L } else { a <- new(java.type('short[][]'), c(2L, 3L)); length(a); } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('boolean[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('byte[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('char[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('double[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('float[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('int[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('java.lang.Boolean[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('java.lang.Byte[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('java.lang.Character[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('java.lang.Double[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('java.lang.Float[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('java.lang.Integer[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('java.lang.Long[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('java.lang.Short[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('java.lang.String[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('long[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { 3L } else { a <- new(java.type('short[][]'), c(2L, 3L)); length(a[1]); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('boolean[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('boolean[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('byte[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('byte[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('char[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('char[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('double[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('double[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('float[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('float[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('int[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('int[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Boolean[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Boolean[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Byte[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Byte[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Character[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Character[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Double[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Double[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Float[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Float[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Integer[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Integer[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Long[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Long[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Short[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.Short[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.String[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('java.lang.String[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('long[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('long[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('short[]'), 10L); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNewArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { a <- new(java.type('short[][]'), c(2L, 3L)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { as.character(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(as.vector(to$fieldDoubleArray)) } [1] "1.1" "2.1" "3.1" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { as.character(c(1L, 2L, 3L)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(as.vector(to$fieldIntegerArray)) } [1] "1" "2" "3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { as.character(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.character(as.vector(to$fieldBooleanArray)) } [1] "TRUE" "FALSE" "TRUE" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.complex(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(as.vector(to$fieldStringArray)) } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { as.complex(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(as.vector(to$fieldDoubleArray)) } [1] 1.1+0i 2.1+0i 3.1+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { as.complex(c(1L, 2L, 3L)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(as.vector(to$fieldIntegerArray)) } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { as.complex(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.complex(as.vector(to$fieldBooleanArray)) } [1] 1+0i 0+0i 1+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.double(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(as.vector(to$fieldStringArray)) } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { as.double(c(1L, 2L, 3L)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(as.vector(to$fieldIntegerArray)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { as.double(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.double(as.vector(to$fieldBooleanArray)) } [1] 1 0 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast#Output.IgnoreWarningMessage# #if (!any(R.version$engine == "FastR")) { as.integer(c("a", "b", "c")) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(as.vector(to$fieldStringArray)) } [1] NA NA NA Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { as.integer(c(1.1, 2.1, 3.1)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(as.vector(to$fieldDoubleArray)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { as.integer(c(TRUE, FALSE, TRUE)) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));as.integer(as.vector(to$fieldBooleanArray)) } [1] 1 0 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.complex(as.vector(to$fieldBooleanArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.complex(as.vector(to$fieldDoubleArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.complex(as.vector(to$fieldIntegerArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.complex(as.vector(to$fieldStringArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.complex(to$fieldBooleanArray), 'complex'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.complex(to$fieldDoubleArray), 'complex'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.complex(to$fieldIntegerArray), 'complex'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.complex(to$fieldStringArray), 'complex'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldBooleanArray), 'complex'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldDoubleArray), 'complex'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldIntegerArray), 'complex'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldStringArray), 'complex'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$ComplexClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.double(as.vector(to$fieldBooleanArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.double(as.vector(to$fieldIntegerArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.double(as.vector(to$fieldStringArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.double(to$fieldBooleanArray), 'double'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.double(to$fieldIntegerArray), 'double'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.double(to$fieldStringArray), 'double'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldBooleanArray), 'double'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldIntegerArray), 'double'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldStringArray), 'double'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$DoubleClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.integer(as.vector(to$fieldBooleanArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.integer(as.vector(to$fieldDoubleArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.integer(as.vector(to$fieldStringArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.integer(to$fieldBooleanArray), 'integer'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.integer(to$fieldDoubleArray), 'integer'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.integer(to$fieldStringArray), 'integer'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldBooleanArray), 'integer'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldDoubleArray), 'integer'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldStringArray), 'integer'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$IntClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.character(as.vector(to$fieldBooleanArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.character(as.vector(to$fieldDoubleArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.character(as.vector(to$fieldIntegerArray)), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.character(to$fieldBooleanArray), 'character'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.character(to$fieldDoubleArray), 'character'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.character(to$fieldIntegerArray), 'character'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldBooleanArray), 'character'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldDoubleArray), 'character'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNoCopyOnCast# #if (!any(R.version$engine == "FastR")) { cat('com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));.fastr.inspect(as.vector(as.vector(to$fieldIntegerArray), 'character'), inspectVectorData=TRUE) } com.oracle.truffle.r.runtime.data.VectorDataClosure$StringClosure ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNonPrimitiveParameter# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$equals(to) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNullParameters# #if (!any(R.version$engine == "FastR")) { } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$methodAcceptsOnlyNull(NULL) } NULL ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNullParameters#Ignored.Unimplemented# #if (!any(R.version$engine == "FastR")) { java.lang.Long } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$isNull(1) } Error: object 'java.lang.Long' not found ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testNullParameters#Ignored.Unimplemented# #if (!any(R.version$engine == "FastR")) { java.lang.String } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$isNull('string') } Error: object 'java.lang.String' not found ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReadByPositionsVector# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); t1 <- to[c(TRUE, FALSE)]; identical(to, t1) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReadByPositionsVector# #if (!any(R.version$engine == "FastR")) { c('a string', 'a') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to[c('fieldStringObject', 'fieldChar')] } [1] "a string" "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReadByPositionsVector# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c', 'b') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringArray[c(c(1,2), c(3, 2))] } [1] "a" "b" "c" "b" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReadByPositionsVector# #if (!any(R.version$engine == "FastR")) { c('a', 'c') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringArray[c(1, 3)] } [1] "a" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReadByPositionsVector# #if (!any(R.version$engine == "FastR")) { c('a', 'c') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringArray[c(TRUE, FALSE)] } [1] "a" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReadByPositionsVector# #if (!any(R.version$engine == "FastR")) { c(NA_integer_, 3L) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$hasNullIntArray[c(2, 3)] } [1] NA 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReadByPositionsVector#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { just wrong } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); ta$integerArray2[c(1,2), c(1,2)] } Error: unexpected symbol in "if (!any(R.version$engine == "FastR")) { just wrong" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReadByPositionsVector# #if (!any(R.version$engine == "FastR")) { list('a string', 2147483647) } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to[c('fieldStringObject', 'fieldInteger')] } [[1]] [1] "a string" [[2]] [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReadByPositionsVector# #if (!any(R.version$engine == "FastR")) { list() } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to[c(FALSE, TRUE)] } list() ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReturnsNull# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.null(to$fieldNullObject) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testReturnsNull# #if (!any(R.version$engine == "FastR")) { TRUE } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));is.null(to$methodReturnsNull()) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testS3# #if (!any(R.version$engine == "FastR")) { 42 } else { cal <- new('java.util.GregorianCalendar'); dim.polyglot.value <- function(x) 42; dim(cal) } [1] 42 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testS3# #if (!any(R.version$engine == "FastR")) { 42 } else { cal <- new('java.util.GregorianCalendar'); ff <- function(x) UseMethod('ff', x); ff.default <- function(x) 666; ff.polyglot.value <- function(x) 42; ff(cal) } [1] 42 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { as.character(c(1.1, 1.2, 1.3)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.character(as.vector(ta$doubleArray)); unserialize(serialize(v, NULL, version=2)) } [1] "1.1" "1.2" "1.3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { as.character(c(1.1, 1.2, 1.3)) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.character(as.vector(ta$doubleArray)); unserialize(serialize(v, NULL, version=3)) } [1] "1.1" "1.2" "1.3" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$charArray); unserialize(serialize(v, NULL, version=2)) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$charArray); unserialize(serialize(v, NULL, version=3)) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$stringArray); unserialize(serialize(v, NULL, version=2)) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$stringArray); unserialize(serialize(v, NULL, version=3)) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1+0i, 2+0i, 3+0i) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.complex(as.vector(ta$integerArray)); unserialize(serialize(v, NULL, version=2)) } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1+0i, 2+0i, 3+0i) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.complex(as.vector(ta$integerArray)); unserialize(serialize(v, NULL, version=3)) } [1] 1+0i 2+0i 3+0i ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.double(as.vector(ta$integerArray)); unserialize(serialize(v, NULL, version=2)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.double(as.vector(ta$integerArray)); unserialize(serialize(v, NULL, version=3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$longArray); unserialize(serialize(v, NULL, version=2)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$longArray); unserialize(serialize(v, NULL, version=3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$doubleArray); unserialize(serialize(v, NULL, version=2)) } [1] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$doubleArray); unserialize(serialize(v, NULL, version=3)) } [1] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1L, 1L, 1L) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.integer(as.vector(ta$doubleArray)); unserialize(serialize(v, NULL, version=2)) } [1] 1 1 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1L, 1L, 1L) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.integer(as.vector(ta$doubleArray)); unserialize(serialize(v, NULL, version=3)) } [1] 1 1 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$byteArray); unserialize(serialize(v, NULL, version=2)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$byteArray); unserialize(serialize(v, NULL, version=3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$integerArray); unserialize(serialize(v, NULL, version=2)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$integerArray); unserialize(serialize(v, NULL, version=3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$shortArray); unserialize(serialize(v, NULL, version=2)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(1L, 2L, 3L) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$shortArray); unserialize(serialize(v, NULL, version=3)) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(T, F, T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$booleanArray); unserialize(serialize(v, NULL, version=2)) } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { c(T, F, T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$booleanArray); unserialize(serialize(v, NULL, version=3)) } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(as.character(c(1.1, 1.2, 1.3)), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.character(as.vector(ta$doubleArray)); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 10 00 00 00 03 00 04 00 [26] 09 00 00 00 03 31 2e 31 00 04 00 09 00 00 00 03 31 2e 32 00 04 00 09 00 00 [51] 00 03 31 2e 33 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(as.character(c(1.1, 1.2, 1.3)), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.character(as.vector(ta$doubleArray)); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 ee 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 0f 64 65 66 65 72 72 65 [51] 64 5f 73 74 72 69 6e 67 00 00 00 02 00 00 00 01 00 04 00 09 00 00 00 04 62 [76] 61 73 65 00 00 00 02 00 00 00 0d 00 00 00 01 00 00 00 10 00 00 00 fe 00 00 [101] 00 02 00 00 00 0e 00 00 00 03 3f f1 99 99 99 99 99 9a 3f f3 33 33 33 33 33 [126] 33 3f f4 cc cc cc cc cc cd 00 00 00 0d 00 00 00 01 00 00 00 00 00 00 00 fe ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c('a', 'b', 'c'), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$charArray); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 10 00 00 00 03 00 04 00 [26] 09 00 00 00 01 61 00 04 00 09 00 00 00 01 62 00 04 00 09 00 00 00 01 63 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c('a', 'b', 'c'), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$stringArray); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 10 00 00 00 03 00 04 00 [26] 09 00 00 00 01 61 00 04 00 09 00 00 00 01 62 00 04 00 09 00 00 00 01 63 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c('a', 'b', 'c'), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$charArray); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 10 00 00 00 03 00 04 00 09 00 00 00 01 61 00 04 00 09 00 00 00 01 62 00 [51] 04 00 09 00 00 00 01 63 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c('a', 'b', 'c'), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$stringArray); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 10 00 00 00 03 00 04 00 09 00 00 00 01 61 00 04 00 09 00 00 00 01 62 00 [51] 04 00 09 00 00 00 01 63 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1+0i, 2+0i, 3+0i), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.complex(as.vector(ta$integerArray)); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0f 00 00 00 03 3f f0 00 [26] 00 00 00 00 00 00 00 00 00 00 00 00 00 40 00 00 00 00 00 00 00 00 00 00 00 [51] 00 00 00 00 40 08 00 00 00 00 00 00 00 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1+0i, 2+0i, 3+0i), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.complex(as.vector(ta$integerArray)); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0f 00 00 00 03 3f f0 00 00 00 00 00 00 00 00 00 00 00 00 00 00 40 00 00 [51] 00 00 00 00 00 00 00 00 00 00 00 00 00 40 08 00 00 00 00 00 00 00 00 00 00 [76] 00 00 00 00 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1, 2, 3), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.double(as.vector(ta$integerArray)); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0e 00 00 00 03 3f f0 00 [26] 00 00 00 00 00 40 00 00 00 00 00 00 00 40 08 00 00 00 00 00 00 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1, 2, 3), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$longArray); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0e 00 00 00 03 3f f0 00 [26] 00 00 00 00 00 40 00 00 00 00 00 00 00 40 08 00 00 00 00 00 00 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1, 2, 3), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.double(as.vector(ta$integerArray)); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0e 00 00 00 03 3f f0 00 00 00 00 00 00 40 00 00 00 00 00 00 00 40 08 00 [51] 00 00 00 00 00 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1, 2, 3), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$longArray); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0e 00 00 00 03 3f f0 00 00 00 00 00 00 40 00 00 00 00 00 00 00 40 08 00 [51] 00 00 00 00 00 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1.1, 1.2, 1.3), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$doubleArray); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0e 00 00 00 03 3f f1 99 [26] 99 99 99 99 9a 3f f3 33 33 33 33 33 33 3f f4 cc cc cc cc cc cd ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1.1, 1.2, 1.3), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$doubleArray); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0e 00 00 00 03 3f f1 99 99 99 99 99 9a 3f f3 33 33 33 33 33 33 3f f4 cc [51] cc cc cc cc cd ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1L, 1L, 1L), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.integer(as.vector(ta$doubleArray)); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 03 00 00 00 [26] 01 00 00 00 01 00 00 00 01 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1L, 1L, 1L), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.integer(as.vector(ta$doubleArray)); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0d 00 00 00 03 00 00 00 01 00 00 00 01 00 00 00 01 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1L, 2L, 3L), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$byteArray); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 03 00 00 00 [26] 01 00 00 00 02 00 00 00 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1L, 2L, 3L), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$integerArray); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 03 00 00 00 [26] 01 00 00 00 02 00 00 00 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1L, 2L, 3L), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$shortArray); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0d 00 00 00 03 00 00 00 [26] 01 00 00 00 02 00 00 00 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1L, 2L, 3L), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$byteArray); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0d 00 00 00 03 00 00 00 01 00 00 00 02 00 00 00 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1L, 2L, 3L), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$integerArray); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0d 00 00 00 03 00 00 00 01 00 00 00 02 00 00 00 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(1L, 2L, 3L), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$shortArray); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0d 00 00 00 03 00 00 00 01 00 00 00 02 00 00 00 03 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(T, F, T), NULL, version=2) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$booleanArray); serialize(v, NULL, version=2) } [1] 58 0a 00 00 00 02 00 04 00 03 00 02 03 00 00 00 00 0a 00 00 00 03 00 00 00 [26] 01 00 00 00 00 00 00 00 01 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testSerialize# #if (!any(R.version$engine == "FastR")) { serialize(c(T, F, T), NULL, version=3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass');v <- as.vector(ta$booleanArray); serialize(v, NULL, version=3) } [1] 58 0a 00 00 00 03 00 04 00 03 00 03 05 00 00 00 00 05 55 54 46 2d 38 00 00 [26] 00 0a 00 00 00 03 00 00 00 01 00 00 00 00 00 00 00 01 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { '[B' } else { a <- .fastr.interop.asJavaArray(as.raw(1)); a$getClass()$getName(); } [1] "[B" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { '[B' } else { a <- .fastr.interop.asJavaArray(as.raw(c(1, 2, 3))); a$getClass()$getName(); } [1] "[B" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { '[D' } else { a <- .fastr.interop.asJavaArray(1.1); a$getClass()$getName(); } [1] "[D" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { '[I' } else { a <- .fastr.interop.asJavaArray(1L); a$getClass()$getName(); } [1] "[I" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { '[I' } else { a <- .fastr.interop.asJavaArray(as.raw(c(1, 2, 3)), 'int'); a$getClass()$getName(); } [1] "[I" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { '[Ljava.lang.String;' } else { a <- .fastr.interop.asJavaArray('a'); a$getClass()$getName(); } [1] "[Ljava.lang.String;" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { '[S' } else { a <- .fastr.interop.asJavaArray(.fastr.interop.asShort(1)); a$getClass()$getName(); } [1] "[S" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { '[Z' } else { a <- .fastr.interop.asJavaArray(T); a$getClass()$getName(); } [1] "[Z" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { 1 } else { a <- .fastr.interop.asJavaArray(as.raw(1)); length(a); } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { 2 } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'); to <- .fastr.interop.new(tc); a <- .fastr.interop.asJavaArray(c(to, to)); length(a) } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { 3 } else { a <- .fastr.interop.asJavaArray(as.raw(c(1, 2, 3))); length(a); } [1] 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'); to <- .fastr.interop.new(tc); a <- .fastr.interop.asJavaArray(c(to, to)); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { TRUE } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'); to <- .fastr.interop.new(tc); a <- .fastr.interop.asJavaArray(to); is.polyglot.value(a) && length(a) > 0 } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { [Lcom.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass; } else { tc <- java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'); to <- .fastr.interop.new(tc); a <- .fastr.interop.asJavaArray(c(to, to)); a$getClass()$getName(); } Error: unexpected '[' in "if (!any(R.version$engine == "FastR")) { [" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] TRUE FALSE\n') } else { a <- .fastr.interop.asJavaArray(c(T, F)); a; } [polyglot value] [1] TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] TRUE FALSE\n') } else { a <- .fastr.interop.asJavaArray(c(T, F),'boolean',T); a; } [polyglot value] [1] TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] TRUE FALSE\n') } else { a <- .fastr.interop.asJavaArray(c(T, F),,T); a; } [polyglot value] [1] TRUE FALSE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "a" "b"\n') } else { a <- .fastr.interop.asJavaArray(c('a', 'b')); a; } [polyglot value] [1] "a" "b" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "a" "b"\n') } else { a <- .fastr.interop.asJavaArray(c('a', 'b'),'java.lang.String',T); a; } [polyglot value] [1] "a" "b" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "a" "b"\n') } else { a <- .fastr.interop.asJavaArray(c('a', 'b'),,T); a; } [polyglot value] [1] "a" "b" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "a"\n') } else { a <- .fastr.interop.asJavaArray('a'); a; } [polyglot value] [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] "a"\n') } else { a <- .fastr.interop.asJavaArray('a',,T); a; } [polyglot value] [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2\n') } else { a <- .fastr.interop.asJavaArray(c(.fastr.interop.asShort(1), .fastr.interop.asShort(2))); a; } [polyglot value] [1] 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2\n') } else { a <- .fastr.interop.asJavaArray(c(.fastr.interop.asShort(1), .fastr.interop.asShort(2)), 'int'); a; } [polyglot value] [1] 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2\n') } else { a <- .fastr.interop.asJavaArray(c(.fastr.interop.asShort(1), .fastr.interop.asShort(2)), 'java.lang.Short'); a; } [polyglot value] [1] 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2\n') } else { a <- .fastr.interop.asJavaArray(c(.fastr.interop.asShort(1), .fastr.interop.asShort(2)), 'java.lang.Short', T); a; } [polyglot value] [1] 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2\n') } else { a <- .fastr.interop.asJavaArray(c(.fastr.interop.asShort(1), .fastr.interop.asShort(2)),'int',T); a; } [polyglot value] [1] 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2\n') } else { a <- .fastr.interop.asJavaArray(c(.fastr.interop.asShort(1), .fastr.interop.asShort(2)),,T); a; } [polyglot value] [1] 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2\n') } else { a <- .fastr.interop.asJavaArray(c(1L, 2L)); a; } [polyglot value] [1] 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2\n') } else { a <- .fastr.interop.asJavaArray(c(1L, 2L),'double',T); a; } [polyglot value] [1] 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1 2\n') } else { a <- .fastr.interop.asJavaArray(c(1L, 2L),,T); a; } [polyglot value] [1] 1 2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1.1 1.2\n') } else { a <- .fastr.interop.asJavaArray(c(1.1, 1.2)); a; } [polyglot value] [1] 1.1 1.2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1.1 1.2\n') } else { a <- .fastr.interop.asJavaArray(c(1.1, 1.2),'double',T); a; } [polyglot value] [1] 1.1 1.2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1.1 1.2\n') } else { a <- .fastr.interop.asJavaArray(c(1.1, 1.2),,T); a; } [polyglot value] [1] 1.1 1.2 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1.123 2.123\n') } else { a <- .fastr.interop.asJavaArray(c(1.123, 2.123), 'double'); a; } [polyglot value] [1] 1.123 2.123 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1.1\n') } else { a <- .fastr.interop.asJavaArray(1.1); a; } [polyglot value] [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1.1\n') } else { a <- .fastr.interop.asJavaArray(1.1,,T); a; } [polyglot value] [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(.fastr.interop.asShort(1)); .fastr.interop.asJavaArray(a); } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(.fastr.interop.asShort(1)); a; } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(.fastr.interop.asShort(1), 'double'); a; } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(.fastr.interop.asShort(1), 'java.lang.Short'); a; } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(.fastr.interop.asShort(1), 'java.lang.Short', T); a; } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(.fastr.interop.asShort(1),,T); a; } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(1L); .fastr.interop.asJavaArray(a); } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(1L); .fastr.interop.asJavaArray(a,,T); } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(1L); a; } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(1L,,F); a; } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(1L,,T); a; } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] 1\n') } else { a <- .fastr.interop.asJavaArray(as.raw(1)); a } [polyglot value] [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] TRUE\n') } else { a <- .fastr.interop.asJavaArray(T); a; } [polyglot value] [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToArray# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]\n[1] TRUE\n') } else { a <- .fastr.interop.asJavaArray(T,,T); a; } [polyglot value] [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { 'interopt.byte' } else { v <- .fastr.interop.asByte(1.1); class(v); } [1] "interopt.byte" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { 'interopt.byte' } else { v <- .fastr.interop.asByte(1.1); typeof(v); } [1] "interopt.byte" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { -1 } else { v <- .fastr.interop.asByte(1.7976931348623157E308); v; } [1] -1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { -1 } else { v <- .fastr.interop.asByte(2147483647); v; } [1] -1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { -128 } else { v <- .fastr.interop.asByte(-128); v; } [1] -128 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { 0 } else { v <- .fastr.interop.asByte(-2147483648); v; } [1] 0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { 0 } else { v <- .fastr.interop.asByte(4.9E-324); v; } [1] 0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asByte(1.1); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asByte(1L); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asByte(as.raw(1)); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToByte# #if (!any(R.version$engine == "FastR")) { 127 } else { v <- .fastr.interop.asByte(127); v; } [1] 127 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { 'a' } else { v <- .fastr.interop.asChar('a'); v; } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { 'a' } else { v <- .fastr.interop.asChar(97.1); v; } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { 'a' } else { v <- .fastr.interop.asChar(97L); v; } [1] "a" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { 'b' } else { v <- .fastr.interop.asChar('abc', 1); v; } [1] "b" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { 'b' } else { v <- .fastr.interop.asChar('abc', 1.1); v; } [1] "b" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { 'interopt.char' } else { v <- .fastr.interop.asChar(97.1); class(v); } [1] "interopt.char" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { 'interopt.char' } else { v <- .fastr.interop.asChar(97.1); typeof(v); } [1] "interopt.char" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { 'interopt.char' } else { v <- .fastr.interop.asChar(97L); class(v); } [1] "interopt.char" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { 'interopt.char' } else { v <- .fastr.interop.asChar(97L); typeof(v); } [1] "interopt.char" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { cat('Error in .fastr.interop.asChar(97.1, 1) : ', '<<>>', 'pos argument not allowed with a numeric value', '<<>>', sep=' ') } else { v <- .fastr.interop.asChar(97.1, 1); v; } Error in .fastr.interop.asChar(97.1, 1) : pos argument not allowed with a numeric value ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToChar# #if (!any(R.version$engine == "FastR")) { cat('Error in .fastr.interop.asChar(97L, 1) : ', '<<>>', 'pos argument not allowed with a numeric value', '<<>>', sep=' ') } else { v <- .fastr.interop.asChar(97L, 1); v; } Error in .fastr.interop.asChar(97L, 1) : pos argument not allowed with a numeric value ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { 'interopt.float' } else { v <- .fastr.interop.asFloat(1.1); class(v); } [1] "interopt.float" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { 'interopt.float' } else { v <- .fastr.interop.asFloat(1.1); typeof(v); } [1] "interopt.float" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { 'interopt.float' } else { v <- .fastr.interop.asFloat(1L); class(v); } [1] "interopt.float" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { 'interopt.float' } else { v <- .fastr.interop.asFloat(1L); typeof(v); } [1] "interopt.float" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { 0.0 } else { v <- .fastr.interop.asFloat(4.9E-324); v; } [1] 0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asFloat(1L); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asFloat(as.raw(1)); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { 1.1 } else { v <- .fastr.interop.asFloat(1.1); v; } [1] 1.1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { 1.401298464324817E-45 } else { v <- .fastr.interop.asFloat(1.4E-45); v; } [1] 1.401298e-45 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { 3.4028235E38 } else { v <- .fastr.interop.asFloat(3.4028235E38); v; } [1] 3.402823e+38 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToFloat# #if (!any(R.version$engine == "FastR")) { Inf } else { v <- .fastr.interop.asFloat(1.7976931348623157E308); v; } [1] Inf ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { 'interopt.long' } else { v <- .fastr.interop.asLong(1.1); class(v); } [1] "interopt.long" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { 'interopt.long' } else { v <- .fastr.interop.asLong(1.1); typeof(v); } [1] "interopt.long" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { 'interopt.long' } else { v <- .fastr.interop.asLong(1L); class(v); } [1] "interopt.long" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { 'interopt.long' } else { v <- .fastr.interop.asLong(1L); typeof(v); } [1] "interopt.long" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { -2147483648 } else { v <- .fastr.interop.asLong(-2147483648); v; } [1] -2147483648 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { 0 } else { v <- .fastr.interop.asLong(4.9E-324); v; } [1] 0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asLong(1.1); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asLong(1L); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asLong(as.raw(1)); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { 2147483647 } else { v <- .fastr.interop.asLong(2147483647); v; } [1] 2147483647 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToLong# #if (!any(R.version$engine == "FastR")) { 9223372036854775807 } else { v <- .fastr.interop.asLong(1.7976931348623157E308); v; } [1] 9.223372e+18 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { 'interopt.short' } else { v <- .fastr.interop.asShort(1.1); class(v); } [1] "interopt.short" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { 'interopt.short' } else { v <- .fastr.interop.asShort(1.1); typeof(v); } [1] "interopt.short" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { 'interopt.short' } else { v <- .fastr.interop.asShort(1L); class(v); } [1] "interopt.short" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { 'interopt.short' } else { v <- .fastr.interop.asShort(1L); typeof(v); } [1] "interopt.short" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { -1 } else { v <- .fastr.interop.asShort(1.7976931348623157E308); v; } [1] -1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { -1 } else { v <- .fastr.interop.asShort(2147483647); v; } [1] -1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { -32768 } else { v <- .fastr.interop.asShort(-32768); v; } [1] -32768 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { 0 } else { v <- .fastr.interop.asShort(-2147483648); v; } [1] 0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { 0 } else { v <- .fastr.interop.asShort(4.9E-324); v; } [1] 0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asShort(1.1); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asShort(1L); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { 1 } else { v <- .fastr.interop.asShort(as.raw(1)); v; } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testToShort# #if (!any(R.version$engine == "FastR")) { 32767 } else { v <- .fastr.interop.asShort(32767); v; } [1] 32767 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testTranspose# #if (!any(R.version$engine == "FastR")) { cat('Error in t.default(ta) : argument is not a matrix', '<<>>', sep=' ') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); t(ta) } Error in t.default(ta) : argument is not a matrix ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testTranspose# #if (!any(R.version$engine == "FastR")) { t(c('a', 'b', 'c')) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); t(ta$stringArray) } [,1] [,2] [,3] [1,] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testTranspose# #if (!any(R.version$engine == "FastR")) { t(matrix(c('a', 'a', 'b', 'b', 'c', 'c'), c(2, 3))) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); t(ta$stringArray2) } [,1] [,2] [1,] "a" "a" [2,] "b" "b" [3,] "c" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'character' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$charArray)) } [1] "character" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'character' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$charObjectArray)) } [1] "character" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'character' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$heterogenousPrimitiveArray)) } [1] "character" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'character' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$stringArray)) } [1] "character" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'integer' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$byteArray)) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'integer' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$byteObjectArray)) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'integer' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$integerArray)) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'integer' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$integerObjectArray)) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'integer' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$onlyIntegerObjectArray)) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'integer' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$shortArray)) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'integer' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$shortObjectArray)) } [1] "integer" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'logical' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$booleanArray)) } [1] "logical" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'logical' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$booleanObjectArray)) } [1] "logical" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'numeric' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$doubleArray)) } [1] "numeric" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'numeric' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$doubleObjectArray)) } [1] "numeric" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'numeric' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$floatArray)) } [1] "numeric" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'numeric' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$floatObjectArray)) } [1] "numeric" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'numeric' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$longArray)) } [1] "numeric" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'numeric' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$longObjectArray)) } [1] "numeric" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { 'numeric' } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$onlyLongObjectArray)) } [1] "numeric" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); l<-list(ta, ta); ul <- unlist(l); identical(l, ul) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { TRUE } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); tal <- unlist(ta); identical(ta, tal) } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('1', 'a', '1') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$heterogenousPrimitiveArray) } [1] "1" "a" "1" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$charArray) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$charArray, recursive=FALSE) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$charObjectArray) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$charObjectArray, recursive=FALSE) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$stringArray) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$stringArray, recursive=FALSE) } [1] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c', 'a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$charArray2, recursive=FALSE) } [1] "a" "b" "c" "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c', 'a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$charObjectArray2, recursive=FALSE) } [1] "a" "b" "c" "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('a', 'b', 'c', 'a', 'b', 'c') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$stringArray2, recursive=FALSE) } [1] "a" "b" "c" "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$booleanArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$booleanObjectArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$byteArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$byteObjectArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$charArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$charObjectArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$doubleArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$doubleObjectArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$floatArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$floatObjectArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$integerArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$integerObjectArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$longArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$longObjectArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$shortArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$shortObjectArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c('matrix', 'array') } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); class(unlist(ta$stringArray2)) } [1] "matrix" "array" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$byteArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$byteArray, recursive=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$byteObjectArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$byteObjectArray, recursive=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$integerArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$integerArray, recursive=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$integerObjectArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$integerObjectArray, recursive=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$longArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$longArray, recursive=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$longObjectArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$longObjectArray, recursive=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$onlyIntegerObjectArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$onlyLongObjectArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$shortArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$shortArray, recursive=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$shortObjectArray) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$shortObjectArray, recursive=FALSE) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$byteArray2, recursive=FALSE) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$byteObjectArray2, recursive=FALSE) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$integerArray2, recursive=FALSE) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$integerObjectArray2, recursive=FALSE) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$longArray2, recursive=FALSE) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$longObjectArray2, recursive=FALSE) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$shortArray2, recursive=FALSE) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1, 2, 3, 1, 2, 3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$shortObjectArray2, recursive=FALSE) } [1] 1 2 3 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$doubleArray) } [1] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$doubleArray, recursive=FALSE) } [1] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$doubleObjectArray) } [1] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$doubleObjectArray, recursive=FALSE) } [1] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$floatArray) } [1] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$floatArray, recursive=FALSE) } [1] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$floatObjectArray) } [1] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$floatObjectArray, recursive=FALSE) } [1] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3, 1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$doubleArray2, recursive=FALSE) } [1] 1.1 1.2 1.3 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3, 1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$doubleObjectArray2, recursive=FALSE) } [1] 1.1 1.2 1.3 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3, 1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$floatArray2, recursive=FALSE) } [1] 1.1 1.2 1.3 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(1.1, 1.2, 1.3, 1.1, 1.2, 1.3) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$floatObjectArray2, recursive=FALSE) } [1] 1.1 1.2 1.3 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$booleanArray) } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$booleanArray, recursive=FALSE) } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$booleanObjectArray) } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$booleanObjectArray, recursive=FALSE) } [1] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE, TRUE, FALSE, TRUE) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$booleanArray2, recursive=FALSE) } [1] TRUE FALSE TRUE TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { c(TRUE, FALSE, TRUE, TRUE, FALSE, TRUE) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$booleanObjectArray2, recursive=FALSE) } [1] TRUE FALSE TRUE TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c('a', 'b', 'c', 'a', 'b', 'c'), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$charArray2) } [,1] [,2] [,3] [1,] "a" "b" "c" [2,] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c('a', 'b', 'c', 'a', 'b', 'c'), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$charObjectArray2) } [,1] [,2] [,3] [1,] "a" "b" "c" [2,] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c('a', 'b', 'c', 'a', 'b', 'c'), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$stringArray2) } [,1] [,2] [,3] [1,] "a" "b" "c" [2,] "a" "b" "c" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1, 2, 3, 1, 2, 3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$byteArray2) } [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1, 2, 3, 1, 2, 3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$byteObjectArray2) } [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1, 2, 3, 1, 2, 3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$integerArray2) } [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1, 2, 3, 1, 2, 3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$integerObjectArray2) } [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1, 2, 3, 1, 2, 3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$longArray2) } [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1, 2, 3, 1, 2, 3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$longObjectArray2) } [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1, 2, 3, 1, 2, 3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$shortArray2) } [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1, 2, 3, 1, 2, 3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$shortObjectArray2) } [,1] [,2] [,3] [1,] 1 2 3 [2,] 1 2 3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1.1, 1.2, 1.3, 1.1, 1.2, 1.3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$doubleArray2) } [,1] [,2] [,3] [1,] 1.1 1.2 1.3 [2,] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1.1, 1.2, 1.3, 1.1, 1.2, 1.3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$doubleObjectArray2) } [,1] [,2] [,3] [1,] 1.1 1.2 1.3 [2,] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1.1, 1.2, 1.3, 1.1, 1.2, 1.3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$floatArray2) } [,1] [,2] [,3] [1,] 1.1 1.2 1.3 [2,] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(1.1, 1.2, 1.3, 1.1, 1.2, 1.3), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$floatObjectArray2) } [,1] [,2] [,3] [1,] 1.1 1.2 1.3 [2,] 1.1 1.2 1.3 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(TRUE, FALSE, TRUE, TRUE, FALSE, TRUE), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$booleanArray2) } [,1] [,2] [,3] [1,] TRUE FALSE TRUE [2,] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testUnlist# #if (!any(R.version$engine == "FastR")) { matrix(c(TRUE, FALSE, TRUE, TRUE, FALSE, TRUE), nrow=2, ncol=3, byrow=T) } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); unlist(ta$booleanObjectArray2) } [,1] [,2] [,3] [1,] TRUE FALSE TRUE [2,] TRUE FALSE TRUE ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWhile#Output.IgnoreErrorContext# #if (!any(R.version$engine == "FastR")) { cat('Error in if (T) print(\'OK\') : argument is not interpretable as logical', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));while(to) print('OK') } Error in if (T) print('OK') : argument is not interpretable as logical ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWhile# #if (!any(R.version$engine == "FastR")) { while(1) {print('OK'); break;} } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));while(to$fieldInteger) {print('OK'); break;} } [1] "OK" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWhile# #if (!any(R.version$engine == "FastR")) { while(T) {print('OK'); break;} } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));while(to$fieldBoolean) {print('OK'); break;} } [1] "OK" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWhile#Output.IgnoreWarningContext# #if (!any(R.version$engine == "FastR")) { while(c('TRUE', 'TRUE', 'FALSE')) {print('OK'); break;} } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));while(to$fieldStringBooleanArray) {print('OK'); break;} } [1] "OK" Warning message: In while (c("TRUE", "TRUE", "FALSE")) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWhile#Output.IgnoreWarningContext#Output.IgnoreErrorContext# #if (!any(R.version$engine == "FastR")) { while(c('a', 'b')) {print('OK'); break;} } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));if(to$fieldStringArray) {print('OK'); break;} } Error in while (c("a", "b")) { : argument is not interpretable as logical In addition: Warning message: In while (c("a", "b")) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWhile#Output.IgnoreWarningContext# #if (!any(R.version$engine == "FastR")) { while(c(T, F)) {print('OK'); break;} } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));while(to$fieldBooleanArray) {print('OK'); break;} } [1] "OK" Warning message: In while (c(T, F)) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWhile#Output.IgnoreWarningContext# #if (!any(R.version$engine == "FastR")) { while(c(T, F)) {print('OK'); break;} } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass'));while(to$fieldIntegerArray) {print('OK'); break;} } [1] "OK" Warning message: In while (c(T, F)) { : the condition has length > 1 and only the first element will be used ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWriteByPositionsVector# #if (!any(R.version$engine == "FastR")) { 111 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to[c('fieldInteger', 'fieldDouble')] <- c(111L, 222); to['fieldInteger'] } [1] 111 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWriteByPositionsVector# #if (!any(R.version$engine == "FastR")) { 222 } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to[c('fieldInteger', 'fieldDouble')] <- c(111L, 222); to['fieldDouble'] } [1] 222 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWriteByPositionsVector# #if (!any(R.version$engine == "FastR")) { cat('Error in to$fieldStringArray[c(1, 3)] <- c("x", "x", "x") : ', '<<>>', 'number of items to replace is not a multiple of replacement length', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringArray[c(1, 3)] <- c('x', 'x', 'x'); to$fieldStringArray } Error in to$fieldStringArray[c(1, 3)] <- c("x", "x", "x") : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWriteByPositionsVector# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]<<>>[1] "x" "b" "x"<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringArray[c(1, 3)] <- 'x'; to$fieldStringArray } [polyglot value] [1] "x" "b" "x" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWriteByPositionsVector# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]<<>>[1] "x" "b" "x"<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringArray[c(TRUE, FALSE)] <- 'x'; to$fieldStringArray } [polyglot value] [1] "x" "b" "x" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWriteByPositionsVector# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]<<>>[1] "x" "b" "y"<<>>') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringArray[c(1, 3)] <- c('x', 'y'); to$fieldStringArray } [polyglot value] [1] "x" "b" "y" ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWriteByPositionsVector# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]<<>>[1] "x" "b" "y"<<>>Warning message:<<>>In to$fieldStringArray[c(TRUE, FALSE)] <- c("x", "y") : ', '<<>>', 'number of items to replace is not a multiple of replacement length', '<<>>', sep=' ') } else { to <- .fastr.interop.new(java.type('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestClass')); to$fieldStringArray[c(TRUE, FALSE)] <- c('x', 'y'); to$fieldStringArray } [polyglot value] [1] "x" "b" "y" Warning message: In to$fieldStringArray[c(TRUE, FALSE)] <- c("x", "y") : number of items to replace is not a multiple of replacement length ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWriteByPositionsVector# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]<<>>[1] 0 2 0 4 0 0<<>>') } else { ja <- new(java.type('int[]'), 6); for(i in 1:6) ja[i] <- i; ja[c(c(1, 3), c(5, 6))] <- 0; ja } [polyglot value] [1] 0 2 0 4 0 0 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWriteByPositionsVector# #if (!any(R.version$engine == "FastR")) { cat('[polyglot value]<<>>[1] 8 2 9 4 8 9<<>>') } else { ja <- new(java.type('int[]'), 6); for(i in 1:6) ja[i] <- i; ja[c(1, 3, 5, 6)] <- c(8, 9); ja } [polyglot value] [1] 8 2 9 4 8 9 ##com.oracle.truffle.r.test.library.fastr.TestJavaInterop.testWriteByPositionsVector#Ignored.ImplementationError# #if (!any(R.version$engine == "FastR")) { just wrong } else { ta <- new('com.oracle.truffle.r.test.library.fastr.TestJavaInterop$TestArraysClass'); ta$integerArray2[c(1,2), c(1,2)] <- 1 } Error: unexpected symbol in "if (!any(R.version$engine == "FastR")) { just wrong" ##com.oracle.truffle.r.test.library.fastr.TestStateTrans.testTransitions# #if (!any(R.version$engine == "FastR")) { 1 } else { { f<-function(x) .fastr.refcountinfo(x); f(c(1,2)) } } [1] 1 ##com.oracle.truffle.r.test.library.fastr.TestStateTrans.testTransitions# #if (!any(R.version$engine == "FastR")) { 2 } else { { f<-function(x) { y<-x; .fastr.refcountinfo(y) }; f(c(1,2)) } } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestStateTrans.testTransitions# #if (!any(R.version$engine == "FastR")) { 2 } else { { x<-c(1,2); f<-function(x) .fastr.refcountinfo(x); f(x) } } [1] 2 ##com.oracle.truffle.r.test.library.fastr.TestStateTrans.testTransitions# #if (!any(R.version$engine == "FastR")) { FALSE } else { { f<-function(y) { x<-y; xi1<-.fastr.identity(x); x[1]<-7; xi2<-.fastr.identity(x); xi1 == xi2 }; f(c(1,2)) } } [1] FALSE ##com.oracle.truffle.r.test.library.fastr.TestStateTrans.testTransitions# #if (!any(R.version$engine == "FastR")) { TRUE } else { { f<-function(x) { xi1<-.fastr.identity(x); x[1]<-7; xi2<-.fastr.identity(x); xi1 == xi2 }; f(c(1,2)) } } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestStateTrans.testTransitions# #if (!any(R.version$engine == "FastR")) { TRUE } else { { x<-rep(1, 100); xi1<-.fastr.identity(x); f<-function(x) { x }; f(x); x[1]<-7; xi2<-.fastr.identity(x); xi1 == xi2 } } [1] TRUE ##com.oracle.truffle.r.test.library.fastr.TestStateTrans.testTransitions# #if (!any(R.version$engine == "FastR")) { TRUE } else { { x<-rep(1, 100); xi1<-.fastr.identity(x); f<-function(x) { y<-x; y }; f(x); x[1]<-7; xi2<-.fastr.identity(x); xi1 == xi2 } } [1] TRUE ##com.oracle.truffle.r.test.library.grid.TestGridPackage.testUnits# #{ library(grid); 3 * (unit(1, 'mm')); } [1] 3mm ##com.oracle.truffle.r.test.library.grid.TestGridPackage.testUnits# #{ library(grid); grid:::unit.list(3 * unit(1, 'mm')); } Error in get(name, envir = asNamespace(pkg), inherits = FALSE) : object 'unit.list' not found ##com.oracle.truffle.r.test.library.grid.TestGridPackage.testUnits# #{ library(grid); unit.c(unit(1,'mm'), 42*unit(1,'mm')); } [1] 1mm 42mm ##com.oracle.truffle.r.test.library.grid.TestGridPackage.testUnits# #{ library(grid); unit.c(unit(1,'mm'), unit(1,'mm')) } [1] 1mm 1mm ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+1), NA); a Error in substituteDirect(quote(x + 1), NA) : invalid list for substitution ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+1), NULL); a Error in substituteDirect(quote(x + 1), NULL) : invalid list for substitution ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+1), c(c(list(x=1)))); a 1 + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+1), c(list(x=1), 'breakme')); a 1 + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+1), c(list(x=1, 1))); a 1 + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+1), list(1)); a x + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+1), list(c(c(list(x=1))))); a x + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+1), list(list(x=1))); a x + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+1), list(x=1)); a 1 + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+1), list(y=1)); a x + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #a<-substituteDirect(quote(x+y), c(list(x=1), list(y=1))); a 1 + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #f<-function() {}; substituteDirect(quote(x+1), frame=f) Error in substituteDirect(quote(x + 1), frame = f) : invalid list for substitution ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(1, 1) Error in substituteDirect(1, 1) : invalid list for substitution ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(1, 1, 1) Error in substituteDirect(1, 1, 1) : invalid list for substitution ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(1, frame=NA) Error in substituteDirect(1, frame = NA) : invalid list for substitution ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(1, frame=NULL) Error in substituteDirect(1, frame = NULL) : invalid list for substitution ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(NA, list(x=1)) [1] NA ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(NULL, list(x=1)) NULL ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(environment(), list(x=1)) ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(object=1, frame=1) Error in substituteDirect(object = 1, frame = 1) : invalid list for substitution ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(object=1, frame=1, cleanFunction=1) Error in substituteDirect(object = 1, frame = 1, cleanFunction = 1) : invalid list for substitution ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(object=1, frame=c(list(1))) [1] 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(object=1, frame=list(c(list(1)))) [1] 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(object=1, frame=list(list(1))) [1] 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), frame=environment()) x + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), frame=setClass('a')) Error in substituteDirect(quote(x + 1), frame = setClass("a")) : invalid list for substitution ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction='a') Error in cleanFunction && is.function(value) : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction=NA) 1 + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction=NULL) Error in cleanFunction && is.function(value) : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction=TRUE) 1 + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction=c('1')) Error in cleanFunction && is.function(value) : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction=c(1)) 1 + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction=c(TRUE, 'breakme')) Error in cleanFunction && is.function(value) : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction=c(TRUE, FALSE)) 1 + 1 ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction=c(c(TRUE, 'breakme'))) Error in cleanFunction && is.function(value) : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction=environment()) Error in cleanFunction && is.function(value) : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.methods.TestSubstituteDirect.basicTests# #substituteDirect(quote(x+1), list(x=1), cleanFunction=list(c(TRUE), 'breakme')) Error in cleanFunction && is.function(value) : invalid 'x' type in 'x && y' ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #f <- function() { res <- parallel:::mclapply(1:10, function(i) i); print(res)}; f() [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 [[4]] [1] 4 [[5]] [1] 5 [[6]] [1] 6 [[7]] [1] 7 [[8]] [1] 8 [[9]] [1] 9 [[10]] [1] 10 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #f <- function() { res <- parallel:::mclapply(1:2, function(i) i); print(res)}; f() [[1]] [1] 1 [[2]] [1] 2 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #f <- function() { res <- parallel:::mclapply(1:3, function(i) i); print(res)}; f() [[1]] [1] 1 [[2]] [1] 2 [[3]] [1] 3 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #f <- function() { res <- parallel:::mclapply(1:3, function(i) i)}; f() ; f() ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #l <- list(list(x=1, y=2)); parallel:::mclapply(l, function(ll) { ll$y }) [[1]] [1] 2 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #l <- list(list(x=1, y=2), list(x=11, y=22)); parallel:::mclapply(l, function(ll) { ll$y }) [[1]] [1] 2 [[2]] [1] 22 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #l <- list(list(x=1, y=2), list(x=11, y=22), list(x=111, y=222), list(x=1111, y=2222), list(x=11111, y=22222), list(x=111111, y=222222)); parallel:::mclapply(l, function(ll) { ll$y }, mc.cores=1) [[1]] [1] 2 [[2]] [1] 22 [[3]] [1] 222 [[4]] [1] 2222 [[5]] [1] 22222 [[6]] [1] 222222 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #l <- list(list(x=1, y=2), list(x=11, y=22), list(x=111, y=222), list(x=1111, y=2222), list(x=11111, y=22222), list(x=111111, y=222222)); parallel:::mclapply(l, function(ll) { ll$y }, mc.cores=2) [[1]] [1] 2 [[2]] [1] 22 [[3]] [1] 222 [[4]] [1] 2222 [[5]] [1] 22222 [[6]] [1] 222222 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #l <- list(list(x=1, y=2), list(x=11, y=22), list(x=111, y=222), list(x=1111, y=2222), list(x=11111, y=22222), list(x=111111, y=222222)); parallel:::mclapply(l, function(ll) { ll$y }, mc.cores=3) [[1]] [1] 2 [[2]] [1] 22 [[3]] [1] 222 [[4]] [1] 2222 [[5]] [1] 22222 [[6]] [1] 222222 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #l <- list(list(x=1, y=2), list(x=11, y=22), list(x=111, y=222), list(x=1111, y=2222), list(x=11111, y=22222), list(x=111111, y=222222)); parallel:::mclapply(l, function(ll) { ll$y }, mc.cores=4) [[1]] [1] 2 [[2]] [1] 22 [[3]] [1] 222 [[4]] [1] 2222 [[5]] [1] 22222 [[6]] [1] 222222 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #l <- list(list(x=1, y=2), list(x=11, y=22), list(x=111, y=222), list(x=1111, y=2222), list(x=11111, y=22222), list(x=111111, y=222222)); parallel:::mclapply(l, function(ll) { ll$y }, mc.cores=5) [[1]] [1] 2 [[2]] [1] 22 [[3]] [1] 222 [[4]] [1] 2222 [[5]] [1] 22222 [[6]] [1] 222222 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapply#Ignored.ImplementationError# #l <- list(list(x=1, y=2), list(x=11, y=22), list(x=111, y=222), list(x=1111, y=2222), list(x=11111, y=22222), list(x=111111, y=222222)); parallel:::mclapply(l, function(ll) { ll$y }, mc.cores=6) [[1]] [1] 2 [[2]] [1] 22 [[3]] [1] 222 [[4]] [1] 2222 [[5]] [1] 22222 [[6]] [1] 222222 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapplyNested#Ignored.ImplementationError# #parallel:::mclapply(1:3, function(i) { Sys.sleep(.1); parallel:::mclapply(1:3, function(i) { Sys.sleep(.1); parallel:::mclapply(1:3, function(i) {i}) }) }) [[1]] [[1]][[1]] [[1]][[1]][[1]] [1] 1 [[1]][[1]][[2]] [1] 2 [[1]][[1]][[3]] [1] 3 [[1]][[2]] [[1]][[2]][[1]] [1] 1 [[1]][[2]][[2]] [1] 2 [[1]][[2]][[3]] [1] 3 [[1]][[3]] [[1]][[3]][[1]] [1] 1 [[1]][[3]][[2]] [1] 2 [[1]][[3]][[3]] [1] 3 [[2]] [[2]][[1]] [[2]][[1]][[1]] [1] 1 [[2]][[1]][[2]] [1] 2 [[2]][[1]][[3]] [1] 3 [[2]][[2]] [[2]][[2]][[1]] [1] 1 [[2]][[2]][[2]] [1] 2 [[2]][[2]][[3]] [1] 3 [[2]][[3]] [[2]][[3]][[1]] [1] 1 [[2]][[3]][[2]] [1] 2 [[2]][[3]][[3]] [1] 3 [[3]] [[3]][[1]] [[3]][[1]][[1]] [1] 1 [[3]][[1]][[2]] [1] 2 [[3]][[1]][[3]] [1] 3 [[3]][[2]] [[3]][[2]][[1]] [1] 1 [[3]][[2]][[2]] [1] 2 [[3]][[2]][[3]] [1] 3 [[3]][[3]] [[3]][[3]][[1]] [1] 1 [[3]][[3]][[2]] [1] 2 [[3]][[3]][[3]] [1] 3 ##com.oracle.truffle.r.test.library.parallel.TestBuiltin_mclapply.testMCLapplyNested#Ignored.ImplementationError# #parallel:::mclapply(1:3, function(i) { Sys.sleep(.2); parallel:::mclapply(1:3, function(ii) {ii}) }) [[1]] [[1]][[1]] [1] 1 [[1]][[2]] [1] 2 [[1]][[3]] [1] 3 [[2]] [[2]][[1]] [1] 1 [[2]][[2]] [1] 2 [[2]][[3]] [1] 3 [[3]] [[3]][[1]] [1] 1 [[3]][[2]] [1] 2 [[3]][[3]] [1] 3 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, -1, 0.5) [1] NaN Warning message: In dbeta(0, -1, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, -4, 15, 0) [1] NaN Warning message: In dbeta(0, -4, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, -Inf, 0.5) [1] NaN Warning message: In dbeta(0, -Inf, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, -Inf, 15, 0) [1] NaN Warning message: In dbeta(0, -Inf, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 0, 0.5) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 0, 15, 0) [1] NaN Warning message: In dbeta(0, 0, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 0.5, -1) [1] NaN Warning message: In dbeta(0, 0.5, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 0.5, -Inf) [1] NaN Warning message: In dbeta(0, 0.5, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 0.5, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 0.5, Inf) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 0.5, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 10, 15, -4) [1] NaN Warning message: In dbeta(0, 10, 15, -4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 10, 15, -Inf) [1] NaN Warning message: In dbeta(0, 10, 15, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 10, 15, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 10, 15, Inf) [1] NaN Warning message: In dbeta(0, 10, 15, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 10, 15, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 10, -4, 0) [1] NaN Warning message: In dbeta(0, 10, -4, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 10, -Inf, 0) [1] NaN Warning message: In dbeta(0, 10, -Inf, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 10, 0, 0) [1] NaN Warning message: In dbeta(0, 10, 0, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 10, Inf, 0) [1] NaN Warning message: In dbeta(0, 10, Inf, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, 10, NaN, 0) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, Inf, 0.5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, Inf, 15, 0) [1] NaN Warning message: In dbeta(0, Inf, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, NaN, 0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbeta(0, NaN, 15, 0) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.5, 0.5, log=F) [1] 0.000000e+00 0.000000e+00 Inf 4.911628e+14 0.000000e+00 [6] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.5, 0.5, log=T) [1] -Inf -Inf Inf 33.8278 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.1, 3, log=F) [1] 3.146552e-01 0.000000e+00 0.000000e+00 Inf 2.521492e+26 [6] 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.1, 3, log=T) [1] -1.156278 -Inf -Inf Inf 60.792063 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.4, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, log=F) [1] 0 0 0 Inf 0 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.4, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, log=T) [1] -Inf -Inf -Inf Inf -Inf -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, Inf, log=F) [1] 0 0 0 Inf 0 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, Inf, log=T) [1] -Inf -Inf -Inf Inf -Inf -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 2, 5, log=F) [1] 9.375e-01 0.000e+00 0.000e+00 0.000e+00 1.260e-29 0.000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 2, 5, log=T) [1] -0.06453852 -Inf -Inf -Inf -66.54385598 [6] -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.6, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), Inf, 0, log=F) [1] 0 0 0 0 0 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.6, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), Inf, 0, log=T) [1] -Inf -Inf -Inf -Inf -Inf -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.6, 0.1, 42e-33), 6, 3, log=F) [1] 2.090189e+00 1.360800e-03 2.195613e-155 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(0.6, 0.1, 42e-33), 6, 3, log=T) [1] 0.7372544 -6.5996825 -356.1142283 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(10, 15, 100), 7, 11, 0.37e-10, log=F) [1] 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(10, 15, 100), 7, 11, 0.37e-10, log=T) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(10, 15, 100), 7, 113e11, 1, log=F) [1] 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(10, 15, 100), 7, 113e11, 1, log=T) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 15, 0, log=F) [1] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [6] 0.000000e+00 7.975867e-267 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 15, 0, log=T) [1] -Inf -Inf -Inf -Inf -Inf -Inf -612.7138 [8] -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 7, 13, 3, log=F) [1] 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [6] 0.000000e+00 4.319955e-178 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 7, 13, 3, log=T) [1] -Inf -Inf -Inf -Inf -Inf -Inf -408.3969 [8] -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbinom(0, -1, 0.3) [1] NaN Warning message: In dbinom(0, -1, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbinom(0, -Inf, 0.3) [1] NaN Warning message: In dbinom(0, -Inf, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbinom(0, 20, -1) [1] NaN Warning message: In dbinom(0, 20, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbinom(0, 20, -Inf) [1] NaN Warning message: In dbinom(0, 20, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbinom(0, 20, Inf) [1] NaN Warning message: In dbinom(0, 20, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbinom(0, 20, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbinom(0, Inf, 0.3) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dbinom(0, NaN, 0.3) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbinom(c(-1.8239023575061796834e-06), 382403676160, 2.2226668680885774867e-19, log=F) [1] 0 Warning message: In dbinom(c(-1.82390235750618e-06), 382403676160, 2.22266686808858e-19, : non-integer x = -0.000002 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbinom(c(-1.8239023575061796834e-06), 382403676160, 2.2226668680885774867e-19, log=T) [1] -Inf Warning message: In dbinom(c(-1.82390235750618e-06), 382403676160, 2.22266686808858e-19, : non-integer x = -0.000002 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbinom(c(1, 10, 100, 500, 900, 1000), 10000, 0.01, log=F) [1] 2.271490e-42 6.821440e-31 4.006181e-02 8.661377e-182 0.000000e+00 [6] 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbinom(c(1, 10, 100, 500, 900, 1000), 10000, 0.01, log=T) [1] -95.888138 -69.460067 -3.217332 -416.911613 -1215.006067 [6] -1449.113695 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbinom(c(1, 2, 10, 20, 21, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 20, 0.3, log=F) [1] 6.839337e-03 2.784587e-02 3.081708e-02 3.486784e-11 0.000000e+00 [6] 0.000000e+00 0.000000e+00 7.979227e-04 7.979227e-04 0.000000e+00 [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbinom(c(1, 2, 10, 20, 21, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 20, 0.3, log=T) [1] -4.985064 -3.581071 -3.479686 -24.079456 -Inf -Inf [7] -Inf -7.133499 -7.133499 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbinom(c(2), 10, -0.1, log=F) [1] NaN Warning message: In dbinom(c(2), 10, -0.1, log = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbinom(c(2), 10, -0.1, log=T) [1] NaN Warning message: In dbinom(c(2), 10, -0.1, log = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbinom(c(2), 10, 5, log=F) [1] NaN Warning message: In dbinom(c(2), 10, 5, log = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dbinom(c(2), 10, 5, log=T) [1] NaN Warning message: In dbinom(c(2), 10, 5, log = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dcauchy(0, -Inf, -1) [1] NaN Warning message: In dcauchy(0, -Inf, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dcauchy(0, 0, -Inf) [1] NaN Warning message: In dcauchy(0, 0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dcauchy(0, 0, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dcauchy(0, 0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dcauchy(0, Inf, -1) [1] NaN Warning message: In dcauchy(0, Inf, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dcauchy(0, NaN, -1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dcauchy(c(-5, 42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -5, 5, log=F) [1] 0.0636619772 0.0007124214 0.0000000000 0.0318309886 0.0318309886 [6] 0.0318309886 0.0000000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dcauchy(c(-5, 42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -5, 5, log=T) [1] -2.754168 -7.246841 -Inf -3.447315 -3.447315 -3.447315 -Inf [8] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dcauchy(c(0, -1, 1, 0.42e-30), -0.01, 0.03, log=F) [1] 9.549296586 0.009734247 0.009352886 9.549296586 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dcauchy(c(0, -1, 1, 0.42e-30), -0.01, 0.03, log=T) [1] 2.256467 -4.632105 -4.672070 2.256467 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dcauchy(c(0, -1, 42), 0, -1, log=F) [1] NaN NaN NaN Warning message: In dcauchy(c(0, -1, 42), 0, -1, log = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dcauchy(c(0, -1, 42), 0, -1, log=T) [1] NaN NaN NaN Warning message: In dcauchy(c(0, -1, 42), 0, -1, log = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dchisq(0, -3, 1) [1] NaN Warning message: In dchisq(0, -3, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dchisq(0, -Inf, 1) [1] NaN Warning message: In dchisq(0, -Inf, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dchisq(0, 0, 1) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dchisq(0, 1, -3) [1] NaN Warning message: In dchisq(0, 1, -3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dchisq(0, 1, -Inf) [1] NaN Warning message: In dchisq(0, 1, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dchisq(0, 1, 0) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dchisq(0, 1, Inf) [1] NaN Warning message: In dchisq(0, 1, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dchisq(0, 1, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dchisq(0, Inf, 1) [1] NaN Warning message: In dchisq(0, Inf, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dchisq(0, NaN, 1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dchisq(c(0.42e-10, 100, 13e10, 11e111), 0.13e-8, 1, log=F) [1] 9.538417e+00 1.370516e-20 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dchisq(c(0.42e-10, 100, 13e10, 11e111), 0.13e-8, 1, log=T) [1] 2.255327e+00 -4.573651e+01 -3.250000e+10 -2.750000e+111 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dchisq(c(0.42e-10, 100, 13e10, 11e111), 1, 0.13e-8, log=F) [1] 6.155813e+04 7.694599e-24 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dchisq(c(0.42e-10, 100, 13e10, 11e111), 1, 0.13e-8, log=T) [1] 1.102774e+01 -5.322152e+01 -6.500000e+10 -5.500000e+111 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dchisq(c(0.42e-10, 100, 13e10, 11e111), 420, 4, log=F) [1] 0.000000e+00 5.065225e-64 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dchisq(c(0.42e-10, 100, 13e10, 11e111), 420, 4, log=T) [1] -6.052932e+03 -1.457430e+02 -6.439252e+10 -5.448598e+111 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dchisq(c(0.5, 2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 1, log=F) [1] 3.359531e-01 1.371033e-01 0.000000e+00 0.000000e+00 Inf [6] 3.733689e+14 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dchisq(c(0.5, 2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 1, log=T) [1] -1.090784 -1.987021 -Inf -Inf Inf 33.553588 -Inf [8] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dexp(0, -1) [1] NaN Warning message: In dexp(0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dexp(0, -Inf) [1] NaN Warning message: In dexp(0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dexp(0, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dexp(0, Inf) [1] NaN Warning message: In dexp(0, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dexp(0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dexp(c(10, -10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 13e-20, log=F) [1] 1.3e-19 0.0e+00 0.0e+00 0.0e+00 1.3e-19 1.3e-19 0.0e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dexp(c(10, -10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 13e-20, log=T) [1] -43.48675 -Inf -Inf -Inf -43.48675 -43.48675 -Inf [8] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dexp(c(33e123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42e123, log=F) [1] 0.0e+00 0.0e+00 0.0e+00 4.2e+124 0.0e+00 0.0e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dexp(c(33e123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42e123, log=T) [1] -1.386000e+249 -Inf -Inf 2.869556e+02 -1.764000e+94 [6] -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dexp(c(42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42, log=F) [1] 0 0 0 42 42 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dexp(c(42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42, log=T) [1] -1760.26233 -Inf -Inf 3.73767 3.73767 -Inf [7] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, -1, 5, 5) [1] NaN Warning message: In df(0, -1, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, -Inf, 5, 5) [1] NaN Warning message: In df(0, -Inf, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 0, 5, 5) [1] NaN Warning message: In df(0, 0, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 5, 5, -1) [1] NaN Warning message: In df(0, 5, 5, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 5, 5, -Inf) [1] NaN Warning message: In df(0, 5, 5, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 5, 5, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 5, 5, Inf) [1] NaN Warning message: In df(0, 5, 5, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 5, 5, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 5, -1, 5) [1] NaN Warning message: In df(0, 5, -1, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 5, -Inf, 5) [1] NaN Warning message: In df(0, 5, -Inf, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 5, 0, 5) [1] NaN Warning message: In df(0, 5, 0, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 5, Inf, 5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, 5, NaN, 5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, Inf, 5, 5) [1] NaN Warning message: In df(0, Inf, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #df(0, NaN, 5, 5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #df(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.12e-10, 6, 31e10, log=F) [1] 0 0 0 0 0 0 Inf 0 NaN NaN Warning message: In df(c(1, 10, 44, 123, -Inf, -4.2e-31, 0, 4.2e-31, Inf, NaN), 1.2e-11, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #df(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.12e-10, 6, 31e10, log=T) [1] -1.55e+11 -1.55e+11 -1.55e+11 -1.55e+11 -Inf -Inf Inf [8] -1.55e+11 NaN NaN Warning message: In df(c(1, 10, 44, 123, -Inf, -4.2e-31, 0, 4.2e-31, Inf, NaN), 1.2e-11, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #df(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 0.12e-10, 5, log=F) [1] 6.000077e-12 5.999245e-13 1.364474e-13 4.871126e-14 0.000000e+00 [6] 0.000000e+00 0.000000e+00 1.502315e-29 NaN NaN Warning message: In df(c(1, 10, 44, 123, -Inf, -4.2e-31, 0, 4.2e-31, Inf, NaN), 5, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #df(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 0.12e-10, 5, log=T) [1] -25.83925 -28.14197 -29.62284 -30.65287 -Inf -Inf -Inf [8] -66.36796 NaN NaN Warning message: In df(c(1, 10, 44, 123, -Inf, -4.2e-31, 0, 4.2e-31, Inf, NaN), 5, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #df(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 5, 5, log=F) [1] 3.161392e-01 9.493410e-03 9.824795e-05 3.042534e-06 0.000000e+00 [6] 0.000000e+00 0.000000e+00 3.034426e-46 NaN NaN Warning message: In df(c(1, 10, 44, 123, -Inf, -4.2e-31, 0, 4.2e-31, Inf, NaN), 5, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #df(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 5, 5, log=T) [1] -1.151573 -4.657157 -9.228016 -12.702820 -Inf -Inf [7] -Inf -104.808892 NaN NaN Warning message: In df(c(1, 10, 44, 123, -Inf, -4.2e-31, 0, 4.2e-31, Inf, NaN), 5, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #df(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 6, 0.12e-10, log=F) [1] 4.450508e-01 1.824043e-03 7.828020e-06 1.409040e-07 0.000000e+00 [6] 0.000000e+00 0.000000e+00 3.397124e-45 NaN NaN Warning message: In df(c(1, 10, 44, 123, -Inf, -4.2e-31, 0, 4.2e-31, Inf, NaN), 5, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #df(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 6, 0.12e-10, log=T) [1] -0.8095669 -6.3066996 -11.7578009 -15.7751873 -Inf [6] -Inf -Inf -102.3934000 NaN NaN Warning message: In df(c(1, 10, 44, 123, -Inf, -4.2e-31, 0, 4.2e-31, Inf, NaN), 5, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dgamma(0, -1, scale=2) [1] NaN Warning message: In dgamma(0, -1, scale = 2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dgamma(0, -Inf, scale=2) [1] NaN Warning message: In dgamma(0, -Inf, scale = 2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dgamma(0, 0, scale=2) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dgamma(0, 1, -1) [1] NaN Warning message: In dgamma(0, 1, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dgamma(0, 1, -Inf) [1] NaN Warning message: In dgamma(0, 1, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dgamma(0, 1, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dgamma(0, 1, Inf) [1] NaN Warning message: In dgamma(0, 1, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dgamma(0, 1, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dgamma(0, Inf, scale=2) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dgamma(0, NaN, scale=2) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dgamma(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, scale=2, log=F) [1] 0.0 0.0 0.5 0.5 0.0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dgamma(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, scale=2, log=T) [1] -Inf -Inf -0.6931472 -0.6931472 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dgamma(c(900, 5000, 0), 11e11, scale=23e-11, log=F) [1] 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dgamma(c(900, 5000, 0), 11e11, scale=23e-11, log=T) [1] -1.417138e+12 -1.735695e+13 -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, -10, 11, 4) [1] NaN Warning message: In dhyper(0, -10, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, -Inf, 11, 4) [1] NaN Warning message: In dhyper(0, -Inf, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 0.3, 11, 4) [1] NaN Warning message: In dhyper(0, 0.3, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 7, 11, -10) [1] NaN Warning message: In dhyper(0, 7, 11, -10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 7, 11, -Inf) [1] NaN Warning message: In dhyper(0, 7, 11, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 7, 11, 0.3) [1] NaN Warning message: In dhyper(0, 7, 11, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 7, 11, Inf) [1] NaN Warning message: In dhyper(0, 7, 11, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 7, 11, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 7, -10, 4) [1] NaN Warning message: In dhyper(0, 7, -10, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 7, -Inf, 4) [1] NaN Warning message: In dhyper(0, 7, -Inf, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 7, 0.3, 4) [1] NaN Warning message: In dhyper(0, 7, 0.3, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 7, Inf, 4) [1] NaN Warning message: In dhyper(0, 7, Inf, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, 7, NaN, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, Inf, 11, 4) [1] NaN Warning message: In dhyper(0, Inf, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dhyper(0, NaN, 11, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(0.1, -Inf, Inf, 0.3e89), 5, 5, 5, log=F) [1] 0 0 0 0 Warning message: In dhyper(c(0.1, -Inf, Inf, 3e+88), 5, 5, 5, log = F) : non-integer x = 0.100000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(0.1, -Inf, Inf, 0.3e89), 5, 5, 5, log=T) [1] -Inf -Inf -Inf -Inf Warning message: In dhyper(c(0.1, -Inf, Inf, 3e+88), 5, 5, 5, log = T) : non-integer x = 0.100000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(1, 2, 3, 4, 20, 12e12), 7, 11, 4, log=F) [1] 0.37745098 0.37745098 0.12581699 0.01143791 0.00000000 0.00000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(1, 2, 3, 4, 20, 12e12), 7, 11, 4, log=T) [1] -0.9743146 -0.9743146 -2.0729269 -4.4708221 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(1, 2, 3, 4, 20, 12e12), 7e12, 11, 4, log=F) [1] 1.154519e-35 1.346939e-23 6.285714e-12 1.000000e+00 0.000000e+00 [6] 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(1, 2, 3, 4, 20, 12e12), 7e12, 11, 4, log=T) [1] -8.044679e+01 -5.266162e+01 -2.579274e+01 -6.285639e-12 -Inf [6] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(1, 2, 3, 4, 5, 6, 7, 8, 11, 20, 12e12), 7, 11, 12, log=F) [1] 0.0003770739 0.0124434389 0.1036953243 0.3110859729 0.3733031674 [6] 0.1742081448 0.0248868778 0.0000000000 0.0000000000 0.0000000000 [11] 0.0000000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(1, 2, 3, 4, 5, 6, 7, 8, 11, 20, 12e12), 7, 11, 12, log=T) [1] -7.8830694 -4.3865618 -2.2662983 -1.1676860 -0.9853644 -1.7475045 [7] -3.6934146 -Inf -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(1, 2, 3, 7, 20, 12e12), 11, 7e12, 7, log=F) [1] 1.100000e-11 4.714286e-23 1.010204e-34 2.019567e-84 0.000000e+00 [6] 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(1, 2, 3, 7, 20, 12e12), 11, 7e12, 7, log=T) [1] -25.23313 -51.40886 -78.27774 -192.71426 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(2), 3, 4, 10, log=F) [1] NaN Warning message: In dhyper(c(2), 3, 4, 10, log = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dhyper(c(2), 3, 4, 10, log=T) [1] NaN Warning message: In dhyper(c(2), 3, 4, 10, log = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnbinom(0, -2, 0.33) [1] NaN Warning message: In dnbinom(0, -2, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnbinom(0, -Inf, 0.33) [1] NaN Warning message: In dnbinom(0, -Inf, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnbinom(0, 10, -2) [1] NaN Warning message: In dnbinom(0, 10, -2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnbinom(0, 10, -Inf) [1] NaN Warning message: In dnbinom(0, 10, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnbinom(0, 10, Inf) [1] NaN Warning message: In dnbinom(0, 10, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnbinom(0, 10, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnbinom(0, Inf, 0.33) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnbinom(0, NaN, 0.33) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(0, 10, 100, 1000, 1100, 1200), 1000, 0.5, log=F) [1] 9.332636e-302 2.626776e-281 9.523728e-188 8.919506e-03 7.667020e-04 [6] 8.639136e-07 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(0, 10, 100, 1000, 1100, 1200), 1000, 0.5, log=T) [1] -693.147181 -646.060654 -430.632211 -4.719515 -7.173412 -13.961793 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(2), 10, -0.1, log=F) [1] NaN Warning message: In dnbinom(c(2), 10, -0.1, log = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(2), 10, -0.1, log=T) [1] NaN Warning message: In dnbinom(c(2), 10, -0.1, log = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(2), 10, 5, log=F) [1] NaN Warning message: In dnbinom(c(2), 10, 5, log = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(2), 10, 5, log=T) [1] NaN Warning message: In dnbinom(c(2), 10, 5, log = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(3, 5, 6, 10, 11, 20, 100), 10, mu=60, log=F) [1] 4.904581e-07 3.279063e-06 7.026563e-06 7.000358e-05 1.090965e-04 [6] 1.624557e-03 3.048589e-03 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(3, 5, 6, 10, 11, 20, 100), 10, mu=60, log=T) [1] -14.527926 -12.627953 -11.865813 -9.566964 -9.123278 -6.422520 -5.793076 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(5, 10, 11, 13, 20), 10.3, 0.4, log=F) [1] 0.01405405 0.05506928 0.06097671 0.06683845 0.04084096 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(5, 10, 11, 13, 20), 10.3, 0.4, log=T) [1] -4.264845 -2.899163 -2.797263 -2.705477 -3.198070 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(5, 10, 11, 13, 20, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 0.33, log=F) [1] 4.139782e-03 2.579028e-02 3.141724e-02 4.176717e-02 5.096671e-02 [6] 0.000000e+00 0.000000e+00 1.531579e-05 1.531579e-05 0.000000e+00 [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(5, 10, 11, 13, 20, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 0.33, log=T) [1] -5.487112 -3.657758 -3.460398 -3.175645 -2.976583 -Inf [7] -Inf -11.086626 -11.086626 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(5, 6, 10, 11, 20, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1000, mu=10, log=F) [1] 3.820978e-02 6.336771e-02 1.244890e-01 1.131719e-01 1.941149e-03 [6] 2.281871e-61 0.000000e+00 0.000000e+00 4.771185e-05 4.771185e-05 [11] 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnbinom(c(5, 6, 10, 11, 20, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1000, mu=10, log=T) [1] -3.264664 -2.758801 -2.083538 -2.178848 -6.244475 -139.632695 [7] -Inf -Inf -9.950331 -9.950331 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnorm(0, -Inf, -1) [1] NaN Warning message: In dnorm(0, -Inf, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnorm(0, 0, -Inf) [1] NaN Warning message: In dnorm(0, 0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnorm(0, 0, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnorm(0, 0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnorm(0, Inf, -1) [1] NaN Warning message: In dnorm(0, Inf, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dnorm(0, NaN, -1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnorm(c(0), 0, -1, log=F) [1] NaN Warning message: In dnorm(c(0), 0, -1, log = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnorm(c(0), 0, -1, log=T) [1] NaN Warning message: In dnorm(c(0), 0, -1, log = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnorm(c(1, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, log=F) [1] 0 0 0 Inf 0 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnorm(c(1, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, log=T) [1] -Inf -Inf -Inf Inf -Inf -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnorm(c(4, -100, 0), 4, 4, log=F) [1] 9.973557e-02 1.611815e-148 6.049268e-02 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dnorm(c(4, -100, 0), 4, 4, log=T) [1] -2.305233 -340.305233 -2.805233 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dpois(0, -1) [1] NaN Warning message: In dpois(0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dpois(0, -Inf) [1] NaN Warning message: In dpois(0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dpois(0, 0) [1] 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dpois(0, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dpois(0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dpois(c(0.1e-10, 0.1, 1, 10), 0.1e-6, log=F) [1] 9.999999e-01 0.000000e+00 9.999999e-08 2.755732e-77 Warning message: In dpois(c(1e-11, 0.1, 1, 10), 1e-07, log = F) : non-integer x = 0.100000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dpois(c(0.1e-10, 0.1, 1, 10), 0.1e-6, log=T) [1] -0.0000001 -Inf -16.1180958 -176.2853692 Warning message: In dpois(c(1e-11, 0.1, 1, 10), 1e-07, log = T) : non-integer x = 0.100000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dpois(c(1e99, 1e99*9.999, 1e100-1, 1e100, 1e100+100, 1e101), 1e100, log=F) [1] 0.000000e+00 0.000000e+00 3.989423e-51 3.989423e-51 3.989423e-51 [6] 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dpois(c(1e99, 1e99*9.999, 1e100-1, 1e100, 1e100+100, 1e101), 1e100, log=T) [1] -6.697415e+99 -5.000167e+91 -1.160482e+02 -1.160482e+02 -1.160482e+02 [6] -1.402585e+101 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dpois(c(5, 10, 15, 20, 30, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, log=F) [1] 3.783327e-02 1.251100e-01 3.471807e-02 1.866081e-03 1.711572e-07 [6] 0.000000e+00 0.000000e+00 4.539993e-05 4.539993e-05 0.000000e+00 [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dpois(c(5, 10, 15, 20, 30, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, log=T) [1] -3.274566 -2.078562 -3.360495 -6.283915 -15.580684 -Inf [7] -Inf -10.000000 -10.000000 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dsignrank(0, -3) [1] NaN Warning message: In dsignrank(0, -3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dsignrank(0, -Inf) [1] NaN Warning message: In dsignrank(0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dsignrank(0, 0) [1] NaN Warning message: In dsignrank(0, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dsignrank(0, Inf) Error in dsignrank(0, Inf) : 'Calloc' could not allocate memory (18446744073172680704 of 8 bytes) ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dsignrank(0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dsignrank(c(0.3, 0.6, 2, 3, 6, 15, 20), 5.5, log=F) [1] 0.000000 0.000000 0.015625 0.031250 0.062500 0.062500 0.015625 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dsignrank(c(0.3, 0.6, 2, 3, 6, 15, 20), 5.5, log=T) [1] -Inf -Inf -4.158883 -3.465736 -2.772589 -2.772589 -4.158883 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dsignrank(c(5, 15, 20, 27, 35, 50, 54, 55, 56, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, log=F) [1] 0.0029296875 0.0195312500 0.0302734375 0.0390625000 0.0302734375 [6] 0.0029296875 0.0009765625 0.0009765625 0.0000000000 0.0000000000 [11] 0.0000000000 0.0009765625 0.0009765625 0.0009765625 0.0000000000 [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dsignrank(c(5, 15, 20, 27, 35, 50, 54, 55, 56, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, log=T) [1] -5.832860 -3.935740 -3.497485 -3.242592 -3.497485 -5.832860 -6.931472 [8] -6.931472 -Inf -Inf -Inf -6.931472 -6.931472 -6.931472 [15] -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dt(0, -Inf, ncp=0.5) [1] NaN Warning message: In dt(0, -Inf, ncp = 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dt(0, 3e100, -Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dt(0, 3e100, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dt(0, NaN, ncp=0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dt(c(-10, -5, -4, -3, -2, -1, 0, 1.1, 2, 3, 4, 10, 100), Inf, ncp=-1, log=F) [1] 1.027977e-18 1.338302e-04 4.431848e-03 5.399097e-02 2.419707e-01 [6] 3.989423e-01 2.419707e-01 4.398360e-02 4.431848e-03 1.338302e-04 [11] 1.486720e-06 2.118819e-27 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dt(c(-10, -5, -4, -3, -2, -1, 0, 1.1, 2, 3, 4, 10, 100), Inf, ncp=-1, log=T) [1] -41.4189385 -8.9189385 -5.4189385 -2.9189385 -1.4189385 [6] -0.9189385 -1.4189385 -3.1239385 -5.4189385 -8.9189385 [11] -13.4189385 -61.4189385 -5101.4189385 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dt(c(-30, -20, -4, 0.5, 1.3, 2, 3, 4, 10, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 3e100, ncp=0.5, log=F) [1] 3.978223e-203 2.211984e-92 1.598374e-05 3.989423e-01 2.896916e-01 [6] 1.295176e-01 1.752830e-02 8.726827e-04 1.007794e-20 0.000000e+00 [11] 0.000000e+00 3.520653e-01 3.520653e-01 3.520653e-01 0.000000e+00 [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dt(c(-30, -20, -4, 0.5, 1.3, 2, 3, 4, 10, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 3e100, ncp=0.5, log=T) [1] -466.0439385 -211.0439385 -11.0439385 -0.9189385 -1.2389385 [6] -2.0439385 -4.0439385 -7.0439385 -46.0439385 -4951.0439385 [11] -Inf -1.0439385 -1.0439385 -1.0439385 -Inf [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dt(c(1), -10, ncp=2, log=F) [1] NaN Warning message: In dt(c(1), -10, ncp = 2, log = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dt(c(1), -10, ncp=2, log=T) [1] NaN Warning message: In dt(c(1), -10, ncp = 2, log = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dunif(0, -3, -Inf) [1] NaN Warning message: In dunif(0, -3, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dunif(0, -3, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dunif(0, -3, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dunif(0, -Inf, 3.3) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dunif(0, Inf, 3.3) [1] NaN Warning message: In dunif(0, Inf, 3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dunif(0, NaN, 3.3) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dunif(c(-3, 2, 3.3, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -3, 3.3, log=F) [1] 0.1587302 0.1587302 0.1587302 0.0000000 0.1587302 0.1587302 0.1587302 [8] 0.0000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dunif(c(-3, 2, 3.3, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -3, 3.3, log=T) [1] -1.84055 -1.84055 -1.84055 -Inf -1.84055 -1.84055 -1.84055 -Inf [9] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dweibull(0, -3.3, 0.5) [1] NaN Warning message: In dweibull(0, -3.3, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dweibull(0, -Inf, 0.5) [1] NaN Warning message: In dweibull(0, -Inf, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dweibull(0, 0, 0.5) [1] NaN Warning message: In dweibull(0, 0, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dweibull(0, 1, -3.3) [1] NaN Warning message: In dweibull(0, 1, -3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dweibull(0, 1, -Inf) [1] NaN Warning message: In dweibull(0, 1, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dweibull(0, 1, 0) [1] NaN Warning message: In dweibull(0, 1, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dweibull(0, 1, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dweibull(0, 1, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dweibull(0, Inf, 0.5) [1] NaN Warning message: In dweibull(0, Inf, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dweibull(0, NaN, 0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dweibull(c(0.9, 0.99999999999999999, 1-1e-30, 1), 1e100, 1, log=F) [1] 0.000000e+00 3.678794e+99 3.678794e+99 3.678794e+99 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dweibull(c(0.9, 0.99999999999999999, 1-1e-30, 1), 1e100, 1, log=T) [1] -Inf 229.2585 229.2585 229.2585 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10), 0.5, 10, log=F) [1] 0.11524817 0.07148791 0.04900381 0.04200182 0.03486522 0.02975030 0.02931637 [8] 0.01839397 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10), 0.5, 10, log=T) [1] -2.160667 -2.638227 -3.015857 -3.170042 -3.356265 -3.514916 -3.529609 [8] -3.995732 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 0.5, log=F) [1] 2.706706e-01 3.663128e-02 2.720736e-03 6.709253e-04 9.079986e-05 [6] 1.228842e-05 1.006091e-05 4.122307e-09 0.000000e+00 0.000000e+00 [11] 2.000000e+00 2.000000e+00 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 0.5, log=T) [1] -1.3068528 -3.3068528 -5.9068528 -7.3068528 -9.3068528 -11.3068528 [7] -11.5068528 -19.3068528 -Inf -Inf 0.6931472 0.6931472 [13] -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dwilcox(0, -Inf, 10) [1] NaN Warning message: In dwilcox(0, -Inf, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dwilcox(0, 10, -Inf) [1] NaN Warning message: In dwilcox(0, 10, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dwilcox(0, 10, Inf) [1] NaN Warning message: In dwilcox(0, 10, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dwilcox(0, 10, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dwilcox(0, Inf, 10) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #dwilcox(0, NaN, 10) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dwilcox(c(1, 3, 5, 100, 1000), 4, 7, log=F) [1] 0.003030303 0.009090909 0.018181818 0.000000000 0.000000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dwilcox(c(1, 3, 5, 100, 1000), 4, 7, log=T) [1] -5.799093 -4.700480 -4.007333 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dwilcox(c(1, 3, 5, 100, 1000, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 10, log=F) [1] 5.412544e-06 1.623763e-05 3.788781e-05 5.412544e-06 0.000000e+00 [6] 0.000000e+00 5.412544e-06 5.412544e-06 5.412544e-06 0.000000e+00 [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDensityFunctions#Output.MayIgnoreWarningContext# #dwilcox(c(1, 3, 5, 100, 1000, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 10, log=T) [1] -12.12679 -11.02818 -10.18088 -12.12679 -Inf -Inf -12.12679 [8] -12.12679 -12.12679 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, -1, 0.5) [1] NaN Warning message: In pbeta(0, -1, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, -4, 15, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, -Inf, 0.5) [1] NaN Warning message: In pbeta(0, -Inf, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, -Inf, 15, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 0, 0.5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 0, 15, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 0.5, -1) [1] NaN Warning message: In pbeta(0, 0.5, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 0.5, -Inf) [1] NaN Warning message: In pbeta(0, 0.5, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 0.5, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 0.5, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 0.5, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 10, 15, -4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 10, 15, -Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 10, 15, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 10, 15, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 10, 15, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 10, -4, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 10, -Inf, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 10, 0, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 10, Inf, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, 10, NaN, 0) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, Inf, 0.5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, Inf, 15, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, NaN, 0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbeta(0, NaN, 15, 0) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.5, 0.5, lower.tail=F, log.p=F) [1] 1 1 1 1 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.5, 0.5, lower.tail=F, log.p=T) [1] 0.000000e+00 0.000000e+00 0.000000e+00 -4.125768e-16 -Inf [6] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.5, 0.5, lower.tail=T, log.p=F) [1] 0.000000e+00 0.000000e+00 0.000000e+00 4.125768e-16 1.000000e+00 [6] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.5, 0.5, lower.tail=T, log.p=T) [1] -Inf -Inf -Inf -35.42411 0.00000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.1, 3, lower.tail=F, log.p=F) [1] 0.05058572 1.00000000 1.00000000 1.00000000 0.99894097 0.00000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.1, 3, lower.tail=F, log.p=T) [1] -2.984085987 0.000000000 0.000000000 0.000000000 -0.001059588 [6] -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.1, 3, lower.tail=T, log.p=F) [1] 0.949414282 0.000000000 0.000000000 0.000000000 0.001059027 1.000000000 [7] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.1, 3, lower.tail=T, log.p=T) [1] -0.05191003 -Inf -Inf -Inf -6.85040499 0.00000000 [7] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.4, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, lower.tail=F, log.p=F) [1] 0.5 1.0 1.0 1.0 0.5 0.0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.4, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, lower.tail=F, log.p=T) [1] -0.6931472 0.0000000 0.0000000 0.0000000 -0.6931472 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.4, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, lower.tail=T, log.p=F) [1] 0.5 0.0 0.0 0.0 0.5 1.0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.4, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, lower.tail=T, log.p=T) [1] -0.6931472 -Inf -Inf -Inf -0.6931472 0.0000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, Inf, lower.tail=F, log.p=F) [1] 0 1 1 1 0 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, Inf, lower.tail=F, log.p=T) [1] -Inf 0 0 0 -Inf -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, Inf, lower.tail=T, log.p=F) [1] 1 0 0 0 1 1 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, Inf, lower.tail=T, log.p=T) [1] 0 -Inf -Inf -Inf 0 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 2, 5, lower.tail=F, log.p=F) [1] 0.109375 1.000000 1.000000 1.000000 1.000000 0.000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 2, 5, lower.tail=F, log.p=T) [1] -2.212973e+00 0.000000e+00 0.000000e+00 0.000000e+00 -2.646000e-60 [6] -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 2, 5, lower.tail=T, log.p=F) [1] 8.90625e-01 0.00000e+00 0.00000e+00 0.00000e+00 2.64600e-60 1.00000e+00 [7] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.5, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 2, 5, lower.tail=T, log.p=T) [1] -0.1158318 -Inf -Inf -Inf -137.1820565 [6] 0.0000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.6, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), Inf, 0, lower.tail=F, log.p=F) [1] 1 1 1 1 1 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.6, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), Inf, 0, lower.tail=F, log.p=T) [1] 0 0 0 0 0 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.6, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), Inf, 0, lower.tail=T, log.p=F) [1] 0 0 0 0 0 1 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.6, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), Inf, 0, lower.tail=T, log.p=T) [1] -Inf -Inf -Inf -Inf -Inf 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.6, 0.1, 42e-33), 6, 3, lower.tail=F, log.p=F) [1] 0.6846054 0.9999766 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.6, 0.1, 42e-33), 6, 3, lower.tail=F, log.p=T) [1] -3.789126e-01 -2.341027e-05 -1.536929e-187 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.6, 0.1, 42e-33), 6, 3, lower.tail=T, log.p=F) [1] 3.153946e-01 2.341000e-05 1.536929e-187 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(0.6, 0.1, 42e-33), 6, 3, lower.tail=T, log.p=T) [1] -1.153931 -10.662347 -430.153626 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100), 7, 11, 0.37e-10, lower.tail=F, log.p=F) [1] 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100), 7, 11, 0.37e-10, lower.tail=F, log.p=T) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100), 7, 11, 0.37e-10, lower.tail=T, log.p=F) [1] 1 1 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100), 7, 11, 0.37e-10, lower.tail=T, log.p=T) [1] 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100), 7, 113e11, 1, lower.tail=F, log.p=F) [1] 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100), 7, 113e11, 1, lower.tail=F, log.p=T) [1] -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100), 7, 113e11, 1, lower.tail=T, log.p=F) [1] 1 1 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100), 7, 113e11, 1, lower.tail=T, log.p=T) [1] 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 15, 0, lower.tail=F, log.p=F) [1] 0 0 0 1 1 1 1 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 15, 0, lower.tail=F, log.p=T) [1] -Inf -Inf -Inf 0.000000e+00 0.000000e+00 [6] 0.000000e+00 -3.349864e-298 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 15, 0, lower.tail=T, log.p=F) [1] 1.000000e+00 1.000000e+00 1.000000e+00 0.000000e+00 0.000000e+00 [6] 0.000000e+00 3.349864e-298 1.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 15, 0, lower.tail=T, log.p=T) [1] 0.0000 0.0000 0.0000 -Inf -Inf -Inf -684.9614 [8] 0.0000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 7, 13, 3, lower.tail=F, log.p=F) [1] 0 0 0 1 1 1 1 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 7, 13, 3, lower.tail=F, log.p=T) [1] -Inf -Inf -Inf 0.000000e+00 0.000000e+00 [6] 0.000000e+00 -2.591973e-209 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 7, 13, 3, lower.tail=T, log.p=F) [1] 1.000000e+00 1.000000e+00 1.000000e+00 0.000000e+00 0.000000e+00 [6] 0.000000e+00 2.591973e-209 1.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbeta(c(10, 15, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 7, 13, 3, lower.tail=T, log.p=T) [1] 0.0000 0.0000 0.0000 -Inf -Inf -Inf -480.2879 [8] 0.0000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbinom(0, -1, 0.3) [1] NaN Warning message: In pbinom(0, -1, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbinom(0, -Inf, 0.3) [1] NaN Warning message: In pbinom(0, -Inf, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbinom(0, 20, -1) [1] NaN Warning message: In pbinom(0, 20, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbinom(0, 20, -Inf) [1] NaN Warning message: In pbinom(0, 20, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbinom(0, 20, Inf) [1] NaN Warning message: In pbinom(0, 20, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbinom(0, 20, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbinom(0, Inf, 0.3) [1] NaN Warning message: In pbinom(0, Inf, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pbinom(0, NaN, 0.3) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(-1.8239023575061796834e-06), 382403676160, 2.2226668680885774867e-19, lower.tail=F, log.p=F) [1] 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(-1.8239023575061796834e-06), 382403676160, 2.2226668680885774867e-19, lower.tail=F, log.p=T) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(-1.8239023575061796834e-06), 382403676160, 2.2226668680885774867e-19, lower.tail=T, log.p=F) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(-1.8239023575061796834e-06), 382403676160, 2.2226668680885774867e-19, lower.tail=T, log.p=T) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(1, 10, 100, 500, 900, 1000), 10000, 0.01, lower.tail=F, log.p=F) [1] 1.000000e+00 1.000000e+00 4.734375e-01 2.050740e-182 0.000000e+00 [6] 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(1, 10, 100, 500, 900, 1000), 10000, 0.01, lower.tail=F, log.p=T) [1] -2.293977e-42 -7.562773e-31 -7.477354e-01 -4.183523e+02 -1.217181e+03 [6] -1.451418e+03 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(1, 10, 100, 500, 900, 1000), 10000, 0.01, lower.tail=T, log.p=F) [1] 2.293977e-42 7.562773e-31 5.265625e-01 1.000000e+00 1.000000e+00 [6] 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(1, 10, 100, 500, 900, 1000), 10000, 0.01, lower.tail=T, log.p=T) [1] -9.587829e+01 -6.935690e+01 -6.413852e-01 -2.050740e-182 0.000000e+00 [6] 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(1, 2, 10, 20, 21, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 20, 0.3, lower.tail=F, log.p=F) [1] 0.99236274 0.96451687 0.01714482 0.00000000 0.00000000 1.00000000 [7] 1.00000000 0.99920208 0.99920208 0.00000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(1, 2, 10, 20, 21, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 20, 0.3, lower.tail=F, log.p=T) [1] -0.0076665730 -0.0361279582 -4.0660594000 -Inf -Inf [6] 0.0000000000 0.0000000000 -0.0007982412 -0.0007982412 -Inf [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(1, 2, 10, 20, 21, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 20, 0.3, lower.tail=T, log.p=F) [1] 0.0076372598 0.0354831323 0.9828551836 1.0000000000 1.0000000000 [6] 0.0000000000 0.0000000000 0.0007979227 0.0007979227 1.0000000000 [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(1, 2, 10, 20, 21, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 20, 0.3, lower.tail=T, log.p=T) [1] -4.87471641 -3.33869784 -0.01729349 0.00000000 0.00000000 -Inf [7] -Inf -7.13349888 -7.13349888 0.00000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(2), 10, -0.1, lower.tail=F, log.p=F) [1] NaN Warning message: In pbinom(c(2), 10, -0.1, lower.tail = F, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(2), 10, -0.1, lower.tail=F, log.p=T) [1] NaN Warning message: In pbinom(c(2), 10, -0.1, lower.tail = F, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(2), 10, -0.1, lower.tail=T, log.p=F) [1] NaN Warning message: In pbinom(c(2), 10, -0.1, lower.tail = T, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(2), 10, -0.1, lower.tail=T, log.p=T) [1] NaN Warning message: In pbinom(c(2), 10, -0.1, lower.tail = T, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(2), 10, 5, lower.tail=F, log.p=F) [1] NaN Warning message: In pbinom(c(2), 10, 5, lower.tail = F, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(2), 10, 5, lower.tail=F, log.p=T) [1] NaN Warning message: In pbinom(c(2), 10, 5, lower.tail = F, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(2), 10, 5, lower.tail=T, log.p=F) [1] NaN Warning message: In pbinom(c(2), 10, 5, lower.tail = T, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pbinom(c(2), 10, 5, lower.tail=T, log.p=T) [1] NaN Warning message: In pbinom(c(2), 10, 5, lower.tail = T, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pcauchy(0, -Inf, -1) [1] NaN Warning message: In pcauchy(0, -Inf, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pcauchy(0, 0, -Inf) [1] NaN Warning message: In pcauchy(0, 0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pcauchy(0, 0, Inf) [1] 0.5 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pcauchy(0, 0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pcauchy(0, Inf, -1) [1] NaN Warning message: In pcauchy(0, Inf, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pcauchy(0, NaN, -1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(-5, 42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -5, 5, lower.tail=F, log.p=F) [1] 0.50000000 0.03373587 1.00000000 0.25000000 0.25000000 0.25000000 0.00000000 [8] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(-5, 42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -5, 5, lower.tail=F, log.p=T) [1] -0.6931472 -3.3891936 0.0000000 -1.3862944 -1.3862944 -1.3862944 -Inf [8] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(-5, 42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -5, 5, lower.tail=T, log.p=F) [1] 0.5000000 0.9662641 0.0000000 0.7500000 0.7500000 0.7500000 1.0000000 [8] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(-5, 42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -5, 5, lower.tail=T, log.p=T) [1] -0.69314718 -0.03431805 -Inf -0.28768207 -0.28768207 -0.28768207 [7] 0.00000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(0, -1, 1, 0.42e-30), -0.01, 0.03, lower.tail=F, log.p=F) [1] 0.39758362 0.99035720 0.00945197 0.39758362 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(0, -1, 1, 0.42e-30), -0.01, 0.03, lower.tail=F, log.p=T) [1] -0.922350008 -0.009689596 -4.661532090 -0.922350008 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(0, -1, 1, 0.42e-30), -0.01, 0.03, lower.tail=T, log.p=F) [1] 0.602416382 0.009642803 0.990548030 0.602416382 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(0, -1, 1, 0.42e-30), -0.01, 0.03, lower.tail=T, log.p=T) [1] -0.506806408 -4.641543417 -0.009496923 -0.506806408 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(0, -1, 42), 0, -1, lower.tail=F, log.p=F) [1] NaN NaN NaN Warning message: In pcauchy(c(0, -1, 42), 0, -1, lower.tail = F, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(0, -1, 42), 0, -1, lower.tail=F, log.p=T) [1] NaN NaN NaN Warning message: In pcauchy(c(0, -1, 42), 0, -1, lower.tail = F, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(0, -1, 42), 0, -1, lower.tail=T, log.p=F) [1] NaN NaN NaN Warning message: In pcauchy(c(0, -1, 42), 0, -1, lower.tail = T, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pcauchy(c(0, -1, 42), 0, -1, lower.tail=T, log.p=T) [1] NaN NaN NaN Warning message: In pcauchy(c(0, -1, 42), 0, -1, lower.tail = T, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pchisq(0, -3, 1) [1] NaN Warning message: In pchisq(0, -3, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pchisq(0, -Inf, 1) [1] NaN Warning message: In pchisq(0, -Inf, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pchisq(0, 0, 1) [1] 0.6065307 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pchisq(0, 1, -3) [1] NaN Warning message: In pchisq(0, 1, -3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pchisq(0, 1, -Inf) [1] NaN Warning message: In pchisq(0, 1, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pchisq(0, 1, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pchisq(0, 1, Inf) [1] NaN Warning message: In pchisq(0, 1, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pchisq(0, 1, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pchisq(0, Inf, 1) [1] NaN Warning message: In pchisq(0, Inf, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pchisq(0, NaN, 1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 0.13e-8, 1, lower.tail=F, log.p=F) [1] 3.934693e-01 3.413625e-20 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 0.13e-8, 1, lower.tail=F, log.p=T) [1] -0.9327521 -44.8239272 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 0.13e-8, 1, lower.tail=T, log.p=F) [1] 0.6065307 1.0000000 1.0000000 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 0.13e-8, 1, lower.tail=T, log.p=T) [1] -5.000000e-01 -3.413625e-20 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 1, 0.13e-8, lower.tail=F, log.p=F) [1] 9.999948e-01 1.523971e-23 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 1, 0.13e-8, lower.tail=F, log.p=T) [1] -5.170896e-06 -5.253814e+01 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 1, 0.13e-8, lower.tail=T, log.p=F) [1] 5.170883e-06 1.000000e+00 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 1, 0.13e-8, lower.tail=T, log.p=T) [1] -1.217247e+01 -1.523971e-23 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 420, 4, lower.tail=F, log.p=F) [1] 1 1 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 420, 4, lower.tail=F, log.p=T) [1] 0.000000e+00 -3.150394e-64 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 420, 4, lower.tail=T, log.p=F) [1] 0.000000e+00 3.150394e-64 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.42e-10, 100, 13e10, 11e111), 420, 4, lower.tail=T, log.p=T) [1] -6081.6502 -146.2179 0.0000 0.0000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.5, 2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 1, lower.tail=F, log.p=F) [1] 0.6590992 0.3472435 1.0000000 1.0000000 1.0000000 1.0000000 0.0000000 [8] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.5, 2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 1, lower.tail=F, log.p=T) [1] -4.168812e-01 -1.057729e+00 0.000000e+00 0.000000e+00 0.000000e+00 [6] -3.136299e-16 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.5, 2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 1, lower.tail=T, log.p=F) [1] 3.409008e-01 6.527565e-01 0.000000e+00 0.000000e+00 0.000000e+00 [6] 3.136299e-16 1.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pchisq(c(0.5, 2, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 1, lower.tail=T, log.p=T) [1] -1.0761638 -0.4265511 -Inf -Inf -Inf -35.6983180 [7] 0.0000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pexp(0, -1) [1] NaN Warning message: In pexp(0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pexp(0, -Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pexp(0, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pexp(0, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pexp(0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(10, -10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 13e-20, lower.tail=F, log.p=F) [1] 1 1 1 1 1 1 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(10, -10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 13e-20, lower.tail=F, log.p=T) [1] -1.30e-18 0.00e+00 0.00e+00 0.00e+00 0.00e+00 -5.46e-50 -Inf [8] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(10, -10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 13e-20, lower.tail=T, log.p=F) [1] 1.30e-18 0.00e+00 0.00e+00 0.00e+00 0.00e+00 5.46e-50 1.00e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(10, -10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 13e-20, lower.tail=T, log.p=T) [1] -41.18417 -Inf -Inf -Inf -Inf -113.43181 0.00000 [8] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(33e123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42e123, lower.tail=F, log.p=F) [1] 0 1 1 1 0 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(33e123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42e123, lower.tail=F, log.p=T) [1] -1.386e+249 0.000e+00 0.000e+00 0.000e+00 -1.764e+94 -Inf [7] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(33e123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42e123, lower.tail=T, log.p=F) [1] 1 0 0 0 1 1 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(33e123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42e123, lower.tail=T, log.p=T) [1] 0 -Inf -Inf -Inf 0 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42, lower.tail=F, log.p=F) [1] 0 1 1 1 1 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42, lower.tail=F, log.p=T) [1] -1.764e+03 0.000e+00 0.000e+00 0.000e+00 -1.764e-29 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42, lower.tail=T, log.p=F) [1] 1.000e+00 0.000e+00 0.000e+00 0.000e+00 1.764e-29 1.000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pexp(c(42, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 42, lower.tail=T, log.p=T) [1] 0.00000 -Inf -Inf -Inf -66.20738 0.00000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, -1, 5, 5) [1] NaN Warning message: In pf(0, -1, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, -Inf, 5, 5) [1] NaN Warning message: In pf(0, -Inf, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 0, 5, 5) [1] NaN Warning message: In pf(0, 0, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 5, 5, -1) [1] NaN Warning message: In pf(0, 5, 5, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 5, 5, -Inf) [1] NaN Warning message: In pf(0, 5, 5, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 5, 5, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 5, 5, Inf) [1] NaN Warning message: In pf(0, 5, 5, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 5, 5, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 5, -1, 5) [1] NaN Warning message: In pf(0, 5, -1, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 5, -Inf, 5) [1] NaN Warning message: In pf(0, 5, -Inf, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 5, 0, 5) [1] NaN Warning message: In pf(0, 5, 0, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 5, Inf, 5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, 5, NaN, 5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, Inf, 5, 5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pf(0, NaN, 5, 5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.12e-10, 6, 31e10, lower.tail=F, log.p=F) [1] 1 1 1 1 1 1 1 1 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.12e-10, 6, 31e10, lower.tail=F, log.p=T) [1] 0 0 0 0 0 0 0 0 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.12e-10, 6, 31e10, lower.tail=T, log.p=F) [1] 0 0 0 0 0 0 0 0 1 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0.12e-10, 6, 31e10, lower.tail=T, log.p=T) [1] -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 0.12e-10, 5, lower.tail=F, log.p=F) [1] 1 1 1 1 1 1 1 1 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 0.12e-10, 5, lower.tail=F, log.p=T) [1] -4.342122e-11 -4.739038e-11 -4.994435e-11 -5.171639e-11 0.000000e+00 [6] 0.000000e+00 0.000000e+00 -2.523888e-60 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 0.12e-10, 5, lower.tail=T, log.p=F) [1] 4.342122e-11 4.739038e-11 4.994435e-11 5.171639e-11 0.000000e+00 [6] 0.000000e+00 0.000000e+00 2.523888e-60 1.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 0.12e-10, 5, lower.tail=T, log.p=T) [1] -23.86007 -23.77260 -23.72011 -23.68525 -Inf -Inf [7] -Inf -137.22930 0.00000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 5, 5, lower.tail=F, log.p=F) [1] 0.7960368423 0.0481532307 0.0018278022 0.0001527094 1.0000000000 [6] 1.0000000000 1.0000000000 1.0000000000 0.0000000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 5, 5, lower.tail=F, log.p=T) [1] -2.281098e-01 -3.033367e+00 -6.304641e+00 -8.786974e+00 0.000000e+00 [6] 0.000000e+00 0.000000e+00 -5.097836e-77 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 5, 5, lower.tail=T, log.p=F) [1] 2.039632e-01 9.518468e-01 9.981722e-01 9.998473e-01 0.000000e+00 [6] 0.000000e+00 0.000000e+00 5.097836e-77 1.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 5, 5, lower.tail=T, log.p=T) [1] -1.589816e+00 -4.935121e-02 -1.829475e-03 -1.527211e-04 -Inf [6] -Inf -Inf -1.756702e+02 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 6, 0.12e-10, lower.tail=F, log.p=F) [1] 4.894344e-01 7.119843e-03 1.191517e-04 5.854787e-06 1.000000e+00 [6] 1.000000e+00 1.000000e+00 1.000000e+00 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 6, 0.12e-10, lower.tail=F, log.p=T) [1] -7.145048e-01 -4.944870e+00 -9.035113e+00 -1.204825e+01 0.000000e+00 [6] 0.000000e+00 0.000000e+00 -5.707168e-76 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 6, 0.12e-10, lower.tail=T, log.p=F) [1] 5.105656e-01 9.928802e-01 9.998808e-01 9.999941e-01 0.000000e+00 [6] 0.000000e+00 0.000000e+00 5.707168e-76 1.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pf(c(1, 10, 44, 123, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 5, 6, 0.12e-10, lower.tail=T, log.p=T) [1] -6.722361e-01 -7.145310e-03 -1.191588e-04 -5.854804e-06 -Inf [6] -Inf -Inf -1.732547e+02 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pgamma(0, -1, scale=2) [1] NaN Warning message: In pgamma(0, -1, scale = 2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pgamma(0, -Inf, scale=2) [1] NaN Warning message: In pgamma(0, -Inf, scale = 2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pgamma(0, 0, scale=2) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pgamma(0, 1, -1) [1] NaN Warning message: In pgamma(0, 1, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pgamma(0, 1, -Inf) [1] NaN Warning message: In pgamma(0, 1, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pgamma(0, 1, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pgamma(0, 1, Inf) [1] NaN Warning message: In pgamma(0, 1, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pgamma(0, 1, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pgamma(0, Inf, scale=2) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pgamma(0, NaN, scale=2) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pgamma(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, scale=2, lower.tail=F, log.p=F) [1] 1 1 1 1 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pgamma(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, scale=2, lower.tail=F, log.p=T) [1] 0.0e+00 0.0e+00 0.0e+00 -2.1e-31 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pgamma(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, scale=2, lower.tail=T, log.p=F) [1] 0.0e+00 0.0e+00 0.0e+00 2.1e-31 1.0e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pgamma(c(-Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, scale=2, lower.tail=T, log.p=T) [1] -Inf -Inf -Inf -70.6382 0.0000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pgamma(c(900, 5000, 0), 11e11, scale=23e-11, lower.tail=F, log.p=F) [1] 0 0 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pgamma(c(900, 5000, 0), 11e11, scale=23e-11, lower.tail=F, log.p=T) [1] -1.417138e+12 -1.735695e+13 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pgamma(c(900, 5000, 0), 11e11, scale=23e-11, lower.tail=T, log.p=F) [1] 1 1 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pgamma(c(900, 5000, 0), 11e11, scale=23e-11, lower.tail=T, log.p=T) [1] 0 0 -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, -10, 11, 4) [1] NaN Warning message: In phyper(0, -10, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, -Inf, 11, 4) [1] NaN Warning message: In phyper(0, -Inf, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 0.3, 11, 4) [1] 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 7, 11, -10) [1] NaN Warning message: In phyper(0, 7, 11, -10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 7, 11, -Inf) [1] NaN Warning message: In phyper(0, 7, 11, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 7, 11, 0.3) [1] 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 7, 11, Inf) [1] NaN Warning message: In phyper(0, 7, 11, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 7, 11, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 7, -10, 4) [1] NaN Warning message: In phyper(0, 7, -10, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 7, -Inf, 4) [1] NaN Warning message: In phyper(0, 7, -Inf, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 7, 0.3, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 7, Inf, 4) [1] NaN Warning message: In phyper(0, 7, Inf, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, 7, NaN, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, Inf, 11, 4) [1] NaN Warning message: In phyper(0, Inf, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #phyper(0, NaN, 11, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(0.1, -Inf, Inf, 0.3e89), 5, 5, 5, lower.tail=F, log.p=F) [1] 0.9960317 1.0000000 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(0.1, -Inf, Inf, 0.3e89), 5, 5, 5, lower.tail=F, log.p=T) [1] -0.003976148 0.000000000 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(0.1, -Inf, Inf, 0.3e89), 5, 5, 5, lower.tail=T, log.p=F) [1] 0.003968254 0.000000000 1.000000000 1.000000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(0.1, -Inf, Inf, 0.3e89), 5, 5, 5, lower.tail=T, log.p=T) [1] -5.529429 -Inf 0.000000 0.000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 20, 12e12), 7, 11, 4, lower.tail=F, log.p=F) [1] 0.51470588 0.13725490 0.01143791 0.00000000 0.00000000 0.00000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 20, 12e12), 7, 11, 4, lower.tail=F, log.p=T) [1] -0.6641596 -1.9859155 -4.4708221 -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 20, 12e12), 7, 11, 4, lower.tail=T, log.p=F) [1] 0.4852941 0.8627451 0.9885621 1.0000000 1.0000000 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 20, 12e12), 7, 11, 4, lower.tail=T, log.p=T) [1] -0.72300014 -0.14763600 -0.01150382 0.00000000 0.00000000 0.00000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 20, 12e12), 7e12, 11, 4, lower.tail=F, log.p=F) [1] 1 1 1 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 20, 12e12), 7e12, 11, 4, lower.tail=F, log.p=T) [1] -1.154519e-35 -1.346939e-23 -6.285714e-12 -Inf -Inf [6] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 20, 12e12), 7e12, 11, 4, lower.tail=T, log.p=F) [1] 1.154519e-35 1.346939e-23 6.285714e-12 1.000000e+00 1.000000e+00 [6] 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 20, 12e12), 7e12, 11, 4, lower.tail=T, log.p=T) [1] -80.44679 -52.66162 -25.79274 0.00000 0.00000 0.00000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 5, 6, 7, 8, 11, 20, 12e12), 7, 11, 12, lower.tail=F, log.p=F) [1] 0.99962293 0.98717949 0.88348416 0.57239819 0.19909502 0.02488688 [7] 0.00000000 0.00000000 0.00000000 0.00000000 0.00000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 5, 6, 7, 8, 11, 20, 12e12), 7, 11, 12, lower.tail=F, log.p=T) [1] -0.000377145 -0.012903405 -0.123881913 -0.557920393 -1.613973068 [6] -3.693414609 -Inf -Inf -Inf -Inf [11] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 5, 6, 7, 8, 11, 20, 12e12), 7, 11, 12, lower.tail=T, log.p=F) [1] 0.0003770739 0.0128205128 0.1165158371 0.4276018100 0.8009049774 [6] 0.9751131222 1.0000000000 1.0000000000 1.0000000000 1.0000000000 [11] 1.0000000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 4, 5, 6, 7, 8, 11, 20, 12e12), 7, 11, 12, lower.tail=T, log.p=T) [1] -7.88306935 -4.35670883 -2.14972807 -0.84956287 -0.22201297 -0.02520179 [7] 0.00000000 0.00000000 0.00000000 0.00000000 0.00000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 7, 20, 12e12), 11, 7e12, 7, lower.tail=F, log.p=F) [1] 4.714286e-23 1.010204e-34 1.154519e-46 0.000000e+00 0.000000e+00 [6] 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 7, 20, 12e12), 11, 7e12, 7, lower.tail=F, log.p=T) [1] -51.40886 -78.27774 -105.77523 -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 7, 20, 12e12), 11, 7e12, 7, lower.tail=T, log.p=F) [1] 1 1 1 1 1 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(1, 2, 3, 7, 20, 12e12), 11, 7e12, 7, lower.tail=T, log.p=T) [1] -4.714286e-23 -1.010204e-34 -1.154519e-46 0.000000e+00 0.000000e+00 [6] 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(2), 3, 4, 10, lower.tail=F, log.p=F) [1] NaN Warning message: In phyper(c(2), 3, 4, 10, lower.tail = F, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(2), 3, 4, 10, lower.tail=F, log.p=T) [1] NaN Warning message: In phyper(c(2), 3, 4, 10, lower.tail = F, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(2), 3, 4, 10, lower.tail=T, log.p=F) [1] NaN Warning message: In phyper(c(2), 3, 4, 10, lower.tail = T, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #phyper(c(2), 3, 4, 10, lower.tail=T, log.p=T) [1] NaN Warning message: In phyper(c(2), 3, 4, 10, lower.tail = T, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnbinom(0, -2, 0.33) [1] NaN Warning message: In pnbinom(0, -2, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnbinom(0, -Inf, 0.33) [1] NaN Warning message: In pnbinom(0, -Inf, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnbinom(0, 10, -2) [1] NaN Warning message: In pnbinom(0, 10, -2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnbinom(0, 10, -Inf) [1] NaN Warning message: In pnbinom(0, 10, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnbinom(0, 10, Inf) [1] NaN Warning message: In pnbinom(0, 10, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnbinom(0, 10, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnbinom(0, Inf, 0.33) [1] NaN Warning message: In pnbinom(0, Inf, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnbinom(0, NaN, 0.33) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(0, 10, 100, 1000, 1100, 1200), 1000, 0.5, lower.tail=F, log.p=F) [1] 1.000000e+00 1.000000e+00 1.000000e+00 4.910805e-01 1.375028e-02 [6] 9.007903e-06 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(0, 10, 100, 1000, 1100, 1200), 1000, 0.5, lower.tail=F, log.p=T) [1] -9.332636e-302 -2.679787e-281 -1.163725e-187 -7.111472e-01 -4.286696e+00 [6] -1.161741e+01 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(0, 10, 100, 1000, 1100, 1200), 1000, 0.5, lower.tail=T, log.p=F) [1] 9.332636e-302 2.679787e-281 1.163725e-187 5.089195e-01 9.862497e-01 [6] 9.999910e-01 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(0, 10, 100, 1000, 1100, 1200), 1000, 0.5, lower.tail=T, log.p=T) [1] -6.931472e+02 -6.460407e+02 -4.304318e+02 -6.754654e-01 -1.384569e-02 [6] -9.007944e-06 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(2), 10, -0.1, lower.tail=F, log.p=F) [1] NaN Warning message: In pnbinom(c(2), 10, -0.1, lower.tail = F, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(2), 10, -0.1, lower.tail=F, log.p=T) [1] NaN Warning message: In pnbinom(c(2), 10, -0.1, lower.tail = F, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(2), 10, -0.1, lower.tail=T, log.p=F) [1] NaN Warning message: In pnbinom(c(2), 10, -0.1, lower.tail = T, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(2), 10, -0.1, lower.tail=T, log.p=T) [1] NaN Warning message: In pnbinom(c(2), 10, -0.1, lower.tail = T, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(2), 10, 5, lower.tail=F, log.p=F) [1] NaN Warning message: In pnbinom(c(2), 10, 5, lower.tail = F, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(2), 10, 5, lower.tail=F, log.p=T) [1] NaN Warning message: In pnbinom(c(2), 10, 5, lower.tail = F, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(2), 10, 5, lower.tail=T, log.p=F) [1] NaN Warning message: In pnbinom(c(2), 10, 5, lower.tail = T, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(2), 10, 5, lower.tail=T, log.p=T) [1] NaN Warning message: In pnbinom(c(2), 10, 5, lower.tail = T, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(3, 5, 6, 10, 11, 20, 100), 10, mu=60, lower.tail=F, log.p=F) [1] 0.99999933 0.99999469 0.99998766 0.99983583 0.99972674 0.99314777 0.03829234 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(3, 5, 6, 10, 11, 20, 100), 10, mu=60, lower.tail=F, log.p=T) [1] -6.673927e-07 -5.312745e-06 -1.233937e-05 -1.641817e-04 -2.733021e-04 [6] -6.875815e-03 -3.262505e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(3, 5, 6, 10, 11, 20, 100), 10, mu=60, lower.tail=T, log.p=F) [1] 6.673925e-07 5.312731e-06 1.233929e-05 1.641682e-04 2.732647e-04 [6] 6.852230e-03 9.617077e-01 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(3, 5, 6, 10, 11, 20, 100), 10, mu=60, lower.tail=T, log.p=T) [1] -14.21988749 -12.14540447 -11.30272172 -8.71461880 -8.20506952 [6] -4.98318108 -0.03904476 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 10, 11, 13, 20), 10.3, 0.4, lower.tail=F, log.p=F) [1] 0.9714099 0.7782602 0.7172835 0.5855049 0.1959118 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 10, 11, 13, 20), 10.3, 0.4, lower.tail=F, log.p=T) [1] -0.02900671 -0.25069434 -0.33228410 -0.53528078 -1.63009087 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 10, 11, 13, 20), 10.3, 0.4, lower.tail=T, log.p=F) [1] 0.02859005 0.22173978 0.28271649 0.41449513 0.80408823 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 10, 11, 13, 20), 10.3, 0.4, lower.tail=T, log.p=T) [1] -3.5546965 -1.5062507 -1.2633107 -0.8806941 -0.2180463 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 10, 11, 13, 20, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 0.33, lower.tail=F, log.p=F) [1] 0.9921440 0.9134220 0.8820048 0.8034009 0.4471190 1.0000000 1.0000000 [8] 0.9999847 0.9999847 0.0000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 10, 11, 13, 20, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 0.33, lower.tail=F, log.p=T) [1] -7.886994e-03 -9.055724e-02 -1.255578e-01 -2.189014e-01 -8.049304e-01 [6] 0.000000e+00 0.000000e+00 -1.531591e-05 -1.531591e-05 -Inf [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 10, 11, 13, 20, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 0.33, lower.tail=T, log.p=F) [1] 7.855973e-03 8.657795e-02 1.179952e-01 1.965991e-01 5.528810e-01 [6] 0.000000e+00 0.000000e+00 1.531579e-05 1.531579e-05 1.000000e+00 [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 10, 11, 13, 20, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 0.33, lower.tail=T, log.p=T) [1] -4.8464812 -2.4467101 -2.1371114 -1.6265887 -0.5926126 -Inf [7] -Inf -11.0866262 -11.0866262 0.0000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 6, 10, 11, 20, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1000, mu=10, lower.tail=F, log.p=F) [1] 9.319688e-01 8.686011e-01 4.169592e-01 3.037874e-01 1.683088e-03 [6] 2.754691e-62 1.000000e+00 1.000000e+00 9.999523e-01 9.999523e-01 [11] 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 6, 10, 11, 20, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1000, mu=10, lower.tail=F, log.p=T) [1] -7.045589e-02 -1.408712e-01 -8.747669e-01 -1.191427e+00 -6.387125e+00 [6] -1.417470e+02 0.000000e+00 0.000000e+00 -4.771298e-05 -4.771298e-05 [11] -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 6, 10, 11, 20, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1000, mu=10, lower.tail=T, log.p=F) [1] 6.803115e-02 1.313989e-01 5.830408e-01 6.962126e-01 9.983169e-01 [6] 1.000000e+00 0.000000e+00 0.000000e+00 4.771185e-05 4.771185e-05 [11] 1.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnbinom(c(5, 6, 10, 11, 20, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1000, mu=10, lower.tail=T, log.p=T) [1] -2.687790e+00 -2.029518e+00 -5.394981e-01 -3.621002e-01 -1.684505e-03 [6] -2.754691e-62 -Inf -Inf -9.950331e+00 -9.950331e+00 [11] 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnorm(0, -Inf, -1) [1] NaN Warning message: In pnorm(0, -Inf, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnorm(0, 0, -Inf) [1] NaN Warning message: In pnorm(0, 0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnorm(0, 0, Inf) [1] 0.5 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnorm(0, 0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnorm(0, Inf, -1) [1] NaN Warning message: In pnorm(0, Inf, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pnorm(0, NaN, -1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(0), 0, -1, lower.tail=F, log.p=F) [1] NaN Warning message: In pnorm(c(0), 0, -1, lower.tail = F, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(0), 0, -1, lower.tail=F, log.p=T) [1] NaN Warning message: In pnorm(c(0), 0, -1, lower.tail = F, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(0), 0, -1, lower.tail=T, log.p=F) [1] NaN Warning message: In pnorm(c(0), 0, -1, lower.tail = T, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(0), 0, -1, lower.tail=T, log.p=T) [1] NaN Warning message: In pnorm(c(0), 0, -1, lower.tail = T, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(1, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, lower.tail=F, log.p=F) [1] 0 1 1 0 0 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(1, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, lower.tail=F, log.p=T) [1] -Inf 0 0 -Inf -Inf -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(1, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, lower.tail=T, log.p=F) [1] 1 0 0 1 1 1 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(1, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 0, 0, lower.tail=T, log.p=T) [1] 0 -Inf -Inf 0 0 0 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(4, -100, 0), 4, 4, lower.tail=F, log.p=F) [1] 0.5000000 1.0000000 0.8413447 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(4, -100, 0), 4, 4, lower.tail=F, log.p=T) [1] -6.931472e-01 -2.476063e-149 -1.727538e-01 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(4, -100, 0), 4, 4, lower.tail=T, log.p=F) [1] 5.000000e-01 2.476063e-149 1.586553e-01 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pnorm(c(4, -100, 0), 4, 4, lower.tail=T, log.p=T) [1] -0.6931472 -342.1785089 -1.8410216 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ppois(0, -1) [1] NaN Warning message: In ppois(0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ppois(0, -Inf) [1] NaN Warning message: In ppois(0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ppois(0, 0) [1] 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ppois(0, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ppois(0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(0.1e-10, 0.1, 1, 10), 0.1e-6, lower.tail=F, log.p=F) [1] 1.000000e-07 1.000000e-07 5.000000e-15 2.505211e-85 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(0.1e-10, 0.1, 1, 10), 0.1e-6, lower.tail=F, log.p=T) [1] -16.11810 -16.11810 -32.92934 -194.80136 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(0.1e-10, 0.1, 1, 10), 0.1e-6, lower.tail=T, log.p=F) [1] 0.9999999 0.9999999 1.0000000 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(0.1e-10, 0.1, 1, 10), 0.1e-6, lower.tail=T, log.p=T) [1] -1.000000e-07 -1.000000e-07 -5.000000e-15 -2.505211e-85 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(1e99, 1e99*9.999, 1e100-1, 1e100, 1e100+100, 1e101), 1e100, lower.tail=F, log.p=F) [1] 1.0 1.0 0.5 0.5 0.5 0.0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(1e99, 1e99*9.999, 1e100-1, 1e100, 1e100+100, 1e101), 1e100, lower.tail=F, log.p=T) [1] 0.000000e+00 0.000000e+00 -6.931472e-01 -6.931472e-01 -6.931472e-01 [6] -1.402585e+101 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(1e99, 1e99*9.999, 1e100-1, 1e100, 1e100+100, 1e101), 1e100, lower.tail=T, log.p=F) [1] 0.0 0.0 0.5 0.5 0.5 1.0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(1e99, 1e99*9.999, 1e100-1, 1e100, 1e100+100, 1e101), 1e100, lower.tail=T, log.p=T) [1] -6.697415e+99 -5.000167e+91 -6.931472e-01 -6.931472e-01 -6.931472e-01 [6] 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(5, 10, 15, 20, 30, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, lower.tail=F, log.p=F) [1] 9.329140e-01 4.169602e-01 4.874040e-02 1.588261e-03 7.983795e-08 [6] 1.000000e+00 1.000000e+00 9.999546e-01 9.999546e-01 0.000000e+00 [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(5, 10, 15, 20, 30, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, lower.tail=F, log.p=T) [1] -6.944222e-02 -8.747644e-01 -3.021247e+00 -6.445116e+00 -1.634327e+01 [6] 0.000000e+00 0.000000e+00 -4.540096e-05 -4.540096e-05 -Inf [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(5, 10, 15, 20, 30, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, lower.tail=T, log.p=F) [1] 6.708596e-02 5.830398e-01 9.512596e-01 9.984117e-01 9.999999e-01 [6] 0.000000e+00 0.000000e+00 4.539993e-05 4.539993e-05 1.000000e+00 [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ppois(c(5, 10, 15, 20, 30, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, lower.tail=T, log.p=T) [1] -2.701780e+00 -5.394999e-01 -4.996828e-02 -1.589523e-03 -7.983795e-08 [6] -Inf -Inf -1.000000e+01 -1.000000e+01 0.000000e+00 [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #psignrank(0, -3) [1] NaN Warning message: In psignrank(0, -3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #psignrank(0, -Inf) [1] NaN Warning message: In psignrank(0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #psignrank(0, 0) [1] NaN Warning message: In psignrank(0, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #psignrank(0, Inf) [1] NaN Warning message: In psignrank(0, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #psignrank(0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #psignrank(c(0.3, 0.6, 2, 3, 6, 15, 20), 5.5, lower.tail=F, log.p=F) [1] 0.984375 0.968750 0.953125 0.921875 0.781250 0.156250 0.015625 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #psignrank(c(0.3, 0.6, 2, 3, 6, 15, 20), 5.5, lower.tail=F, log.p=T) [1] -0.01574836 -0.03174870 -0.04800922 -0.08134564 -0.24686008 -1.85629799 [7] -4.15888308 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #psignrank(c(0.3, 0.6, 2, 3, 6, 15, 20), 5.5, lower.tail=T, log.p=F) [1] 0.015625 0.031250 0.046875 0.078125 0.218750 0.843750 0.984375 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #psignrank(c(0.3, 0.6, 2, 3, 6, 15, 20), 5.5, lower.tail=T, log.p=T) [1] -4.15888308 -3.46573590 -3.06027079 -2.54944517 -1.51982575 -0.16989904 [7] -0.01574836 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #psignrank(c(5, 15, 20, 27, 35, 50, 54, 55, 56, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, lower.tail=F, log.p=F) [1] 0.9902343750 0.8837890625 0.7539062500 0.5000000000 0.2158203125 [6] 0.0068359375 0.0009765625 0.0000000000 0.0000000000 0.0000000000 [11] 1.0000000000 0.9990234375 0.9990234375 0.9990234375 0.0000000000 [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #psignrank(c(5, 15, 20, 27, 35, 50, 54, 55, 56, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, lower.tail=F, log.p=T) [1] -0.0098136214 -0.1235368619 -0.2824872556 -0.6931471806 -1.5333091041 [6] -4.9855616565 -6.9314718056 -Inf -Inf -Inf [11] 0.0000000000 -0.0009770396 -0.0009770396 -0.0009770396 -Inf [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #psignrank(c(5, 15, 20, 27, 35, 50, 54, 55, 56, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, lower.tail=T, log.p=F) [1] 0.0097656250 0.1162109375 0.2460937500 0.5000000000 0.7841796875 [6] 0.9931640625 0.9990234375 1.0000000000 1.0000000000 1.0000000000 [11] 0.0000000000 0.0009765625 0.0009765625 0.0009765625 1.0000000000 [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #psignrank(c(5, 15, 20, 27, 35, 50, 54, 55, 56, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, lower.tail=T, log.p=T) [1] -4.6288867126 -2.1523483125 -1.4020427181 -0.6931471806 -0.2431170917 [6] -0.0068594096 -0.0009770396 0.0000000000 0.0000000000 0.0000000000 [11] -Inf -6.9314718056 -6.9314718056 -6.9314718056 0.0000000000 [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pt(0, -Inf, ncp=0.5) [1] NaN Warning message: In pt(0, -Inf, ncp = 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pt(0, 3e100, -Inf) [1] 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pt(0, 3e100, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pt(0, NaN, ncp=0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(-10, -5, -4, -3, -2, -1, 0, 1.1, 2, 3, 4, 10, 100), Inf, ncp=-1, lower.tail=F, log.p=F) [1] 1.000000e+00 9.999683e-01 9.986501e-01 9.772499e-01 8.413447e-01 [6] 5.000000e-01 1.586553e-01 1.786442e-02 1.349898e-03 3.167124e-05 [11] 2.866516e-07 1.910660e-28 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(-10, -5, -4, -3, -2, -1, 0, 1.1, 2, 3, 4, 10, 100), Inf, ncp=-1, lower.tail=F, log.p=T) [1] -1.128588e-19 -3.167174e-05 -1.350810e-03 -2.301291e-02 -1.727538e-01 [6] -6.931472e-01 -1.841022e+00 -4.024944e+00 -6.607726e+00 -1.036010e+01 [11] -1.506500e+01 -6.382493e+01 -5.106034e+03 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(-10, -5, -4, -3, -2, -1, 0, 1.1, 2, 3, 4, 10, 100), Inf, ncp=-1, lower.tail=T, log.p=F) [1] 1.128588e-19 3.167124e-05 1.349898e-03 2.275013e-02 1.586553e-01 [6] 5.000000e-01 8.413447e-01 9.821356e-01 9.986501e-01 9.999683e-01 [11] 9.999997e-01 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(-10, -5, -4, -3, -2, -1, 0, 1.1, 2, 3, 4, 10, 100), Inf, ncp=-1, lower.tail=T, log.p=T) [1] -4.362815e+01 -1.036010e+01 -6.607726e+00 -3.783184e+00 -1.841022e+00 [6] -6.931472e-01 -1.727538e-01 -1.802592e-02 -1.350810e-03 -3.167174e-05 [11] -2.866516e-07 -1.910660e-28 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(-30, -20, -4, 0.5, 1.3, 2, 3, 4, 10, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 3e100, ncp=0.5, lower.tail=F, log.p=F) [1] 1.000000e+00 1.000000e+00 9.999966e-01 5.000000e-01 2.118554e-01 [6] 6.680720e-02 6.209665e-03 2.326291e-04 1.049452e-21 0.000000e+00 [11] 1.000000e+00 6.914625e-01 6.914625e-01 6.914625e-01 0.000000e+00 [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(-30, -20, -4, 0.5, 1.3, 2, 3, 4, 10, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 3e100, ncp=0.5, lower.tail=F, log.p=T) [1] -1.302938e-204 -1.076467e-93 -3.397679e-06 -6.931472e-01 -1.551851e+00 [6] -2.705944e+00 -5.081648e+00 -8.366065e+00 -4.830602e+01 -4.955644e+03 [11] 0.000000e+00 -3.689464e-01 -3.689464e-01 -3.689464e-01 -Inf [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(-30, -20, -4, 0.5, 1.3, 2, 3, 4, 10, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 3e100, ncp=0.5, lower.tail=T, log.p=F) [1] 1.302938e-204 1.076467e-93 3.397673e-06 5.000000e-01 7.881446e-01 [6] 9.331928e-01 9.937903e-01 9.997674e-01 1.000000e+00 1.000000e+00 [11] 0.000000e+00 3.085375e-01 3.085375e-01 3.085375e-01 1.000000e+00 [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(-30, -20, -4, 0.5, 1.3, 2, 3, 4, 10, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 3e100, ncp=0.5, lower.tail=T, log.p=T) [1] -4.694627e+02 -2.140667e+02 -1.259242e+01 -6.931472e-01 -2.380737e-01 [6] -6.914346e-02 -6.229025e-03 -2.326561e-04 -1.049452e-21 0.000000e+00 [11] -Inf -1.175912e+00 -1.175912e+00 -1.175912e+00 0.000000e+00 [16] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(1), -10, ncp=2, lower.tail=F, log.p=F) [1] NaN Warning message: In pt(c(1), -10, ncp = 2, lower.tail = F, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(1), -10, ncp=2, lower.tail=F, log.p=T) [1] NaN Warning message: In pt(c(1), -10, ncp = 2, lower.tail = F, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(1), -10, ncp=2, lower.tail=T, log.p=F) [1] NaN Warning message: In pt(c(1), -10, ncp = 2, lower.tail = T, log.p = F) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pt(c(1), -10, ncp=2, lower.tail=T, log.p=T) [1] NaN Warning message: In pt(c(1), -10, ncp = 2, lower.tail = T, log.p = T) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, -10, 5, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, -Inf, 5, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 0, 5, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 1, 5, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, 5, -10) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, 5, -Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, 5, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, 5, 1) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, 5, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, 5, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, -10, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, -Inf, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, 0, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, 1, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, Inf, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, 10, NaN, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, Inf, 5, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #ptukey(0, NaN, 5, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ptukey(c(-1, 1, 1.9, 3, 5, 10, 15, 20, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 5, 4, lower.tail=F, log.p=F) [1] 1.000000e+00 1.000000e+00 9.934805e-01 8.305223e-01 3.211940e-01 [6] 2.527372e-02 4.050344e-03 1.054660e-03 5.155335e-07 1.000000e+00 [11] 1.000000e+00 1.000000e+00 1.000000e+00 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ptukey(c(-1, 1, 1.9, 3, 5, 10, 15, 20, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 5, 4, lower.tail=F, log.p=T) [1] 0.000000000 0.000000000 -0.006540828 -0.185700543 -1.135710025 [6] -3.677990327 -5.508953426 -6.854537201 -14.478063579 0.000000000 [11] 0.000000000 0.000000000 0.000000000 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ptukey(c(-1, 1, 1.9, 3, 5, 10, 15, 20, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 5, 4, lower.tail=T, log.p=F) [1] 0.000000000 0.000000000 0.006519484 0.169477737 0.678806015 0.974726284 [7] 0.995949656 0.998945340 0.999999484 0.000000000 0.000000000 0.000000000 [13] 0.000000000 1.000000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #ptukey(c(-1, 1, 1.9, 3, 5, 10, 15, 20, 100, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 5, 4, lower.tail=T, log.p=T) [1] -Inf -Inf -5.032960e+00 -1.775034e+00 -3.874199e-01 [6] -2.559858e-02 -4.058569e-03 -1.055216e-03 -5.155336e-07 -Inf [11] -Inf -Inf -Inf 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #punif(0, -3, -Inf) [1] NaN Warning message: In punif(0, -3, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #punif(0, -3, Inf) [1] NaN Warning message: In punif(0, -3, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #punif(0, -3, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #punif(0, -Inf, 3.3) [1] NaN Warning message: In punif(0, -Inf, 3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #punif(0, Inf, 3.3) [1] NaN Warning message: In punif(0, Inf, 3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #punif(0, NaN, 3.3) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #punif(c(-3, 2, 3.3, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -3, 3.3, lower.tail=F, log.p=F) [1] 1.0000000 0.2063492 0.0000000 1.0000000 0.5238095 0.5238095 0.5238095 [8] 0.0000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #punif(c(-3, 2, 3.3, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -3, 3.3, lower.tail=F, log.p=T) [1] 0.0000000 -1.5781854 -Inf 0.0000000 -0.6466272 -0.6466272 -0.6466272 [8] -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #punif(c(-3, 2, 3.3, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -3, 3.3, lower.tail=T, log.p=F) [1] 0.0000000 0.7936508 1.0000000 0.0000000 0.4761905 0.4761905 0.4761905 [8] 1.0000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #punif(c(-3, 2, 3.3, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), -3, 3.3, lower.tail=T, log.p=T) [1] -Inf -0.2311117 0.0000000 -Inf -0.7419373 -0.7419373 -0.7419373 [8] 0.0000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pweibull(0, -3.3, 0.5) [1] NaN Warning message: In pweibull(0, -3.3, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pweibull(0, -Inf, 0.5) [1] NaN Warning message: In pweibull(0, -Inf, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pweibull(0, 0, 0.5) [1] NaN Warning message: In pweibull(0, 0, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pweibull(0, 1, -3.3) [1] NaN Warning message: In pweibull(0, 1, -3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pweibull(0, 1, -Inf) [1] NaN Warning message: In pweibull(0, 1, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pweibull(0, 1, 0) [1] NaN Warning message: In pweibull(0, 1, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pweibull(0, 1, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pweibull(0, 1, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pweibull(0, Inf, 0.5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pweibull(0, NaN, 0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(0.9, 0.99999999999999999, 1-1e-30, 1), 1e100, 1, lower.tail=F, log.p=F) [1] 1.0000000 0.3678794 0.3678794 0.3678794 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(0.9, 0.99999999999999999, 1-1e-30, 1), 1e100, 1, lower.tail=F, log.p=T) [1] 0 -1 -1 -1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(0.9, 0.99999999999999999, 1-1e-30, 1), 1e100, 1, lower.tail=T, log.p=F) [1] 0.0000000 0.6321206 0.6321206 0.6321206 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(0.9, 0.99999999999999999, 1-1e-30, 1), 1e100, 1, lower.tail=T, log.p=T) [1] -Inf -0.4586751 -0.4586751 -0.4586751 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10), 0.5, 10, lower.tail=F, log.p=F) [1] 0.7288934 0.6394073 0.5630109 0.5312856 0.4930687 0.4608896 0.4579364 [8] 0.3678794 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10), 0.5, 10, lower.tail=F, log.p=T) [1] -0.3162278 -0.4472136 -0.5744563 -0.6324555 -0.7071068 -0.7745967 -0.7810250 [8] -1.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10), 0.5, 10, lower.tail=T, log.p=F) [1] 0.2711066 0.3605927 0.4369891 0.4687144 0.5069313 0.5391104 0.5420636 [8] 0.6321206 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10), 0.5, 10, lower.tail=T, log.p=T) [1] -1.3052432 -1.0200063 -0.8278471 -0.7577617 -0.6793798 -0.6178350 -0.6123719 [8] -0.4586751 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 0.5, lower.tail=F, log.p=F) [1] 1.353353e-01 1.831564e-02 1.360368e-03 3.354626e-04 4.539993e-05 [6] 6.144212e-06 5.030456e-06 2.061154e-09 1.000000e+00 1.000000e+00 [11] 1.000000e+00 1.000000e+00 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 0.5, lower.tail=F, log.p=T) [1] -2.00e+00 -4.00e+00 -6.60e+00 -8.00e+00 -1.00e+01 -1.20e+01 -1.22e+01 [8] -2.00e+01 0.00e+00 0.00e+00 0.00e+00 -8.40e-31 -Inf NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 0.5, lower.tail=T, log.p=F) [1] 8.646647e-01 9.816844e-01 9.986396e-01 9.996645e-01 9.999546e-01 [6] 9.999939e-01 9.999950e-01 1.000000e+00 0.000000e+00 0.000000e+00 [11] 0.000000e+00 8.400000e-31 1.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pweibull(c(1, 2, 3.3, 4, 5, 6, 6.1, 10, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 1, 0.5, lower.tail=T, log.p=T) [1] -1.454135e-01 -1.848545e-02 -1.361294e-03 -3.355189e-04 -4.540096e-05 [6] -6.144231e-06 -5.030468e-06 -2.061154e-09 -Inf -Inf [11] -Inf -6.925191e+01 0.000000e+00 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pwilcox(0, -Inf, 10) [1] NaN Warning message: In pwilcox(0, -Inf, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pwilcox(0, 10, -Inf) [1] NaN Warning message: In pwilcox(0, 10, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pwilcox(0, 10, Inf) [1] NaN Warning message: In pwilcox(0, 10, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pwilcox(0, 10, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pwilcox(0, Inf, 10) [1] NaN Warning message: In pwilcox(0, Inf, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #pwilcox(0, NaN, 10) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pwilcox(c(1, 3, 5, 100, 1000), 4, 7, lower.tail=F, log.p=F) [1] 0.9939394 0.9787879 0.9454545 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pwilcox(c(1, 3, 5, 100, 1000), 4, 7, lower.tail=F, log.p=T) [1] -0.006079046 -0.021440331 -0.056089467 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pwilcox(c(1, 3, 5, 100, 1000), 4, 7, lower.tail=T, log.p=F) [1] 0.006060606 0.021212121 0.054545455 1.000000000 1.000000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pwilcox(c(1, 3, 5, 100, 1000), 4, 7, lower.tail=T, log.p=T) [1] -5.105945 -3.853183 -2.908721 0.000000 0.000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pwilcox(c(1, 3, 5, 100, 1000, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 10, lower.tail=F, log.p=F) [1] 0.9999892 0.9999621 0.9998972 0.0000000 0.0000000 1.0000000 0.9999946 [8] 0.9999946 0.9999946 0.0000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pwilcox(c(1, 3, 5, 100, 1000, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 10, lower.tail=F, log.p=T) [1] -1.082515e-05 -3.788853e-05 -1.028436e-04 -Inf -Inf [6] 0.000000e+00 -5.412559e-06 -5.412559e-06 -5.412559e-06 -Inf [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pwilcox(c(1, 3, 5, 100, 1000, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 10, lower.tail=T, log.p=F) [1] 1.082509e-05 3.788781e-05 1.028383e-04 1.000000e+00 1.000000e+00 [6] 0.000000e+00 5.412544e-06 5.412544e-06 5.412544e-06 1.000000e+00 [11] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testDistributionFunctions#Output.MayIgnoreWarningContext# #pwilcox(c(1, 3, 5, 100, 1000, -Inf, -0.42e-30, 0, 0.42e-30, Inf, NaN), 10, 10, lower.tail=T, log.p=T) [1] -11.433644 -10.180881 -9.182352 0.000000 0.000000 -Inf [7] -12.126791 -12.126791 -12.126791 0.000000 NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(-0.42e-38, 0.5, 0.5) [1] NaN Warning message: In qbeta(-4.2e-39, 0.5, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(-0.42e-38, 10, 15, 0) [1] NaN Warning message: In qbeta(-4.2e-39, 10, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(-42, 0.5, 0.5) [1] NaN Warning message: In qbeta(-42, 0.5, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(-42, 10, 15, 0) [1] NaN Warning message: In qbeta(-42, 10, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(-Inf, 0.5, 0.5) [1] NaN Warning message: In qbeta(-Inf, 0.5, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(-Inf, 10, 15, 0) [1] NaN Warning message: In qbeta(-Inf, 10, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, -1, 0.5) [1] NaN Warning message: In qbeta(0, -1, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, -4, 15, 0) [1] NaN Warning message: In qbeta(0, -4, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, -Inf, 0.5) [1] NaN Warning message: In qbeta(0, -Inf, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, -Inf, 15, 0) [1] NaN Warning message: In qbeta(0, -Inf, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 0, 0.5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 0, 15, 0) [1] NaN Warning message: In qbeta(0, 0, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 0.5, -1) [1] NaN Warning message: In qbeta(0, 0.5, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 0.5, -Inf) [1] NaN Warning message: In qbeta(0, 0.5, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 0.5, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 0.5, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 0.5, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 10, 15, -4) [1] NaN Warning message: In qbeta(0, 10, 15, -4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 10, 15, -Inf) [1] NaN Warning message: In qbeta(0, 10, 15, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 10, 15, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 10, 15, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 10, 15, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 10, -4, 0) [1] NaN Warning message: In qbeta(0, 10, -4, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 10, -Inf, 0) [1] NaN Warning message: In qbeta(0, 10, -Inf, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 10, 0, 0) [1] NaN Warning message: In qbeta(0, 10, 0, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 10, Inf, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, 10, NaN, 0) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, Inf, 0.5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, Inf, 15, 0) [1] NaN Warning message: In qbeta(0, Inf, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, NaN, 0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbeta(0, NaN, 15, 0) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(Inf, 0.5, 0.5) [1] NaN Warning message: In qbeta(Inf, 0.5, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(Inf, 10, 15, 0) [1] NaN Warning message: In qbeta(Inf, 10, 15, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(NaN, 0.5, 0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(NaN, 10, 15, 0) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0, 0, lower.tail=F, log.p=F) [1] 1.0 0.0 0.0 0.5 1.0 0.0 0.0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0, 0, lower.tail=T, log.p=F) [1] 0.0 0.0 0.0 0.5 1.0 1.0 1.0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0, Inf, lower.tail=F, log.p=F) [1] 1 0 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0, Inf, lower.tail=T, log.p=F) [1] 0 0 0 0 0 1 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.1, 3, lower.tail=F, log.p=F) [1] 1.000000e+00 1.000000e+00 9.839300e-02 2.312399e-04 1.397635e-06 [6] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.1, 3, lower.tail=T, log.p=F) [1] 0.000000e+00 0.000000e+00 2.366901e-11 2.312399e-04 6.768603e-03 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.5, 0.5, lower.tail=F, log.p=F) [1] 1.0000000 1.0000000 0.9755283 0.5000000 0.2061074 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.5, 0.5, lower.tail=T, log.p=F) [1] 0.000000e+00 4.352496e-157 2.447174e-02 5.000000e-01 7.938926e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 15, 0, lower.tail=F, log.p=F) [1] 1.0000000 1.0000000 0.5264118 0.3972924 0.3463781 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 15, 0, lower.tail=T, log.p=F) [1] 0.000000e+00 3.412491e-09 2.772130e-01 3.972924e-01 4.497463e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 2, 5, lower.tail=F, log.p=F) [1] 1.0000000 1.0000000 0.5103163 0.2644500 0.1818035 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 2, 5, lower.tail=T, log.p=F) [1] 0.000000e+00 1.673320e-40 9.259526e-02 2.644500e-01 3.603577e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 6, 3, lower.tail=F, log.p=F) [1] 1.0000000 1.0000000 0.8531451 0.6794810 0.5925411 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 6, 3, lower.tail=T, log.p=F) [1] 0.000000e+00 4.966097e-14 4.617846e-01 6.794810e-01 7.586657e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7, 11, 0.37e-10, lower.tail=F, log.p=F) [1] 1.0000000 1.0000000 0.5373549 0.3846872 0.3251782 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7, 11, 0.37e-10, lower.tail=T, log.p=F) [1] 0.000000e+00 1.551047e-12 2.461368e-01 3.846872e-01 4.466173e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7, 113e11, 1, lower.tail=F, log.p=F) [1] 1.000000e+00 1.000000e+00 9.979557e-13 6.326635e-13 5.134397e-13 [6] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7, 113e11, 1, lower.tail=T, log.p=F) [1] 0.000000e+00 2.042740e-24 3.697562e-13 6.326635e-13 7.690718e-13 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7, 13, 3, lower.tail=F, log.p=F) [1] 1.0000000 1.0000000 0.5361327 0.3904742 0.3326837 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7, 13, 3, lower.tail=T, log.p=F) [1] 0.000000e+00 1.677349e-12 2.547294e-01 3.904742e-01 4.499427e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), Inf, 0, lower.tail=F, log.p=F) [1] 1 1 1 1 1 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), Inf, 0, lower.tail=T, log.p=F) [1] 0 1 1 1 1 1 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0, 0, lower.tail=F, log.p=T) [1] 1.0 0.0 0.0 0.5 1.0 0.0 0.0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0, 0, lower.tail=T, log.p=T) [1] 0.0 0.0 0.0 0.5 1.0 1.0 1.0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0, Inf, lower.tail=F, log.p=T) [1] 1 0 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0, Inf, lower.tail=T, log.p=T) [1] 0 0 0 0 0 1 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.1, 3, lower.tail=F, log.p=T) [1] 1.000000e+00 1.000000e+00 9.839300e-02 2.312399e-04 1.397635e-06 [6] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.1, 3, lower.tail=T, log.p=T) [1] 0.000000e+00 1.112537e-308 2.366901e-11 2.312399e-04 6.768603e-03 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.5, 0.5, lower.tail=F, log.p=T) [1] 1.0000000 1.0000000 0.9755283 0.5000000 0.2061074 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.5, 0.5, lower.tail=T, log.p=T) [1] 0.000000e+00 4.352496e-157 2.447174e-02 5.000000e-01 7.938926e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 15, 0, lower.tail=F, log.p=T) [1] 1.0000000 1.0000000 0.5264118 0.3972924 0.3463781 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 15, 0, lower.tail=T, log.p=T) [1] 0.000000e+00 3.412491e-09 2.772130e-01 3.972924e-01 4.497463e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 2, 5, lower.tail=F, log.p=T) [1] 1.0000000 1.0000000 0.5103163 0.2644500 0.1818035 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 2, 5, lower.tail=T, log.p=T) [1] 0.000000e+00 1.673320e-40 9.259526e-02 2.644500e-01 3.603577e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 6, 3, lower.tail=F, log.p=T) [1] 1.0000000 1.0000000 0.8531451 0.6794810 0.5925411 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 6, 3, lower.tail=T, log.p=T) [1] 0.000000e+00 4.966097e-14 4.617846e-01 6.794810e-01 7.586657e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7, 11, 0.37e-10, lower.tail=F, log.p=T) [1] 1.0000000 1.0000000 0.5373549 0.3846872 0.3251782 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7, 11, 0.37e-10, lower.tail=T, log.p=T) [1] 0.000000e+00 1.551047e-12 2.461368e-01 3.846872e-01 4.466173e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7, 113e11, 1, lower.tail=F, log.p=T) [1] 1.000000e+00 1.000000e+00 9.979557e-13 6.326635e-13 5.134397e-13 [6] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7, 113e11, 1, lower.tail=T, log.p=T) [1] 0.000000e+00 2.042740e-24 3.697562e-13 6.326635e-13 7.690718e-13 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7, 13, 3, lower.tail=F, log.p=T) [1] 1.0000000 1.0000000 0.5361327 0.3904742 0.3326837 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7, 13, 3, lower.tail=T, log.p=T) [1] 0.000000e+00 1.677349e-12 2.547294e-01 3.904742e-01 4.499427e-01 [6] 1.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), Inf, 0, lower.tail=F, log.p=T) [1] 1 1 1 1 1 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbeta(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), Inf, 0, lower.tail=T, log.p=T) [1] 0 1 1 1 1 1 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(-0.42e-38, 20, 0.3) [1] NaN Warning message: In qbinom(-4.2e-39, 20, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(-42, 20, 0.3) [1] NaN Warning message: In qbinom(-42, 20, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(-Inf, 20, 0.3) [1] NaN Warning message: In qbinom(-Inf, 20, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbinom(0, -1, 0.3) [1] NaN Warning message: In qbinom(0, -1, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbinom(0, -Inf, 0.3) [1] NaN Warning message: In qbinom(0, -Inf, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbinom(0, 20, -1) [1] NaN Warning message: In qbinom(0, 20, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbinom(0, 20, -Inf) [1] NaN Warning message: In qbinom(0, 20, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbinom(0, 20, Inf) [1] NaN Warning message: In qbinom(0, 20, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbinom(0, 20, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbinom(0, Inf, 0.3) [1] NaN Warning message: In qbinom(0, Inf, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qbinom(0, NaN, 0.3) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(Inf, 20, 0.3) [1] NaN Warning message: In qbinom(Inf, 20, 0.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(NaN, 20, 0.3) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, -0.1, lower.tail=F, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qbinom(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, -0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, -0.1, lower.tail=T, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qbinom(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, -0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 5, lower.tail=F, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qbinom(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, 5, lower.tail = F, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 5, lower.tail=T, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qbinom(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, 5, lower.tail = T, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10000, 0.01, lower.tail=F, log.p=F) [1] 10000 10000 113 100 95 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10000, 0.01, lower.tail=T, log.p=F) [1] 0 0 87 100 105 10000 10000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 20, 0.3, lower.tail=F, log.p=F) [1] 20 20 9 6 5 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 20, 0.3, lower.tail=T, log.p=F) [1] 0 0 3 6 7 20 20 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 382403676160, 2.2226668680885774867e-19, lower.tail=F, log.p=F) [1] 382403676160 382403676160 0 0 0 [6] 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 382403676160, 2.2226668680885774867e-19, lower.tail=T, log.p=F) [1] 0 0 0 0 0 [6] 382403676160 382403676160 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, -0.1, lower.tail=F, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qbinom(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, -0.1, lower.tail=T, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qbinom(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 5, lower.tail=F, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qbinom(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 5, lower.tail=T, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qbinom(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10000, 0.01, lower.tail=F, log.p=T) [1] 10000 10000 113 100 95 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10000, 0.01, lower.tail=T, log.p=T) [1] 0 0 87 100 105 10000 10000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 20, 0.3, lower.tail=F, log.p=T) [1] 20 20 9 6 5 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 20, 0.3, lower.tail=T, log.p=T) [1] 0 0 3 6 7 20 20 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 382403676160, 2.2226668680885774867e-19, lower.tail=F, log.p=T) [1] 382403676160 382403676160 0 0 0 [6] 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 382403676160, 2.2226668680885774867e-19, lower.tail=T, log.p=T) [1] 0 0 0 0 0 [6] 382403676160 382403676160 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(-0.42e-38, 0, -1) [1] NaN Warning message: In qcauchy(-4.2e-39, 0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(-42, 0, -1) [1] NaN Warning message: In qcauchy(-42, 0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(-Inf, 0, -1) [1] NaN Warning message: In qcauchy(-Inf, 0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qcauchy(0, -Inf, -1) [1] NaN Warning message: In qcauchy(0, -Inf, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qcauchy(0, 0, -Inf) [1] NaN Warning message: In qcauchy(0, 0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qcauchy(0, 0, Inf) [1] NaN Warning message: In qcauchy(0, 0, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qcauchy(0, 0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qcauchy(0, Inf, -1) [1] NaN Warning message: In qcauchy(0, Inf, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qcauchy(0, NaN, -1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(Inf, 0, -1) [1] NaN Warning message: In qcauchy(Inf, 0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(NaN, 0, -1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), -0.01, 0.03, lower.tail=F, log.p=F) [1] Inf 2.273642e+76 8.233051e-02 -1.000000e-02 -3.179628e-02 [6] -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), -0.01, 0.03, lower.tail=T, log.p=F) [1] -Inf -2.273642e+76 -1.023305e-01 -1.000000e-02 1.179628e-02 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), -5, 5, lower.tail=F, log.p=F) [1] Inf 3.789403e+78 1.038842e+01 -5.000000e+00 -8.632713e+00 [6] -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), -5, 5, lower.tail=T, log.p=F) [1] -Inf -3.789403e+78 -2.038842e+01 -5.000000e+00 -1.367287e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0, -1, lower.tail=F, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qcauchy(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 0, -1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0, -1, lower.tail=T, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qcauchy(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 0, -1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), -0.01, 0.03, lower.tail=F, log.p=T) [1] Inf 2.273642e+76 8.233051e-02 -1.000000e-02 -3.179628e-02 [6] -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), -0.01, 0.03, lower.tail=T, log.p=T) [1] -Inf -2.273642e+76 -1.023305e-01 -1.000000e-02 1.179628e-02 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), -5, 5, lower.tail=F, log.p=T) [1] Inf 3.789403e+78 1.038842e+01 -5.000000e+00 -8.632713e+00 [6] -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), -5, 5, lower.tail=T, log.p=T) [1] -Inf -3.789403e+78 -2.038842e+01 -5.000000e+00 -1.367287e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0, -1, lower.tail=F, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qcauchy(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qcauchy(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0, -1, lower.tail=T, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qcauchy(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(-0.42e-38, 1, 1) [1] NaN Warning message: In qchisq(-4.2e-39, 1, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(-42, 1, 1) [1] NaN Warning message: In qchisq(-42, 1, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(-Inf, 1, 1) [1] NaN Warning message: In qchisq(-Inf, 1, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qchisq(0, -3, 1) [1] NaN Warning message: In qchisq(0, -3, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qchisq(0, -Inf, 1) [1] NaN Warning message: In qchisq(0, -Inf, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qchisq(0, 0, 1) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qchisq(0, 1, -3) [1] NaN Warning message: In qchisq(0, 1, -3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qchisq(0, 1, -Inf) [1] NaN Warning message: In qchisq(0, 1, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qchisq(0, 1, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qchisq(0, 1, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qchisq(0, 1, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qchisq(0, Inf, 1) [1] NaN Warning message: In qchisq(0, Inf, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qchisq(0, NaN, 1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(Inf, 1, 1) [1] NaN Warning message: In qchisq(Inf, 1, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(NaN, 1, 1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.13e-8, 1, lower.tail=F, log.p=F) [1] Inf 3.884902e+02 3.497948e+00 1.948256e-308 2.185051e-308 [6] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.13e-8, 1, lower.tail=T, log.p=F) [1] 0.000000e+00 1.483383e-308 1.540690e-308 1.948256e-308 7.012971e-01 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1, 0.13e-8, lower.tail=F, log.p=F) [1] Inf 354.6100738 2.7055435 0.4549364 0.1484719 0.0000000 [7] 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1, 0.13e-8, lower.tail=T, log.p=F) [1] 0.000000e+00 2.770885e-157 1.579077e-02 4.549364e-01 1.074194e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1, 1, lower.tail=F, log.p=F) [1] Inf 391.6893093 5.2187941 1.1036433 0.3860691 0.0000000 [7] 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1, 1, lower.tail=T, log.p=F) [1] 0.000000e+00 7.532046e-157 4.270125e-02 1.103643e+00 2.372806e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 420, 4, lower.tail=F, log.p=F) [1] Inf 1232.0142 461.9006 423.3273 408.1833 0.0000 0.0000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 420, 4, lower.tail=T, log.p=F) [1] 0.00000 81.30876 386.96380 423.32729 438.84130 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.13e-8, 1, lower.tail=F, log.p=T) [1] Inf 3.884902e+02 3.497948e+00 1.948256e-308 2.185051e-308 [6] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.13e-8, 1, lower.tail=T, log.p=T) [1] 0.000000e+00 1.483383e-308 1.540690e-308 1.948256e-308 7.012971e-01 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1, 0.13e-8, lower.tail=F, log.p=T) [1] Inf 354.6100738 2.7055435 0.4549364 0.1484719 0.0000000 [7] 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1, 0.13e-8, lower.tail=T, log.p=T) [1] 0.000000e+00 2.770885e-157 1.579077e-02 4.549364e-01 1.074194e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1, 1, lower.tail=F, log.p=T) [1] Inf 391.6893093 5.2187941 1.1036433 0.3860691 0.0000000 [7] 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1, 1, lower.tail=T, log.p=T) [1] 0.000000e+00 7.532046e-157 4.270125e-02 1.103643e+00 2.372806e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 420, 4, lower.tail=F, log.p=T) [1] Inf 1232.0142 461.9006 423.3273 408.1833 0.0000 0.0000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qchisq(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 420, 4, lower.tail=T, log.p=T) [1] 0.00000 81.30876 386.96380 423.32729 438.84130 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(-0.42e-38, 13e-20) [1] NaN Warning message: In qexp(-4.2e-39, 1.3e-19) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(-42, 13e-20) [1] NaN Warning message: In qexp(-42, 1.3e-19) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(-Inf, 13e-20) [1] NaN Warning message: In qexp(-Inf, 1.3e-19) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qexp(0, -1) [1] NaN Warning message: In qexp(0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qexp(0, -Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qexp(0, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qexp(0, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qexp(0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(Inf, 13e-20) [1] NaN Warning message: In qexp(Inf, 1.3e-19) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(NaN, 13e-20) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 13e-20, lower.tail=F, log.p=F) [1] Inf 1.388224e+21 1.771219e+19 5.331901e+18 2.743653e+18 [6] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 13e-20, lower.tail=T, log.p=F) [1] 0.000000e+00 3.230769e-60 8.104655e+17 5.331901e+18 9.261329e+18 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 42, lower.tail=F, log.p=F) [1] Inf 4.296884234 0.054823455 0.016503504 0.008492261 0.000000000 [7] 0.000000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 42, lower.tail=T, log.p=F) [1] 0.000000e+00 1.000000e-80 2.508584e-03 1.650350e-02 2.866602e-02 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 42e123, lower.tail=F, log.p=F) [1] Inf 4.296884e-123 5.482345e-125 1.650350e-125 8.492261e-126 [6] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 42e123, lower.tail=T, log.p=F) [1] 0.000000e+00 1.000000e-203 2.508584e-126 1.650350e-125 2.866602e-125 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 13e-20, lower.tail=F, log.p=T) [1] Inf 1.388224e+21 1.771219e+19 5.331901e+18 2.743653e+18 [6] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 13e-20, lower.tail=T, log.p=T) [1] 0.000000e+00 3.230769e-60 8.104655e+17 5.331901e+18 9.261329e+18 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 42, lower.tail=F, log.p=T) [1] Inf 4.296884234 0.054823455 0.016503504 0.008492261 0.000000000 [7] 0.000000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 42, lower.tail=T, log.p=T) [1] 0.000000e+00 1.000000e-80 2.508584e-03 1.650350e-02 2.866602e-02 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 42e123, lower.tail=F, log.p=T) [1] Inf 4.296884e-123 5.482345e-125 1.650350e-125 8.492261e-126 [6] 0.000000e+00 0.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qexp(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 42e123, lower.tail=T, log.p=T) [1] 0.000000e+00 1.000000e-203 2.508584e-126 1.650350e-125 2.866602e-125 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(-0.42e-38, 5, 5, 5) [1] NaN Warning message: In qf(-4.2e-39, 5, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(-42, 5, 5, 5) [1] NaN Warning message: In qf(-42, 5, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(-Inf, 5, 5, 5) [1] NaN Warning message: In qf(-Inf, 5, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, -1, 5, 5) [1] NaN Warning message: In qf(0, -1, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, -Inf, 5, 5) [1] NaN Warning message: In qf(0, -Inf, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 0, 5, 5) [1] NaN Warning message: In qf(0, 0, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 5, 5, -1) [1] NaN Warning message: In qf(0, 5, 5, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 5, 5, -Inf) [1] NaN Warning message: In qf(0, 5, 5, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 5, 5, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 5, 5, Inf) [1] NaN Warning message: In qf(0, 5, 5, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 5, 5, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 5, -1, 5) [1] NaN Warning message: In qf(0, 5, -1, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 5, -Inf, 5) [1] NaN Warning message: In qf(0, 5, -Inf, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 5, 0, 5) [1] NaN Warning message: In qf(0, 5, 0, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 5, Inf, 5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, 5, NaN, 5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, Inf, 5, 5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qf(0, NaN, 5, 5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(Inf, 5, 5, 5) [1] NaN Warning message: In qf(Inf, 5, 5, 5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(NaN, 5, 5, 5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.12e-10, 6, 31e10, lower.tail=F, log.p=F) [1] Inf Inf 7.505999e+26 7.505999e+26 7.505999e+26 [6] 0.000000e+00 0.000000e+00 There were 50 or more warnings (use warnings() to see the first 50) ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.12e-10, 6, 31e10, lower.tail=T, log.p=F) [1] 0.000000e+00 5.090863e+20 7.505999e+26 7.505999e+26 7.505999e+26 [6] Inf Inf There were 50 or more warnings (use warnings() to see the first 50) ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 5, 0.12e-10, 5, lower.tail=F, log.p=F) [1] Inf Inf 3602.88 3602.88 3602.88 0.00 0.00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 5, 0.12e-10, 5, lower.tail=T, log.p=F) [1] 0.000000e+00 1.293365e-38 3.602880e+03 3.602880e+03 3.602880e+03 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 5, 5, 5, lower.tail=F, log.p=F) [1] Inf Inf 6.772533 2.075393 1.308959 0.000000 0.000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 5, 5, 5, lower.tail=T, log.p=F) [1] 0.000000e+00 6.160198e-32 6.602106e-01 2.075393e+00 3.312503e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 5, 6, 0.12e-10, lower.tail=F, log.p=F) [1] Inf Inf 3.1075117 0.9765364 0.6067423 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 5, 6, 0.12e-10, lower.tail=T, log.p=F) [1] 0.000000e+00 2.344125e-32 2.937283e-01 9.765364e-01 1.560462e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.12e-10, 6, 31e10, lower.tail=F, log.p=T) [1] Inf Inf 7.505999e+26 7.505999e+26 7.505999e+26 [6] 0.000000e+00 0.000000e+00 There were 50 or more warnings (use warnings() to see the first 50) ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.12e-10, 6, 31e10, lower.tail=T, log.p=T) [1] 0.000000e+00 5.090863e+20 7.505999e+26 7.505999e+26 7.505999e+26 [6] Inf Inf There were 50 or more warnings (use warnings() to see the first 50) ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 5, 0.12e-10, 5, lower.tail=F, log.p=T) [1] Inf Inf 3602.88 3602.88 3602.88 0.00 0.00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 5, 0.12e-10, 5, lower.tail=T, log.p=T) [1] 0.000000e+00 1.293365e-38 3.602880e+03 3.602880e+03 3.602880e+03 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 5, 5, 5, lower.tail=F, log.p=T) [1] Inf Inf 6.772533 2.075393 1.308959 0.000000 0.000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 5, 5, 5, lower.tail=T, log.p=T) [1] 0.000000e+00 6.160198e-32 6.602106e-01 2.075393e+00 3.312503e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 5, 6, 0.12e-10, lower.tail=F, log.p=T) [1] Inf Inf 3.1075117 0.9765364 0.6067423 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qf(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 5, 6, 0.12e-10, lower.tail=T, log.p=T) [1] 0.000000e+00 2.344125e-32 2.937283e-01 9.765364e-01 1.560462e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(-0.42e-38, 1, scale=2) [1] NaN Warning message: In qgamma(-4.2e-39, 1, scale = 2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(-42, 1, scale=2) [1] NaN Warning message: In qgamma(-42, 1, scale = 2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(-Inf, 1, scale=2) [1] NaN Warning message: In qgamma(-Inf, 1, scale = 2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qgamma(0, -1, scale=2) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qgamma(0, -Inf, scale=2) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qgamma(0, 0, scale=2) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qgamma(0, 1, -1) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qgamma(0, 1, -Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qgamma(0, 1, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qgamma(0, 1, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qgamma(0, 1, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qgamma(0, Inf, scale=2) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qgamma(0, NaN, scale=2) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(Inf, 1, scale=2) [1] NaN Warning message: In qgamma(Inf, 1, scale = 2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(NaN, 1, scale=2) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1, scale=2, lower.tail=F, log.p=F) [1] Inf 360.9382756 4.6051702 1.3862944 0.7133499 0.0000000 [7] 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1, scale=2, lower.tail=T, log.p=F) [1] 0.000000e+00 8.400000e-79 2.107210e-01 1.386294e+00 2.407946e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 11e11, scale=23e-11, lower.tail=F, log.p=F) [1] Inf 253.0045 253.0003 253.0000 252.9999 0.0000 0.0000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 11e11, scale=23e-11, lower.tail=T, log.p=F) [1] 0.0000 252.9955 252.9997 253.0000 253.0001 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1, scale=2, lower.tail=F, log.p=T) [1] Inf 360.9382756 4.6051702 1.3862944 0.7133499 0.0000000 [7] 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1, scale=2, lower.tail=T, log.p=T) [1] 0.000000e+00 8.400000e-79 2.107210e-01 1.386294e+00 2.407946e+00 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 11e11, scale=23e-11, lower.tail=F, log.p=T) [1] Inf 253.0045 253.0003 253.0000 252.9999 0.0000 0.0000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qgamma(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 11e11, scale=23e-11, lower.tail=T, log.p=T) [1] 0.0000 252.9955 252.9997 253.0000 253.0001 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(-0.42e-38, 7, 11, 4) [1] NaN Warning message: In qhyper(-4.2e-39, 7, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(-42, 7, 11, 4) [1] NaN Warning message: In qhyper(-42, 7, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(-Inf, 7, 11, 4) [1] NaN Warning message: In qhyper(-Inf, 7, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, -10, 11, 4) [1] NaN Warning message: In qhyper(0, -10, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, -Inf, 11, 4) [1] NaN Warning message: In qhyper(0, -Inf, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 0.3, 11, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 7, 11, -10) [1] NaN Warning message: In qhyper(0, 7, 11, -10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 7, 11, -Inf) [1] NaN Warning message: In qhyper(0, 7, 11, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 7, 11, 0.3) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 7, 11, Inf) [1] NaN Warning message: In qhyper(0, 7, 11, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 7, 11, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 7, -10, 4) [1] NaN Warning message: In qhyper(0, 7, -10, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 7, -Inf, 4) [1] NaN Warning message: In qhyper(0, 7, -Inf, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 7, 0.3, 4) [1] 4 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 7, Inf, 4) [1] NaN Warning message: In qhyper(0, 7, Inf, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, 7, NaN, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, Inf, 11, 4) [1] NaN Warning message: In qhyper(0, Inf, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qhyper(0, NaN, 11, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(Inf, 7, 11, 4) [1] NaN Warning message: In qhyper(Inf, 7, 11, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(NaN, 7, 11, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 11, 7e12, 7, lower.tail=F, log.p=F) [1] 7 1 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 11, 7e12, 7, lower.tail=T, log.p=F) [1] 0 0 0 0 0 7 7 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 3, 4, 10, lower.tail=F, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qhyper(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 3, 4, 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 3, 4, 10, lower.tail=T, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qhyper(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 3, 4, 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 5, 5, 5, lower.tail=F, log.p=F) [1] 5 5 4 2 2 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 5, 5, 5, lower.tail=T, log.p=F) [1] 0 0 1 2 3 5 5 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7, 11, 12, lower.tail=F, log.p=F) [1] 7 7 6 5 4 1 1 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7, 11, 12, lower.tail=T, log.p=F) [1] 1 1 3 5 5 7 7 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7, 11, 4, lower.tail=F, log.p=F) [1] 4 4 3 2 1 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7, 11, 4, lower.tail=T, log.p=F) [1] 0 0 0 2 2 4 4 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7e12, 11, 4, lower.tail=F, log.p=F) [1] 4 4 4 4 4 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 7e12, 11, 4, lower.tail=T, log.p=F) [1] 0 0 4 4 4 4 4 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 11, 7e12, 7, lower.tail=F, log.p=T) [1] NaN 1 0 0 0 0 0 Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 11, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 11, 7e12, 7, lower.tail=T, log.p=T) [1] NaN 0 0 0 0 7 7 Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 11, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 3, 4, 10, lower.tail=F, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 3, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 3, 4, 10, lower.tail=T, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 3, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 5, 5, 5, lower.tail=F, log.p=T) [1] NaN 5 4 2 2 0 0 Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 5, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 5, 5, 5, lower.tail=T, log.p=T) [1] NaN 0 1 2 3 5 5 Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 5, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7, 11, 12, lower.tail=F, log.p=T) [1] NaN 7 6 5 4 1 1 Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 7, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7, 11, 12, lower.tail=T, log.p=T) [1] NaN 1 3 5 5 7 7 Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 7, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7, 11, 4, lower.tail=F, log.p=T) [1] NaN 4 3 2 1 0 0 Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 7, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7, 11, 4, lower.tail=T, log.p=T) [1] NaN 0 0 2 2 4 4 Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 7, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7e12, 11, 4, lower.tail=F, log.p=T) [1] NaN 4 4 4 4 0 0 Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 7e+12, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qhyper(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 7e12, 11, 4, lower.tail=T, log.p=T) [1] NaN 0 4 4 4 4 4 Warning message: In qhyper(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 7e+12, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(-0.42e-38, 10, 0.33) [1] NaN Warning message: In qnbinom(-4.2e-39, 10, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(-42, 10, 0.33) [1] NaN Warning message: In qnbinom(-42, 10, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(-Inf, 10, 0.33) [1] NaN Warning message: In qnbinom(-Inf, 10, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnbinom(0, -2, 0.33) [1] NaN Warning message: In qnbinom(0, -2, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnbinom(0, -Inf, 0.33) [1] NaN Warning message: In qnbinom(0, -Inf, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnbinom(0, 10, -2) [1] NaN Warning message: In qnbinom(0, 10, -2) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnbinom(0, 10, -Inf) [1] NaN Warning message: In qnbinom(0, 10, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnbinom(0, 10, Inf) [1] NaN Warning message: In qnbinom(0, 10, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnbinom(0, 10, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnbinom(0, Inf, 0.33) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnbinom(0, NaN, 0.33) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(Inf, 10, 0.33) [1] NaN Warning message: In qnbinom(Inf, 10, 0.33) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(NaN, 10, 0.33) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, -0.1, lower.tail=F, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qnbinom(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, -0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, -0.1, lower.tail=T, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qnbinom(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, -0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 0.33, lower.tail=F, log.p=F) [1] Inf 0 31 19 16 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 0.33, lower.tail=T, log.p=F) [1] 0 0 11 19 24 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 5, lower.tail=F, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qnbinom(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, 5, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 5, lower.tail=T, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qnbinom(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, 5, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, mu=60, lower.tail=F, log.p=F) [1] Inf 0 87 58 48 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, mu=60, lower.tail=T, log.p=F) [1] 0 0 36 58 69 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10.3, 0.4, lower.tail=F, log.p=F) [1] Inf 0 24 15 12 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10.3, 0.4, lower.tail=T, log.p=F) [1] 0 0 8 15 18 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1000, 0.5, lower.tail=F, log.p=F) [1] Inf 0 1058 999 976 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1000, 0.5, lower.tail=T, log.p=F) [1] 0 330 943 999 1023 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1000, mu=10, lower.tail=F, log.p=F) [1] Inf 0 14 10 8 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1000, mu=10, lower.tail=T, log.p=F) [1] 0 0 6 10 12 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, -0.1, lower.tail=F, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qnbinom(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, -0.1, lower.tail=T, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qnbinom(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 0.33, lower.tail=F, log.p=T) [1] Inf Inf 31 19 16 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 0.33, lower.tail=T, log.p=T) [1] 0 0 11 19 24 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 5, lower.tail=F, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qnbinom(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 5, lower.tail=T, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qnbinom(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, mu=60, lower.tail=F, log.p=T) [1] Inf Inf 87 58 48 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, mu=60, lower.tail=T, log.p=T) [1] 0 0 36 58 69 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10.3, 0.4, lower.tail=F, log.p=T) [1] Inf Inf 24 15 12 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10.3, 0.4, lower.tail=T, log.p=T) [1] 0 0 8 15 18 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1000, 0.5, lower.tail=F, log.p=T) [1] Inf Inf 1058 999 976 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1000, 0.5, lower.tail=T, log.p=T) [1] 0 330 943 999 1023 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1000, mu=10, lower.tail=F, log.p=T) [1] Inf Inf 14 10 8 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnbinom(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1000, mu=10, lower.tail=T, log.p=T) [1] 0 0 6 10 12 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(-0.42e-38, 0, -1) [1] NaN Warning message: In qnorm(-4.2e-39, 0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(-42, 0, -1) [1] NaN Warning message: In qnorm(-42, 0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(-Inf, 0, -1) [1] NaN Warning message: In qnorm(-Inf, 0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnorm(0, -Inf, -1) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnorm(0, 0, -Inf) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnorm(0, 0, Inf) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnorm(0, 0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnorm(0, Inf, -1) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qnorm(0, NaN, -1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(Inf, 0, -1) [1] NaN Warning message: In qnorm(Inf, 0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(NaN, 0, -1) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0, -1, lower.tail=F, log.p=F) [1] Inf NaN NaN NaN NaN -Inf -Inf Warning message: In qnorm(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 0, -1, lower.tail = F, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0, -1, lower.tail=T, log.p=F) [1] -Inf NaN NaN NaN NaN Inf Inf Warning message: In qnorm(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 0, -1, lower.tail = T, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0, 0, lower.tail=F, log.p=F) [1] Inf 0 0 0 0 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0, 0, lower.tail=T, log.p=F) [1] -Inf 0 0 0 0 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 4, 4, lower.tail=F, log.p=F) [1] Inf 79.177408 9.126206 4.000000 1.902398 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 4, 4, lower.tail=T, log.p=F) [1] -Inf -71.177408 -1.126206 4.000000 6.097602 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0, -1, lower.tail=F, log.p=T) [1] Inf NaN NaN NaN NaN -Inf -Inf Warning message: In qnorm(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 0, -1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0, -1, lower.tail=T, log.p=T) [1] -Inf NaN NaN NaN NaN Inf Inf Warning message: In qnorm(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 0, -1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0, 0, lower.tail=F, log.p=T) [1] Inf 0 0 0 0 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0, 0, lower.tail=T, log.p=T) [1] -Inf 0 0 0 0 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 4, 4, lower.tail=F, log.p=T) [1] Inf 79.177408 9.126206 4.000000 1.902398 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qnorm(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 4, 4, lower.tail=T, log.p=T) [1] -Inf -71.177408 -1.126206 4.000000 6.097602 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(-0.42e-38, 10) [1] NaN Warning message: In qpois(-4.2e-39, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(-42, 10) [1] NaN Warning message: In qpois(-42, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(-Inf, 10) [1] NaN Warning message: In qpois(-Inf, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qpois(0, -1) [1] NaN Warning message: In qpois(0, -1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qpois(0, -Inf) [1] NaN Warning message: In qpois(0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qpois(0, 0) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qpois(0, Inf) [1] NaN Warning message: In qpois(0, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qpois(0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(Inf, 10) [1] NaN Warning message: In qpois(Inf, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(NaN, 10) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.1e-6, lower.tail=F, log.p=F) [1] Inf Inf 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.1e-6, lower.tail=T, log.p=F) [1] 0 0 0 0 0 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, lower.tail=F, log.p=F) [1] Inf Inf 14 10 8 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, lower.tail=T, log.p=F) [1] 0 0 6 10 12 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1e100, lower.tail=F, log.p=F) [1] Inf Inf 1e+100 1e+100 1e+100 0e+00 0e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1e100, lower.tail=T, log.p=F) [1] 0e+00 1e+100 1e+100 1e+100 1e+100 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.1e-6, lower.tail=F, log.p=T) [1] Inf Inf 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.1e-6, lower.tail=T, log.p=T) [1] 0 0 0 0 0 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, lower.tail=F, log.p=T) [1] Inf Inf 14 10 8 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, lower.tail=T, log.p=T) [1] 0 0 6 10 12 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1e100, lower.tail=F, log.p=T) [1] Inf Inf 1e+100 1e+100 1e+100 0e+00 0e+00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qpois(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1e100, lower.tail=T, log.p=T) [1] 0e+00 1e+100 1e+100 1e+100 1e+100 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(-0.42e-38, 10) [1] NaN Warning message: In qsignrank(-4.2e-39, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(-42, 10) [1] NaN Warning message: In qsignrank(-42, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(-Inf, 10) [1] NaN Warning message: In qsignrank(-Inf, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qsignrank(0, -3) [1] NaN Warning message: In qsignrank(0, -3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qsignrank(0, -Inf) [1] NaN Warning message: In qsignrank(0, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qsignrank(0, 0) [1] NaN Warning message: In qsignrank(0, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qsignrank(0, Inf) [1] NaN Warning message: In qsignrank(0, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qsignrank(0, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(Inf, 10) [1] NaN Warning message: In qsignrank(Inf, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(NaN, 10) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, lower.tail=F, log.p=F) [1] 55 55 40 27 22 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, lower.tail=T, log.p=F) [1] 0 0 15 27 33 55 55 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 5.5, lower.tail=F, log.p=F) [1] 21 21 17 10 8 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 5.5, lower.tail=T, log.p=F) [1] 0 0 4 10 13 21 21 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, lower.tail=F, log.p=T) [1] NaN 55 40 27 22 0 0 Warning message: In qsignrank(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, lower.tail=T, log.p=T) [1] NaN 0 15 27 33 55 55 Warning message: In qsignrank(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 5.5, lower.tail=F, log.p=T) [1] NaN 21 17 10 8 0 0 Warning message: In qsignrank(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qsignrank(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 5.5, lower.tail=T, log.p=T) [1] NaN 0 4 10 13 21 21 Warning message: In qsignrank(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(-0.42e-38, 3e100, ncp=0.5) [1] NaN Warning message: In qt(-4.2e-39, 3e+100, ncp = 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(-42, 3e100, ncp=0.5) [1] NaN Warning message: In qt(-42, 3e+100, ncp = 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(-Inf, 3e100, ncp=0.5) [1] NaN Warning message: In qt(-Inf, 3e+100, ncp = 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qt(0, -Inf, ncp=0.5) [1] NaN Warning message: In qt(0, -Inf, ncp = 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qt(0, 3e100, -Inf) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qt(0, 3e100, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qt(0, NaN, ncp=0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(Inf, 3e100, ncp=0.5) [1] NaN Warning message: In qt(Inf, 3e+100, ncp = 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(NaN, 3e100, ncp=0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), -10, ncp=2, lower.tail=F, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qt(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), -10, ncp = 2, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), -10, ncp=2, lower.tail=T, log.p=F) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qt(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), -10, ncp = 2, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 3e100, ncp=0.5, lower.tail=F, log.p=F) [1] Inf Inf 1.78155157 0.50000000 -0.02440051 -Inf [7] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 3e100, ncp=0.5, lower.tail=T, log.p=F) [1] -Inf -18.2943519 -0.7815516 0.5000000 1.0244005 Inf [7] Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), Inf, ncp=-1, lower.tail=F, log.p=F) [1] Inf 17.7943519 0.2815516 -1.0000000 -1.5244005 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), Inf, ncp=-1, lower.tail=T, log.p=F) [1] -Inf -19.7943519 -2.2815516 -1.0000000 -0.4755995 Inf [7] Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), -10, ncp=2, lower.tail=F, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qt(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), -10, ncp = 2, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), -10, ncp=2, lower.tail=T, log.p=T) [1] NaN NaN NaN NaN NaN NaN NaN Warning message: In qt(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), -10, ncp = 2, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 3e100, ncp=0.5, lower.tail=F, log.p=T) [1] Inf Inf 1.78155157 0.50000000 -0.02440051 -Inf [7] -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 3e100, ncp=0.5, lower.tail=T, log.p=T) [1] -Inf -18.2943519 -0.7815516 0.5000000 1.0244005 Inf [7] Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), Inf, ncp=-1, lower.tail=F, log.p=T) [1] Inf 17.7943519 0.2815516 -1.0000000 -1.5244005 -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qt(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), Inf, ncp=-1, lower.tail=T, log.p=T) [1] -Inf -19.7943519 -2.2815516 -1.0000000 -0.4755995 Inf [7] Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qtukey(-0.42e-38, 10, 5, 4) [1] NaN Warning message: In qtukey(-4.2e-39, 10, 5, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qtukey(-42, 10, 5, 4) [1] NaN Warning message: In qtukey(-42, 10, 5, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qtukey(-Inf, 10, 5, 4) [1] NaN Warning message: In qtukey(-Inf, 10, 5, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, -10, 5, 4) [1] NaN Warning message: In qtukey(0, -10, 5, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, -Inf, 5, 4) [1] NaN Warning message: In qtukey(0, -Inf, 5, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 0, 5, 4) [1] NaN Warning message: In qtukey(0, 0, 5, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 1, 5, 4) [1] NaN Warning message: In qtukey(0, 1, 5, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, 5, -10) [1] NaN Warning message: In qtukey(0, 10, 5, -10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, 5, -Inf) [1] NaN Warning message: In qtukey(0, 10, 5, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, 5, 0) [1] NaN Warning message: In qtukey(0, 10, 5, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, 5, 1) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, 5, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, 5, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, -10, 4) [1] NaN Warning message: In qtukey(0, 10, -10, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, -Inf, 4) [1] NaN Warning message: In qtukey(0, 10, -Inf, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, 0, 4) [1] NaN Warning message: In qtukey(0, 10, 0, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, 1, 4) [1] NaN Warning message: In qtukey(0, 10, 1, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, Inf, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, 10, NaN, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, Inf, 5, 4) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qtukey(0, NaN, 5, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qtukey(Inf, 10, 5, 4) [1] NaN Warning message: In qtukey(Inf, 10, 5, 4) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qtukey(NaN, 10, 5, 4) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qtukey(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 5, 4, lower.tail=F, log.p=F) [1] Inf NaN 7.124296 4.179388 3.465450 0.000000 0.000000 Warning messages: 1: In qtukey(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, 5, 4, : convergence failed in 'qtukey' 2: In qtukey(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, 5, 4, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qtukey(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 5, 4, lower.tail=T, log.p=F) [1] 0.0000000 0.6000925 NaN 4.1793878 5.1226189 Inf Inf Warning messages: 1: In qtukey(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, 5, 4, : convergence failed in 'qtukey' 2: In qtukey(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1), 10, 5, 4, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qtukey(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 5, 4, lower.tail=F, log.p=T) [1] Inf NaN 7.124296 4.179388 3.465450 0.000000 0.000000 Warning messages: 1: In qtukey(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : convergence failed in 'qtukey' 2: In qtukey(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qtukey(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 5, 4, lower.tail=T, log.p=T) [1] 0.0000000 0.6000925 NaN 4.1793878 5.1226189 Inf Inf Warning messages: 1: In qtukey(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : convergence failed in 'qtukey' 2: In qtukey(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qunif(-0.42e-38, -3, 3.3) [1] NaN Warning message: In qunif(-4.2e-39, -3, 3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qunif(-42, -3, 3.3) [1] NaN Warning message: In qunif(-42, -3, 3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qunif(-Inf, -3, 3.3) [1] NaN Warning message: In qunif(-Inf, -3, 3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qunif(0, -3, -Inf) [1] NaN Warning message: In qunif(0, -3, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qunif(0, -3, Inf) [1] NaN Warning message: In qunif(0, -3, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qunif(0, -3, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qunif(0, -Inf, 3.3) [1] NaN Warning message: In qunif(0, -Inf, 3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qunif(0, Inf, 3.3) [1] NaN Warning message: In qunif(0, Inf, 3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qunif(0, NaN, 3.3) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qunif(Inf, -3, 3.3) [1] NaN Warning message: In qunif(Inf, -3, 3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qunif(NaN, -3, 3.3) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qunif(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), -3, 3.3, lower.tail=F, log.p=F) [1] 3.30 3.30 2.67 0.15 -1.11 -3.00 -3.00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qunif(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), -3, 3.3, lower.tail=T, log.p=F) [1] -3.00 -3.00 -2.37 0.15 1.41 3.30 3.30 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qunif(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), -3, 3.3, lower.tail=F, log.p=T) [1] 3.30 3.30 2.67 0.15 -1.11 -3.00 -3.00 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qunif(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), -3, 3.3, lower.tail=T, log.p=T) [1] -3.00 -3.00 -2.37 0.15 1.41 3.30 3.30 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(-0.42e-38, 1, 0.5) [1] NaN Warning message: In qweibull(-4.2e-39, 1, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(-42, 1, 0.5) [1] NaN Warning message: In qweibull(-42, 1, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(-Inf, 1, 0.5) [1] NaN Warning message: In qweibull(-Inf, 1, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qweibull(0, -3.3, 0.5) [1] NaN Warning message: In qweibull(0, -3.3, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qweibull(0, -Inf, 0.5) [1] NaN Warning message: In qweibull(0, -Inf, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qweibull(0, 0, 0.5) [1] NaN Warning message: In qweibull(0, 0, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qweibull(0, 1, -3.3) [1] NaN Warning message: In qweibull(0, 1, -3.3) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qweibull(0, 1, -Inf) [1] NaN Warning message: In qweibull(0, 1, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qweibull(0, 1, 0) [1] NaN Warning message: In qweibull(0, 1, 0) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qweibull(0, 1, Inf) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qweibull(0, 1, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qweibull(0, Inf, 0.5) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qweibull(0, NaN, 0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(Inf, 1, 0.5) [1] NaN Warning message: In qweibull(Inf, 1, 0.5) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(NaN, 1, 0.5) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.5, 10, lower.tail=F, log.p=F) [1] Inf 325691.09706 53.01898 4.80453 1.27217 [6] 0.00000 0.00000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 0.5, 10, lower.tail=T, log.p=F) [1] 0.000000e+00 1.764000e-156 1.110084e-01 4.804530e+00 1.449551e+01 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1, 0.5, lower.tail=F, log.p=F) [1] Inf 90.2345689 1.1512925 0.3465736 0.1783375 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1, 0.5, lower.tail=T, log.p=F) [1] 0.000000e+00 2.100000e-79 5.268026e-02 3.465736e-01 6.019864e-01 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1e100, 1, lower.tail=F, log.p=F) [1] Inf 1 1 1 1 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 1e100, 1, lower.tail=T, log.p=F) [1] 0 1 1 1 1 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.5, 10, lower.tail=F, log.p=T) [1] Inf 325691.09706 53.01898 4.80453 1.27217 [6] 0.00000 0.00000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 0.5, 10, lower.tail=T, log.p=T) [1] 0.000000e+00 1.764000e-156 1.110084e-01 4.804530e+00 1.449551e+01 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1, 0.5, lower.tail=F, log.p=T) [1] Inf 90.2345689 1.1512925 0.3465736 0.1783375 0.0000000 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1, 0.5, lower.tail=T, log.p=T) [1] 0.000000e+00 2.100000e-79 5.268026e-02 3.465736e-01 6.019864e-01 [6] Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1e100, 1, lower.tail=F, log.p=T) [1] Inf 1 1 1 1 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qweibull(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 1e100, 1, lower.tail=T, log.p=T) [1] 0 1 1 1 1 Inf Inf ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(-0.42e-38, 10, 10) [1] NaN Warning message: In qwilcox(-4.2e-39, 10, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(-42, 10, 10) [1] NaN Warning message: In qwilcox(-42, 10, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(-Inf, 10, 10) [1] NaN Warning message: In qwilcox(-Inf, 10, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qwilcox(0, -Inf, 10) [1] NaN Warning message: In qwilcox(0, -Inf, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qwilcox(0, 10, -Inf) [1] NaN Warning message: In qwilcox(0, 10, -Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qwilcox(0, 10, Inf) [1] NaN Warning message: In qwilcox(0, 10, Inf) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qwilcox(0, 10, NaN) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qwilcox(0, Inf, 10) [1] NaN Warning message: In qwilcox(0, Inf, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Ignored.ImplementationError#Output.MayIgnoreWarningContext# #qwilcox(0, NaN, 10) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(Inf, 10, 10) [1] NaN Warning message: In qwilcox(Inf, 10, 10) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(NaN, 10, 10) [1] NaN ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 10, lower.tail=F, log.p=F) [1] 100 100 67 50 43 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 10, 10, lower.tail=T, log.p=F) [1] 0 0 33 50 57 100 100 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 4, 7, lower.tail=F, log.p=F) [1] 28 28 21 14 11 0 0 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1), 4, 7, lower.tail=T, log.p=F) [1] 0 0 7 14 17 28 28 ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 10, lower.tail=F, log.p=T) [1] NaN 100 67 50 43 0 0 Warning message: In qwilcox(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 10, 10, lower.tail=T, log.p=T) [1] NaN 0 33 50 57 100 100 Warning message: In qwilcox(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 10, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 4, 7, lower.tail=F, log.p=T) [1] NaN 28 21 14 11 0 0 Warning message: In qwilcox(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 4, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributions.testQuantileFunctions#Output.MayIgnoreWarningContext# #qwilcox(log(c(0, 42e-80, 0.1, 0.5, 0.7, 1-42e-80, 1)), 4, 7, lower.tail=T, log.p=T) [1] NaN 0 7 14 17 28 28 Warning message: In qwilcox(log(c(0, 4.2e-79, 0.1, 0.5, 0.7, 1 - 4.2e-79, 1)), 4, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestDistributionsSpecialCases.test# #pgamma(8.98737230018e+307, 1.12432027475e+308, 1, lower.tail=F) [1] 1 ##com.oracle.truffle.r.test.library.stats.TestDistributionsSpecialCases.test# #qnbinom(3.1471252498071100763e-05, 425.56250000596048721, mu=121241.593505859375, lower.tail=F, log.p=F) [1] 146242 ##com.oracle.truffle.r.test.library.stats.TestDistributionsSpecialCases.test# #qt(0.8312011718749999778, 5.42101086242752217e-20, 34.00390632153467152, lower.tail=T, log.p=F) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestDistributionsSpecialCases.testAttributesTransfer# #dexp(structure(array(21:24, dim=c(2,2)), dimnames=list(a=c('a1','a2'),b=c('b1','b2')))) b a b1 b2 a1 7.582560e-10 1.026188e-10 a2 2.789468e-10 3.775135e-11 ##com.oracle.truffle.r.test.library.stats.TestExternal_BinDist.testBinDist# #.Call(stats:::C_BinDist, c('1','2','3'), c(4,5,6), 0, c(3, 4), c('5', '8')) [1] 0.000000 2.666667 3.000000 3.333333 6.000000 0.000000 0.000000 0.000000 [9] 0.000000 0.000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_BinDist.testBinDist# #.Call(stats:::C_BinDist, c(0,0,0), c(1,2,3), 1, 10, 10) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestExternal_BinDist.testBinDist# #.Call(stats:::C_BinDist, c(1,2,3), c(4,5,6), 0, 3, 5) [1] 0.000000 2.666667 3.000000 3.333333 6.000000 0.000000 0.000000 0.000000 [9] 0.000000 0.000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_BinDist.testBinDist# #.Call(stats:::C_BinDist, c(2.2,4,3), 5:7, -1, 5, 8) [1] 0.000000 0.000000 0.000000 1.333333 6.000000 5.666667 5.000000 0.000000 [9] 0.000000 0.000000 0.000000 0.000000 0.000000 0.000000 0.000000 0.000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_BinDist.testBinDistWrongArgs# #.Call(stats:::C_BinDist, 0, 0, 'string', 3, 5) [1] 0 0 0 0 0 0 0 0 0 0 Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.stats.TestExternal_BinDist.testBinDistWrongArgs# #.Call(stats:::C_BinDist, c(1,2,3), c(4,5,6), 0, 3, -5L) Error: invalid 'n' argument ##com.oracle.truffle.r.test.library.stats.TestExternal_BinDist.testBinDistWrongArgs# #.Call(stats:::C_BinDist, c(1,2,3), c(4,5,6), 0, 3, c(NA, 3L)) Error: invalid 'n' argument ##com.oracle.truffle.r.test.library.stats.TestExternal_R_getClassFromCache.testGetClassFromCache# #.Call(methods:::C_R_getClassFromCache, "", new.env()) Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.library.stats.TestExternal_R_getClassFromCache.testGetClassFromCache# #.Call(methods:::C_R_getClassFromCache, "aaa", NULL) Error: use of NULL environment is defunct ##com.oracle.truffle.r.test.library.stats.TestExternal_R_getClassFromCache.testGetClassFromCache# #.Call(methods:::C_R_getClassFromCache, "aaa", new.env()) NULL ##com.oracle.truffle.r.test.library.stats.TestExternal_R_getGeneric.testGetPrimName# #.Call(methods:::C_R_getGeneric,"aaa",TRUE,new.env(),"bbb") Error: no generic function definition found for 'aaa' in the supplied environment ##com.oracle.truffle.r.test.library.stats.TestExternal_R_getGeneric.testGetPrimName# #.Call(methods:::C_R_getGeneric,"aaa",TRUE,new.env(),NULL) Error: 'The argument "package" to getGeneric' must be a single string (got an object of class "NULL") ##com.oracle.truffle.r.test.library.stats.TestExternal_R_getGeneric.testGetPrimName# #.Call(methods:::C_R_getGeneric,NULL,TRUE,new.env(),"bbb") Error: 'The argument "f" to getGeneric' must be a single string (got an object of class "NULL") ##com.oracle.truffle.r.test.library.stats.TestExternal_R_getSlot.testGetPrimName# #.Call(methods:::C_R_get_slot,"","") Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.library.stats.TestExternal_R_getSlot.testGetPrimName# #.Call(methods:::C_R_get_slot,"",NULL) Error: invalid type or length for slot name ##com.oracle.truffle.r.test.library.stats.TestExternal_R_getSlot.testGetPrimName# #.Call(methods:::C_R_get_slot,"",c("a","b")) Error: invalid type or length for slot name ##com.oracle.truffle.r.test.library.stats.TestExternal_R_get_prim_name.testGetPrimName# #.Call(methods:::C_R_get_primname, "abc") Error: 'R_get_primname' called on a non-primitive ##com.oracle.truffle.r.test.library.stats.TestExternal_R_get_prim_name.testGetPrimName# #.Call(methods:::C_R_get_primname, 1) Error: 'R_get_primname' called on a non-primitive ##com.oracle.truffle.r.test.library.stats.TestExternal_R_get_prim_name.testGetPrimName# #.Call(methods:::C_R_get_primname, NULL) Error: 'R_get_primname' called on a non-primitive ##com.oracle.truffle.r.test.library.stats.TestExternal_R_get_prim_name.testGetPrimName# #.Call(methods:::C_R_get_primname, any) [1] "any" ##com.oracle.truffle.r.test.library.stats.TestExternal_R_set_method_dispatch.testSetMethodDispatch# #.Call(methods:::C_R_set_method_dispatch, 1) [1] TRUE ##com.oracle.truffle.r.test.library.stats.TestExternal_R_set_method_dispatch.testSetMethodDispatch# #.Call(methods:::C_R_set_method_dispatch, NULL) [1] TRUE ##com.oracle.truffle.r.test.library.stats.TestExternal_R_set_method_dispatch.testSetMethodDispatch# #.Call(methods:::C_R_set_method_dispatch, TRUE) [1] TRUE ##com.oracle.truffle.r.test.library.stats.TestExternal_Rmd5.testRmd5# #.Call(tools:::C_Rmd5, "abc") [1] NA ##com.oracle.truffle.r.test.library.stats.TestExternal_Rmd5.testRmd5# #.Call(tools:::C_Rmd5, 1) Error: argument 'files' must be character ##com.oracle.truffle.r.test.library.stats.TestExternal_Rmd5.testRmd5# #.Call(tools:::C_Rmd5, NULL) Error: argument 'files' must be character ##com.oracle.truffle.r.test.library.stats.TestExternal_Rmd5.testRmd5# #.Call(tools:::C_Rmd5, c("abc","xyz")) [1] NA NA ##com.oracle.truffle.r.test.library.stats.TestExternal_completecases.testCompleteCases# #stats::complete.cases(data.frame(col1=c(1,2,NA), col2=c(1,2,3))) [1] TRUE TRUE FALSE ##com.oracle.truffle.r.test.library.stats.TestExternal_completecases.testCompleteCases# #stats::complete.cases(data.frame(col1=c(1,2,NA), col2=c(1,2,3)), c(1,NA,2)) [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.library.stats.TestExternal_completecases.testCompleteCases# #stats::complete.cases(data.frame(col1=c(1,2,NA), col2=c(1,2,3)), data.frame(col1=c(1,NA,3), col2=c(1,2,3))) [1] TRUE FALSE FALSE ##com.oracle.truffle.r.test.library.stats.TestExternal_completecases.testCompleteCases# #stats::complete.cases(data.frame(col1=c(1,NA), col2=c(2,3)), matrix(c(1,NA,2,NA), nrow=2)) [1] TRUE FALSE ##com.oracle.truffle.r.test.library.stats.TestExternal_completecases.testCompleteCasesArgsValidation#Output.IgnoreErrorContext# #stats::complete.cases(data.frame(col1=c(1,2,NA), col2=c(1,2,3)), list(NA,2,2)) Error in stats::complete.cases(data.frame(col1 = c(1, 2, NA), col2 = c(1, : not all arguments have the same length ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='a', method='k') [1] -0.5477226 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='a', method='p') [1] -0.6024641 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='a', method='s') [1] -0.6324555 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='c', method='k') [1] -0.5477226 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='c', method='p') [1] -0.6024641 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='c', method='s') [1] -0.6324555 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='e', method='k') [1] -0.5477226 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='e', method='p') [1] -0.6024641 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='e', method='s') [1] -0.6324555 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='n', method='k') [1] -0.5477226 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='n', method='p') [1] -0.6024641 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='n', method='s') [1] -0.6324555 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='p', method='k') [1] -0.5477226 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='p', method='p') [1] -0.6024641 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(1:4, c(1,7,1,-4), use='p', method='s') [1] -0.6324555 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='a', method='k') mpg cyl disp hp mpg 1.0000000 -0.7953134 -0.7681311 -0.7428125 cyl -0.7953134 1.0000000 0.8144263 0.7851865 disp -0.7681311 0.8144263 1.0000000 0.6659987 hp -0.7428125 0.7851865 0.6659987 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='a', method='p') mpg cyl disp hp mpg 1.0000000 -0.8521620 -0.8475514 -0.7761684 cyl -0.8521620 1.0000000 0.9020329 0.8324475 disp -0.8475514 0.9020329 1.0000000 0.7909486 hp -0.7761684 0.8324475 0.7909486 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='a', method='s') mpg cyl disp hp mpg 1.0000000 -0.9108013 -0.9088824 -0.8946646 cyl -0.9108013 1.0000000 0.9276516 0.9017909 disp -0.9088824 0.9276516 1.0000000 0.8510426 hp -0.8946646 0.9017909 0.8510426 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='c', method='k') mpg cyl disp hp mpg 1.0000000 -0.7953134 -0.7681311 -0.7428125 cyl -0.7953134 1.0000000 0.8144263 0.7851865 disp -0.7681311 0.8144263 1.0000000 0.6659987 hp -0.7428125 0.7851865 0.6659987 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='c', method='p') mpg cyl disp hp mpg 1.0000000 -0.8521620 -0.8475514 -0.7761684 cyl -0.8521620 1.0000000 0.9020329 0.8324475 disp -0.8475514 0.9020329 1.0000000 0.7909486 hp -0.7761684 0.8324475 0.7909486 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='c', method='s') mpg cyl disp hp mpg 1.0000000 -0.9108013 -0.9088824 -0.8946646 cyl -0.9108013 1.0000000 0.9276516 0.9017909 disp -0.9088824 0.9276516 1.0000000 0.8510426 hp -0.8946646 0.9017909 0.8510426 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='e', method='k') mpg cyl disp hp mpg 1.0000000 -0.7953134 -0.7681311 -0.7428125 cyl -0.7953134 1.0000000 0.8144263 0.7851865 disp -0.7681311 0.8144263 1.0000000 0.6659987 hp -0.7428125 0.7851865 0.6659987 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='e', method='p') mpg cyl disp hp mpg 1.0000000 -0.8521620 -0.8475514 -0.7761684 cyl -0.8521620 1.0000000 0.9020329 0.8324475 disp -0.8475514 0.9020329 1.0000000 0.7909486 hp -0.7761684 0.8324475 0.7909486 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='e', method='s') mpg cyl disp hp mpg 1.0000000 -0.9108013 -0.9088824 -0.8946646 cyl -0.9108013 1.0000000 0.9276516 0.9017909 disp -0.9088824 0.9276516 1.0000000 0.8510426 hp -0.8946646 0.9017909 0.8510426 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='n', method='k') mpg cyl disp hp mpg 1.0000000 -0.7953134 -0.7681311 -0.7428125 cyl -0.7953134 1.0000000 0.8144263 0.7851865 disp -0.7681311 0.8144263 1.0000000 0.6659987 hp -0.7428125 0.7851865 0.6659987 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='n', method='p') mpg cyl disp hp mpg 1.0000000 -0.8521620 -0.8475514 -0.7761684 cyl -0.8521620 1.0000000 0.9020329 0.8324475 disp -0.8475514 0.9020329 1.0000000 0.7909486 hp -0.7761684 0.8324475 0.7909486 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='n', method='s') mpg cyl disp hp mpg 1.0000000 -0.9108013 -0.9088824 -0.8946646 cyl -0.9108013 1.0000000 0.9276516 0.9017909 disp -0.9088824 0.9276516 1.0000000 0.8510426 hp -0.8946646 0.9017909 0.8510426 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='p', method='k') mpg cyl disp hp mpg 1.0000000 -0.7953134 -0.7681311 -0.7428125 cyl -0.7953134 1.0000000 0.8144263 0.7851865 disp -0.7681311 0.8144263 1.0000000 0.6659987 hp -0.7428125 0.7851865 0.6659987 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='p', method='p') mpg cyl disp hp mpg 1.0000000 -0.8521620 -0.8475514 -0.7761684 cyl -0.8521620 1.0000000 0.9020329 0.8324475 disp -0.8475514 0.9020329 1.0000000 0.7909486 hp -0.7761684 0.8324475 0.7909486 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cor(mtcars[,1:4], use='p', method='s') mpg cyl disp hp mpg 1.0000000 -0.9108013 -0.9088824 -0.8946646 cyl -0.9108013 1.0000000 0.9276516 0.9017909 disp -0.9088824 0.9276516 1.0000000 0.8510426 hp -0.8946646 0.9017909 0.8510426 1.0000000 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='a', method='k') [1] -6 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='a', method='p') [1] -3.5 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='a', method='s') [1] -1 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='c', method='k') [1] -6 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='c', method='p') [1] -3.5 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='c', method='s') [1] -1 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='e', method='k') [1] -6 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='e', method='p') [1] -3.5 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='e', method='s') [1] -1 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='n', method='k') [1] -6 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='n', method='p') [1] -3.5 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(1:4, c(1,7,1,-4), use='n', method='s') [1] -1 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='a', method='k') mpg cyl disp hp mpg 978 -638 -752 -722 cyl -638 658 654 626 disp -752 654 980 648 hp -722 626 648 966 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='a', method='p') mpg cyl disp hp mpg 36.324103 -9.172379 -633.0972 -320.7321 cyl -9.172379 3.189516 199.6603 101.9315 disp -633.097208 199.660282 15360.7998 6721.1587 hp -320.732056 101.931452 6721.1587 4700.8669 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='a', method='s') mpg cyl disp hp mpg 87.88710 -74.54032 -79.87903 -78.56452 cyl -74.54032 76.20968 75.91935 73.74194 disp -79.87903 75.91935 87.88710 74.73387 hp -78.56452 73.74194 74.73387 87.74194 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='c', method='k') mpg cyl disp hp mpg 978 -638 -752 -722 cyl -638 658 654 626 disp -752 654 980 648 hp -722 626 648 966 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='c', method='p') mpg cyl disp hp mpg 36.324103 -9.172379 -633.0972 -320.7321 cyl -9.172379 3.189516 199.6603 101.9315 disp -633.097208 199.660282 15360.7998 6721.1587 hp -320.732056 101.931452 6721.1587 4700.8669 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='c', method='s') mpg cyl disp hp mpg 87.88710 -74.54032 -79.87903 -78.56452 cyl -74.54032 76.20968 75.91935 73.74194 disp -79.87903 75.91935 87.88710 74.73387 hp -78.56452 73.74194 74.73387 87.74194 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='e', method='k') mpg cyl disp hp mpg 978 -638 -752 -722 cyl -638 658 654 626 disp -752 654 980 648 hp -722 626 648 966 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='e', method='p') mpg cyl disp hp mpg 36.324103 -9.172379 -633.0972 -320.7321 cyl -9.172379 3.189516 199.6603 101.9315 disp -633.097208 199.660282 15360.7998 6721.1587 hp -320.732056 101.931452 6721.1587 4700.8669 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='e', method='s') mpg cyl disp hp mpg 87.88710 -74.54032 -79.87903 -78.56452 cyl -74.54032 76.20968 75.91935 73.74194 disp -79.87903 75.91935 87.88710 74.73387 hp -78.56452 73.74194 74.73387 87.74194 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='n', method='k') mpg cyl disp hp mpg 978 -638 -752 -722 cyl -638 658 654 626 disp -752 654 980 648 hp -722 626 648 966 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='n', method='p') mpg cyl disp hp mpg 36.324103 -9.172379 -633.0972 -320.7321 cyl -9.172379 3.189516 199.6603 101.9315 disp -633.097208 199.660282 15360.7998 6721.1587 hp -320.732056 101.931452 6721.1587 4700.8669 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCombinations# #cov(mtcars[,1:4], use='n', method='s') mpg cyl disp hp mpg 87.88710 -74.54032 -79.87903 -78.56452 cyl -74.54032 76.20968 75.91935 73.74194 disp -79.87903 75.91935 87.88710 74.73387 hp -78.56452 73.74194 74.73387 87.74194 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCovcor# #.Call(stats:::C_cov, 1:5, 1:5, 4, FALSE) [1] 2.5 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCovcor# #.Call(stats:::C_cov, 1:5, c(1,5,1,5,10), 4, FALSE) [1] 4.5 ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCovcorArgsCasts# #.Call(stats:::C_cov, 1:3, 1:5, 4, FALSE) Error: incompatible dimensions ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCovcorArgsCasts# #.Call(stats:::C_cov, NULL, 1:5, 4, FALSE) Error: 'x' is NULL ##com.oracle.truffle.r.test.library.stats.TestExternal_covcor.testCovcorArgsCasts# #.Call(stats:::C_cov, c('1','2','3','4','5'), 1:5, 4, FALSE) [1] 2.5 ##com.oracle.truffle.r.test.library.stats.TestExternal_fmin.testArgsEvaluation# #.External2(stats:::C_do_fmin, 42, 0, 10, 0.001) Error: attempt to minimize non-function ##com.oracle.truffle.r.test.library.stats.TestExternal_fmin.testArgsEvaluation# #.External2(stats:::C_do_fmin, function(x) x, 0, 1, Inf) Error: invalid 'tol' value ##com.oracle.truffle.r.test.library.stats.TestExternal_fmin.testArgsEvaluation# #.External2(stats:::C_do_fmin, function(x) x, 0, 1, NaN) Error: invalid 'tol' value ##com.oracle.truffle.r.test.library.stats.TestExternal_fmin.testArgsEvaluation# #.External2(stats:::C_do_fmin, function(x) x, 0, Inf, 0.001) Error: invalid 'xmax' value ##com.oracle.truffle.r.test.library.stats.TestExternal_fmin.testArgsEvaluation# #.External2(stats:::C_do_fmin, function(x) x, 0, NaN, 0.001) Error: invalid 'xmax' value ##com.oracle.truffle.r.test.library.stats.TestExternal_fmin.testArgsEvaluation# #.External2(stats:::C_do_fmin, function(x) x, 10, 1, 0.01) Error: 'xmin' not less than 'xmax' ##com.oracle.truffle.r.test.library.stats.TestExternal_fmin.testArgsEvaluation# #.External2(stats:::C_do_fmin, function(x) x, Inf, 10, 0.001) Error: invalid 'xmin' value ##com.oracle.truffle.r.test.library.stats.TestExternal_fmin.testArgsEvaluation# #.External2(stats:::C_do_fmin, function(x) x, NaN, 10, 0.001) Error: invalid 'xmin' value ##com.oracle.truffle.r.test.library.stats.TestExternal_fmin.testFmin# #.External2(stats:::C_do_fmin, function(x) x^2, 0, 10, 0.001) [1] 0.0006610696 ##com.oracle.truffle.r.test.library.stats.TestExternal_influence.testInfluence# #lm.influence(lm(sr ~ pop15 + pop75 + dpi + ddpi, data = LifeCycleSavings[1:10,])) $hat Australia Austria Belgium Bolivia Brazil Canada Chile 0.3737868 0.5896671 0.4573853 0.6751949 0.3594008 0.7094555 0.3635687 China Colombia Costa Rica 0.6197947 0.3083626 0.5433837 $coefficients (Intercept) pop15 pop75 dpi ddpi Australia 8.97151391 -0.1675404625 -1.09588438 3.404872e-04 -0.14354355 Austria -0.23114405 0.0068984905 -0.06573352 1.002458e-04 -0.01380218 Belgium -0.09597747 0.0015323497 0.01702356 -3.281366e-07 0.00269680 Bolivia 16.27309105 -0.2181784568 -0.80056737 -1.699963e-03 -1.13657588 Brazil 17.27353239 -0.3205150165 -2.30144312 -2.423851e-04 0.12719601 Canada 9.32211441 -0.1901400954 -0.27147576 -2.155664e-03 0.08411897 Chile -36.32966200 0.6442739385 3.76036825 1.353012e-03 0.60529206 China 0.10948533 0.0002053262 0.03214020 2.055369e-05 -0.08291478 Colombia 12.45441319 -0.2628336324 -1.31059668 -1.173403e-04 -0.07712777 Costa Rica -22.04228903 0.4475455100 2.22992704 6.390793e-04 0.12477654 $sigma Australia Austria Belgium Bolivia Brazil Canada Chile 4.119867 4.338004 4.340310 3.738430 3.548807 4.105360 2.590317 China Colombia Costa Rica 4.335941 3.865813 4.059223 $wt.res Australia Austria Belgium Bolivia Brazil Canada 2.16161662 -0.18317364 0.03027155 2.51354855 4.00016991 -1.51875342 Chile China Colombia Costa Rica -5.55671071 -0.24145935 -3.28230239 2.07679287 ##com.oracle.truffle.r.test.library.stats.TestExternal_nlm.testNlmBasicUsage# #nlm(function(x) sum((x-1:length(x))^2), c(10, 10)) $minimum [1] 4.303458e-26 $estimate [1] 1 2 $gradient [1] 2.757794e-13 -3.099743e-13 $code [1] 1 $iterations [1] 2 ##com.oracle.truffle.r.test.library.stats.TestExternal_nlm.testNlmBasicUsage# #nlm(function(x) sum((x-1:length(x))^2), c(5), hessian = TRUE) $minimum [1] 2.4408e-24 $estimate [1] 1 $gradient [1] 9.999969e-07 $hessian [,1] [1,] 2 $code [1] 1 $iterations [1] 1 ##com.oracle.truffle.r.test.library.stats.TestExternal_nlm.testNlmBasicUsage# #nlm(function(x, a) sum((x-a)^2), c(10,10), a = c(3,5)) $minimum [1] 3.371781e-25 $estimate [1] 3 5 $gradient [1] 6.750156e-13 -9.450218e-13 $code [1] 1 $iterations [1] 2 ##com.oracle.truffle.r.test.library.stats.TestExternal_optimize.testOptimizeBasicUsage# #optimize(function (x, a) (x - a)^2, c(0, 1), tol = 0.0001, a = 1/3) $minimum [1] 0.3333333 $objective [1] 0 ##com.oracle.truffle.r.test.library.stats.TestExternal_optimize.testOptimizeBasicUsage# #optimize(function(x) x^2*(print(x)-1), lower = 0, upper = 10) [1] 3.81966 [1] 6.18034 [1] 2.36068 [1] 2.077939 [1] 1.505823 [1] 0.9306496 [1] 0.9196752 [1] 0.772905 [1] 0.4776816 [1] 0.6491436 [1] 0.656315 [1] 0.6653777 [1] 0.6667786 [1] 0.6666728 [1] 0.6666321 [1] 0.6667135 [1] 0.6666728 $minimum [1] 0.6666728 $objective [1] -0.1481481 ##com.oracle.truffle.r.test.library.stats.TestExternal_ppsum.testPPSum# #.Call(stats:::C_pp_sum, c(1,2,3,4,5), 3) [1] 18.6 ##com.oracle.truffle.r.test.library.stats.TestExternal_qgamma.testQgamma# #qgamma(0, 1) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestExternal_qgamma.testQgamma# #qgamma(0.1, 1) [1] 0.1053605 ##com.oracle.truffle.r.test.library.stats.TestExternal_qgamma.testQgamma# #qgamma(0.1, 10, rate=2, lower.tail=FALSE) [1] 7.102995 ##com.oracle.truffle.r.test.library.stats.TestExternal_qgamma.testQgamma# #qgamma(1, 1) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestExternal_qgamma.testQgamma# #qgamma(c(0.1, 0.5, 0.99), c(10, 20), 7) [1] 0.8887578 2.8096675 2.6833025 ##com.oracle.truffle.r.test.library.stats.TestExternal_qgamma.testQgamma# #qgamma(log(1.2e-8), 10, log.p=TRUE) [1] 0.7848489 ##com.oracle.truffle.r.test.library.stats.TestExternal_qgamma.testQgammaWrongArgs# #qgamma(10, 1) [1] NaN Warning message: In qgamma(10, 1) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestExternal_rbinom.testRbinom# #set.seed(42); rbinom('10', 10, 0.5) [1] 7 7 4 7 6 5 6 3 6 6 ##com.oracle.truffle.r.test.library.stats.TestExternal_rbinom.testRbinom# #set.seed(42); rbinom('aa', 10, 0.5) Error in rbinom("aa", 10, 0.5) : invalid arguments In addition: Warning message: In rbinom("aa", 10, 0.5) : NAs introduced by coercion ##com.oracle.truffle.r.test.library.stats.TestExternal_rbinom.testRbinom# #set.seed(42); rbinom(1, 2, 3) [1] NA Warning message: In rbinom(1, 2, 3) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestExternal_rbinom.testRbinom# #set.seed(42); rbinom(10, 10, 0.5) [1] 7 7 4 7 6 5 6 3 6 6 ##com.oracle.truffle.r.test.library.stats.TestExternal_rbinom.testRbinom# #set.seed(42); rbinom(10, 2:10, c(0.1, 0.5, 0.9)) [1] 1 3 4 1 3 6 1 3 9 0 ##com.oracle.truffle.r.test.library.stats.TestExternal_rbinom.testRbinom# #set.seed(42); rbinom(1:10, 2:10, c(0.1, 0.5, 0.9)) [1] 1 3 4 1 3 6 1 3 9 0 ##com.oracle.truffle.r.test.library.stats.TestExternal_rbinom.testRbinom# #set.seed(42); rbinom(c(1,2), 11:12, c(0.1, 0.5, 0.9)) [1] 3 9 ##com.oracle.truffle.r.test.library.stats.TestExternal_rnbinom.testRbinomWithMu#Output.IgnoreWarningContext# #set.seed(42); rnbinom(100, c(-1, 0, 1, 0.8, 10, NA, NaN, 1/0, -1/0), mu=c(-1, 0, 1, 0.8, 3, 10, NA, NaN, 1/0, -1/0)) [1] NaN NaN 1 1 4 NaN NaN NaN NaN NaN NaN 0 0 0 NaN NaN NaN NaN [19] NaN NaN NaN 0 0 NaN NaN 5 NaN NaN NaN NaN NaN 0 NaN NaN 5 NaN [37] NaN NaN NaN NaN NaN NaN NaN 0 NaN NaN NaN NaN NaN NaN NaN NaN 2 NaN [55] NaN NaN NaN NaN NaN NaN NaN 0 NaN NaN NaN 13 NaN NaN NaN NaN NaN NaN [73] NaN NaN 14 30 NaN NaN NaN NaN NaN NaN NaN 0 0 8 NaN NaN NaN NaN [91] NaN NaN 3 1 2 NaN NaN NaN NaN NaN Warning message: In rnbinom(100, c(-1, 0, 1, 0.8, 10, NA, NaN, 1/0, -1/0), mu = c(-1, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestExternal_rnbinom.testRbinomWithMu# #set.seed(42); rnbinom(5, 1, mu=2) [1] 3 3 3 3 4 ##com.oracle.truffle.r.test.library.stats.TestExternal_uniroot.testOptimizeBasicUsage# #uniroot(function (x, a) x - a, c(0, 1), tol = 0.0001, a = 1/3) $root [1] 0.3333333 $f.root [1] 0 $iter [1] 1 $init.it [1] NA $estim.prec [1] 0.6666667 ##com.oracle.truffle.r.test.library.stats.TestExternal_zeroin2.testZeroin2# #.External2(stats:::C_zeroin2, function(x) x, -1, 1, -1, 1, 3, 4L) [1] 1 0 2 ##com.oracle.truffle.r.test.library.stats.TestExternal_zeroin2.testZeroin2# #f <- function (x, a) x - a; print(str(xmin <- uniroot(f, c(0, 1), tol = 0.0001, a = 1/3))) List of 5 $ root : num 0.333 $ f.root : num 0 $ iter : int 1 $ init.it : int NA $ estim.prec: num 0.667 NULL ##com.oracle.truffle.r.test.library.stats.TestExternal_zeroin2.testZeroin2# #uniroot(function(x) cos(x) - x, lower = -pi, upper = pi, tol = 1e-9) $root [1] 0.7390851 $f.root [1] 6.668044e-11 $iter [1] 8 $init.it [1] NA $estim.prec [1] 5.000004e-10 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); x <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); res <- lm(y~x); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x -2.131628e-14 1.000000e+00 1 2 3 4 5 6 7 8 9 10 11 26.550 37.210 57.280 90.820 20.160 89.838 94.460 20.500 17.600 68.700 38.410 12 13 14 15 16 76.900 49.700 71.000 99.190 16.000 named list() 1 2 3 4 5 1.287943e-14 -3.785953e-14 1.614388e-15 1.485485e-15 4.172133e-15 6 7 8 9 10 1.177205e-15 2.628193e-15 4.278870e-15 3.368471e-15 1.646764e-15 11 12 13 14 15 2.795942e-15 6.682822e-16 2.454440e-15 2.368804e-15 -2.992342e-15 16 -6.865322e-16 [1] 0 1 (Intercept) x -2.185795e+02 1.169877e+02 -3.552714e-15 -1.421085e-14 1.065814e-14 -1.421085e-14 -1.421085e-14 1.065814e-14 1.065814e-14 -7.105427e-15 3.552714e-15 -1.065814e-14 -3.330669e-16 -7.105427e-15 -2.131628e-14 7.105427e-15 (Intercept) x 1 -4.00 -2.185795e+02 2 0.25 1.169877e+02 3 0.25 -7.055527e-02 4 0.25 -3.572520e-01 5 0.25 2.467430e-01 6 0.25 -3.488580e-01 7 0.25 -3.883664e-01 8 0.25 2.438367e-01 9 0.25 2.686256e-01 10 0.25 -1.681723e-01 11 0.25 9.074371e-02 12 0.25 -2.382652e-01 13 0.25 -5.762143e-03 14 0.25 -1.878325e-01 15 0.25 -4.287980e-01 16 0.25 2.823023e-01 attr(,"assign") [1] 0 1 [1] 2 y x 1 26.550 26.550 2 37.210 37.210 3 57.280 57.280 4 90.820 90.820 5 20.160 20.160 6 89.838 89.838 7 94.460 94.460 8 20.500 20.500 9 17.600 17.600 10 68.700 68.700 11 38.410 38.410 12 76.900 76.900 13 49.700 49.700 14 71.000 71.000 15 99.190 99.190 16 16.000 16.000 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); x <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); z <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); res <- lm(y~(x:z)^3); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x:z 21.53296234 0.00861965 1 2 3 4 5 6 7 8 27.60897 33.46759 49.81402 92.63018 25.03621 91.10100 98.44344 25.15537 9 10 11 12 13 14 15 16 24.20299 62.21504 34.24977 72.50621 42.82427 64.98462 106.33873 23.73959 named list() 1 2 3 4 5 6 7 8 -1.058975 3.742408 7.465981 -1.810180 -4.876209 -1.263002 -3.983438 -4.655370 9 10 11 12 13 14 15 16 -6.602985 6.484964 4.160226 4.393791 6.875727 6.015384 -7.148731 -7.739593 [1] 0 1 (Intercept) x:z -218.5795000 115.0318937 7.6951986 -0.2866112 -5.3960354 0.2143399 -2.2841310 -5.1715946 -7.1480005 7.0890693 3.9189298 5.3090040 6.8936417 6.7032154 -5.2107459 -8.2986167 (Intercept) x:z 1 -4.00 -1.536578e+04 2 0.25 1.334531e+04 3 0.25 -5.010123e-03 4 0.25 -3.772213e-01 5 0.25 2.103894e-01 6 0.25 -3.639278e-01 7 0.25 -4.277574e-01 8 0.25 2.093535e-01 9 0.25 2.176328e-01 10 0.25 -1.128152e-01 11 0.25 1.302936e-01 12 0.25 -2.022788e-01 13 0.25 5.575343e-02 14 0.25 -1.368918e-01 15 0.25 -4.963931e-01 16 0.25 2.216612e-01 attr(,"assign") [1] 0 1 [1] 2 y x z 1 26.550 26.550 26.550 2 37.210 37.210 37.210 3 57.280 57.280 57.280 4 90.820 90.820 90.820 5 20.160 20.160 20.160 6 89.838 89.838 89.838 7 94.460 94.460 94.460 8 20.500 20.500 20.500 9 17.600 17.600 17.600 10 68.700 68.700 68.700 11 38.410 38.410 38.410 12 76.900 76.900 76.900 13 49.700 49.700 49.700 14 71.000 71.000 71.000 15 99.190 99.190 99.190 16 16.000 16.000 16.000 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); x <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); z <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); res <- lm(y~x*z); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x z x:z -2.131628e-14 1.000000e+00 NA 2.698309e-18 1 2 3 4 5 6 7 8 9 10 11 26.550 37.210 57.280 90.820 20.160 89.838 94.460 20.500 17.600 68.700 38.410 12 13 14 15 16 76.900 49.700 71.000 99.190 16.000 named list() 1 2 3 4 5 1.283954e-14 -3.650704e-14 3.924200e-15 5.433426e-16 3.003613e-15 6 7 8 9 10 4.165451e-16 9.679492e-16 3.175953e-15 1.685969e-15 3.530942e-15 11 12 13 14 15 4.266776e-15 1.812724e-15 4.658154e-15 4.082112e-15 -5.692549e-15 16 -2.708232e-15 [1] 0 1 2 3 (Intercept) x x:z -2.185795e+02 1.169877e+02 6.557040e-15 -1.476667e-14 9.005033e-15 -1.457365e-14 -1.553337e-14 9.083088e-15 8.394724e-15 -4.736529e-15 5.094424e-15 -9.026011e-15 2.169903e-15 -4.901878e-15 -2.375559e-14 4.440308e-15 (Intercept) x x:z z 1 -4.00 -2.185795e+02 -1.536578e+04 -2.185795e+02 2 0.25 1.169877e+02 1.312220e+04 1.169877e+02 3 0.25 -7.055527e-02 2.430055e+03 6.557040e-15 4 0.25 -3.572520e-01 -7.514340e-02 4.060091e-14 5 0.25 2.467430e-01 -2.234902e-01 -2.217939e-01 6 0.25 -3.488580e-01 -4.904776e-02 3.589489e-01 7 0.25 -3.883664e-01 -1.787960e-01 3.825867e-01 8 0.25 2.438367e-01 -2.129376e-01 -2.237164e-01 9 0.25 2.686256e-01 -3.060002e-01 -2.067620e-01 10 0.25 -1.681723e-01 3.202606e-01 1.166607e-01 11 0.25 9.074371e-02 2.084299e-01 -1.254756e-01 12 0.25 -2.382652e-01 2.206541e-01 2.223106e-01 13 0.25 -5.762143e-03 3.383863e-01 -5.344469e-02 14 0.25 -1.878325e-01 2.979065e-01 1.207332e-01 15 0.25 -4.287980e-01 -3.297793e-01 5.850999e-01 16 0.25 2.823023e-01 -3.603079e-01 -1.093647e-01 attr(,"assign") [1] 0 1 2 3 [1] 3 y x z 1 26.550 26.550 26.550 2 37.210 37.210 37.210 3 57.280 57.280 57.280 4 90.820 90.820 90.820 5 20.160 20.160 20.160 6 89.838 89.838 89.838 7 94.460 94.460 94.460 8 20.500 20.500 20.500 9 17.600 17.600 17.600 10 68.700 68.700 68.700 11 38.410 38.410 38.410 12 76.900 76.900 76.900 13 49.700 49.700 49.700 14 71.000 71.000 71.000 15 99.190 99.190 99.190 16 16.000 16.000 16.000 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); x <- c(rep(1,8), rep(2,8)); res <- lm(y~x); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x 54.51700 0.08525 1 2 3 4 5 6 7 8 54.60225 54.60225 54.60225 54.60225 54.60225 54.60225 54.60225 54.60225 9 10 11 12 13 14 15 16 54.68750 54.68750 54.68750 54.68750 54.68750 54.68750 54.68750 54.68750 named list() 1 2 3 4 5 6 7 8 -28.05225 -17.39225 2.67775 36.21775 -34.44225 35.23575 39.85775 -34.10225 9 10 11 12 13 14 15 16 -37.08750 14.01250 -16.27750 22.21250 -4.98750 16.31250 44.50250 -38.68750 [1] 0 1 (Intercept) x -218.57950 0.17050 10.25183 43.79183 -26.86817 42.80983 47.43183 -26.52817 -34.42250 16.67750 -13.61250 24.87750 -2.32250 18.97750 47.16750 -36.02250 (Intercept) x 1 -4.00 -6.0 2 0.25 2.0 3 0.25 0.2 4 0.25 0.2 5 0.25 0.2 6 0.25 0.2 7 0.25 0.2 8 0.25 0.2 9 0.25 -0.3 10 0.25 -0.3 11 0.25 -0.3 12 0.25 -0.3 13 0.25 -0.3 14 0.25 -0.3 15 0.25 -0.3 16 0.25 -0.3 attr(,"assign") [1] 0 1 [1] 2 y x 1 26.550 1 2 37.210 1 3 57.280 1 4 90.820 1 5 20.160 1 6 89.838 1 7 94.460 1 8 20.500 1 9 17.600 2 10 68.700 2 11 38.410 2 12 76.900 2 13 49.700 2 14 71.000 2 15 99.190 2 16 16.000 2 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); x <- c(rep(1,8), rep(2,8)); z <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); res <- lm(y~(x:z)^3); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x:z 17.7285363 0.4502617 1 2 3 4 5 6 7 8 29.68298 34.48277 43.51953 58.62131 26.80581 58.17915 60.26026 26.95890 9 10 11 12 13 14 15 16 33.57775 79.59450 52.31764 86.97879 62.48455 81.66570 107.05145 32.13691 named list() 1 2 3 4 5 6 7 -3.132985 2.727225 13.760473 32.198695 -6.645812 31.658852 34.199742 8 9 10 11 12 13 14 -6.458901 -15.977749 -10.894496 -13.907641 -10.078788 -12.784551 -10.665700 15 16 -7.861455 -16.136911 [1] 0 1 (Intercept) x:z -218.579500 94.427700 14.199393 33.099749 -6.718353 32.546375 35.150950 -6.526758 -15.843060 -9.351635 -13.199487 -8.309958 -11.765276 -9.059457 -5.478376 -16.046314 (Intercept) x:z 1 -4.00 -327.95450000 2 0.25 209.71736593 3 0.25 0.06494884 4 0.25 -0.09498069 5 0.25 0.24194897 6 0.25 -0.09029820 7 0.25 -0.11233738 8 0.25 0.24032774 9 0.25 0.17023340 10 0.25 -0.31708914 11 0.25 -0.02822418 12 0.25 -0.39528963 13 0.25 -0.13589290 14 0.25 -0.33902343 15 0.25 -0.60786144 16 0.25 0.18549203 attr(,"assign") [1] 0 1 [1] 2 y x z 1 26.550 1 26.550 2 37.210 1 37.210 3 57.280 1 57.280 4 90.820 1 90.820 5 20.160 1 20.160 6 89.838 1 89.838 7 94.460 1 94.460 8 20.500 1 20.500 9 17.600 2 17.600 10 68.700 2 68.700 11 38.410 2 38.410 12 76.900 2 76.900 13 49.700 2 49.700 14 71.000 2 71.000 15 99.190 2 99.190 16 16.000 2 16.000 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); x <- c(rep(1,8), rep(2,8)); z <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); res <- lm(y~x*z); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x z x:z -1.087325e-14 2.511880e-15 1.000000e+00 -4.623971e-17 1 2 3 4 5 6 7 8 9 10 11 26.550 37.210 57.280 90.820 20.160 89.838 94.460 20.500 17.600 68.700 38.410 12 13 14 15 16 76.900 49.700 71.000 99.190 16.000 named list() 1 2 3 4 5 -2.881831e-15 -8.105285e-16 2.665156e-15 -3.159127e-16 2.753576e-15 6 7 8 9 10 -3.226284e-16 -2.910197e-16 -7.968121e-16 4.637280e-15 2.441613e-16 11 12 13 14 15 -1.363585e-15 6.794045e-16 -3.202399e-16 -3.186472e-15 1.862523e-15 16 -2.553073e-15 [1] 0 1 2 3 (Intercept) x z x:z -2.185795e+02 1.705000e-01 -1.169876e+02 -2.688673e-15 3.941683e-15 -6.197555e-16 -6.866679e-16 3.840467e-16 6.293211e-15 2.537161e-16 -3.781255e-16 4.247660e-16 3.014702e-16 -3.251020e-15 8.897297e-16 -8.455924e-16 (Intercept) x z x:z 1 -4.00 -6.0 -218.57950000 -327.95450000 2 0.25 2.0 0.17050000 109.54550000 3 0.25 0.2 -116.98759829 -169.11579854 4 0.25 0.2 0.37432885 58.14639876 5 0.25 0.2 -0.22966679 -0.18930680 6 0.25 0.2 0.36593480 0.30162805 7 0.25 0.2 0.40544326 0.33419358 8 0.25 0.2 -0.22676050 -0.18691124 9 0.25 -0.3 -0.29424059 0.39529683 10 0.25 -0.3 0.14255785 -0.12348079 11 0.25 -0.3 -0.11635849 0.18402947 12 0.25 -0.3 0.21265075 -0.20672887 13 0.25 -0.3 -0.01985253 0.06941108 14 0.25 -0.3 0.16221805 -0.14683086 15 0.25 -0.3 0.40318376 -0.43302150 16 0.25 -0.3 -0.30791725 0.41154036 attr(,"assign") [1] 0 1 2 3 [1] 4 y x z 1 26.550 1 26.550 2 37.210 1 37.210 3 57.280 1 57.280 4 90.820 1 90.820 5 20.160 1 20.160 6 89.838 1 89.838 7 94.460 1 94.460 8 20.500 1 20.500 9 17.600 2 17.600 10 68.700 2 68.700 11 38.410 2 38.410 12 76.900 2 76.900 13 49.700 2 49.700 14 71.000 2 71.000 15 99.190 2 99.190 16 16.000 2 16.000 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); x <- factor(c('m', 'm', 'f', 'm', 'm', 'm', 'f', 'f', 'f', 'm', 'f', 'f', 'm', 'f', 'f', 'm')); res <- lm(y~x); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) xm 59.41750 -9.54525 1 2 3 4 5 6 7 8 49.87225 49.87225 59.41750 49.87225 49.87225 49.87225 59.41750 59.41750 9 10 11 12 13 14 15 16 59.41750 49.87225 59.41750 59.41750 49.87225 59.41750 59.41750 49.87225 $x [1] "f" "m" 1 2 3 4 5 6 7 8 -23.32225 -12.66225 -2.13750 40.94775 -29.71225 39.96575 35.04250 -38.91750 9 10 11 12 13 14 15 16 -41.81750 18.82775 -21.00750 17.48250 -0.17225 11.58250 39.77250 -33.87225 [1] 0 1 (Intercept) xm -218.579500 19.090500 0.527500 46.945167 -23.714833 45.963167 37.707500 -36.252500 -39.152500 24.825167 -18.342500 20.147500 5.825167 14.247500 42.437500 -27.874833 (Intercept) xm 1 -4.00 -2.0 2 0.25 -2.0 3 0.25 -0.3 4 0.25 0.2 5 0.25 0.2 6 0.25 0.2 7 0.25 -0.3 8 0.25 -0.3 9 0.25 -0.3 10 0.25 0.2 11 0.25 -0.3 12 0.25 -0.3 13 0.25 0.2 14 0.25 -0.3 15 0.25 -0.3 16 0.25 0.2 attr(,"assign") [1] 0 1 attr(,"contrasts") attr(,"contrasts")$x [1] "contr.treatment" [1] 2 y x 1 26.550 m 2 37.210 m 3 57.280 f 4 90.820 m 5 20.160 m 6 89.838 m 7 94.460 f 8 20.500 f 9 17.600 f 10 68.700 m 11 38.410 f 12 76.900 f 13 49.700 m 14 71.000 f 15 99.190 f 16 16.000 m ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(rep(1,8), rep(2,8)); x <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); res <- lm(y~x); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x 1.498638e+00 2.491574e-05 1 2 3 4 5 6 7 8 1.499300 1.499566 1.500066 1.500901 1.499141 1.500877 1.500992 1.499149 9 10 11 12 13 14 15 16 1.499077 1.500350 1.499595 1.500555 1.499877 1.500408 1.501110 1.499037 named list() 1 2 3 4 5 6 7 -0.4993000 -0.4995656 -0.5000657 -0.5009013 -0.4991408 -0.5008769 -0.5009920 8 9 10 11 12 13 14 -0.4991493 0.5009230 0.4996498 0.5004045 0.4994455 0.5001232 0.4995925 15 16 0.4988901 0.5009629 [1] 0 1 (Intercept) x -6.000000000 0.002914836 -0.425819921 -0.530737495 -0.309703632 -0.527665668 -0.542123898 -0.310767197 0.698304388 0.538456803 0.633207945 0.512806114 0.597891326 0.531262097 0.443080034 0.703309401 (Intercept) x 1 -4.00 -2.185795e+02 2 0.25 1.169877e+02 3 0.25 -7.055527e-02 4 0.25 -3.572520e-01 5 0.25 2.467430e-01 6 0.25 -3.488580e-01 7 0.25 -3.883664e-01 8 0.25 2.438367e-01 9 0.25 2.686256e-01 10 0.25 -1.681723e-01 11 0.25 9.074371e-02 12 0.25 -2.382652e-01 13 0.25 -5.762143e-03 14 0.25 -1.878325e-01 15 0.25 -4.287980e-01 16 0.25 2.823023e-01 attr(,"assign") [1] 0 1 [1] 2 y x 1 1 26.550 2 1 37.210 3 1 57.280 4 1 90.820 5 1 20.160 6 1 89.838 7 1 94.460 8 1 20.500 9 2 17.600 10 2 68.700 11 2 38.410 12 2 76.900 13 2 49.700 14 2 71.000 15 2 99.190 16 2 16.000 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(rep(1,8), rep(2,8)); x <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); z <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); res <- lm(y~(x:z)^3); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x:z 1.515259e+00 -3.972145e-06 1 2 3 4 5 6 7 8 1.512459 1.509759 1.502226 1.482495 1.513644 1.483200 1.479817 1.513589 9 10 11 12 13 14 15 16 1.514028 1.496511 1.509399 1.491769 1.505447 1.495235 1.476178 1.514242 named list() 1 2 3 4 5 6 7 -0.5124588 -0.5097590 -0.5022262 -0.4824954 -0.5136444 -0.4832001 -0.4798166 8 9 10 11 12 13 14 -0.5135895 0.4859716 0.5034885 0.4906014 0.5082309 0.4945528 0.5047648 15 16 0.5238218 0.4857581 [1] 0 1 (Intercept) x:z -6.00000000 -0.05300951 -0.40152887 -0.51511124 -0.33579849 -0.51105464 -0.53053260 -0.33611460 0.66641188 0.56557381 0.63975984 0.53827347 0.61701348 0.55822669 0.44852283 0.66764116 (Intercept) x:z 1 -4.00 -1.536578e+04 2 0.25 1.334531e+04 3 0.25 -5.010123e-03 4 0.25 -3.772213e-01 5 0.25 2.103894e-01 6 0.25 -3.639278e-01 7 0.25 -4.277574e-01 8 0.25 2.093535e-01 9 0.25 2.176328e-01 10 0.25 -1.128152e-01 11 0.25 1.302936e-01 12 0.25 -2.022788e-01 13 0.25 5.575343e-02 14 0.25 -1.368918e-01 15 0.25 -4.963931e-01 16 0.25 2.216612e-01 attr(,"assign") [1] 0 1 [1] 2 y x z 1 1 26.550 26.550 2 1 37.210 37.210 3 1 57.280 57.280 4 1 90.820 90.820 5 1 20.160 20.160 6 1 89.838 89.838 7 1 94.460 94.460 8 1 20.500 20.500 9 2 17.600 17.600 10 2 68.700 68.700 11 2 38.410 38.410 12 2 76.900 76.900 13 2 49.700 49.700 14 2 71.000 71.000 15 2 99.190 99.190 16 2 16.000 16.000 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(rep(1,8), rep(2,8)); x <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); z <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); res <- lm(y~x*z); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x z x:z 1.2097300183 0.0141888866 NA -0.0001262754 1 2 3 4 5 6 7 8 1.497433 1.562860 1.608160 1.456811 1.444456 1.465280 1.423296 1.447535 9 10 11 12 13 14 15 16 1.420339 1.588526 1.568428 1.554112 1.603006 1.580587 1.374746 1.404426 named list() 1 2 3 4 5 6 7 -0.4974331 -0.5628596 -0.6081601 -0.4568110 -0.4444564 -0.4652795 -0.4232960 8 9 10 11 12 13 14 -0.4475350 0.5796606 0.4114741 0.4315725 0.4458879 0.3969939 0.4194132 15 16 0.6252543 0.5955743 [1] 0 1 2 3 (Intercept) x x:z -6.000000000 0.002914836 -0.306856142 -0.537277949 -0.329156136 -0.531934767 -0.557686236 -0.329301207 0.671670249 0.566332170 0.651349607 0.532011761 0.627344346 0.557191764 0.414376166 0.671948335 (Intercept) x x:z z 1 -4.00 -2.185795e+02 -1.536578e+04 -2.185795e+02 2 0.25 1.169877e+02 1.312220e+04 1.169877e+02 3 0.25 -7.055527e-02 2.430055e+03 6.557040e-15 4 0.25 -3.572520e-01 -7.514340e-02 4.060091e-14 5 0.25 2.467430e-01 -2.234902e-01 -2.217939e-01 6 0.25 -3.488580e-01 -4.904776e-02 3.589489e-01 7 0.25 -3.883664e-01 -1.787960e-01 3.825867e-01 8 0.25 2.438367e-01 -2.129376e-01 -2.237164e-01 9 0.25 2.686256e-01 -3.060002e-01 -2.067620e-01 10 0.25 -1.681723e-01 3.202606e-01 1.166607e-01 11 0.25 9.074371e-02 2.084299e-01 -1.254756e-01 12 0.25 -2.382652e-01 2.206541e-01 2.223106e-01 13 0.25 -5.762143e-03 3.383863e-01 -5.344469e-02 14 0.25 -1.878325e-01 2.979065e-01 1.207332e-01 15 0.25 -4.287980e-01 -3.297793e-01 5.850999e-01 16 0.25 2.823023e-01 -3.603079e-01 -1.093647e-01 attr(,"assign") [1] 0 1 2 3 [1] 3 y x z 1 1 26.550 26.550 2 1 37.210 37.210 3 1 57.280 57.280 4 1 90.820 90.820 5 1 20.160 20.160 6 1 89.838 89.838 7 1 94.460 94.460 8 1 20.500 20.500 9 2 17.600 17.600 10 2 68.700 68.700 11 2 38.410 38.410 12 2 76.900 76.900 13 2 49.700 49.700 14 2 71.000 71.000 15 2 99.190 99.190 16 2 16.000 16.000 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(rep(1,8), rep(2,8)); x <- c(rep(1,8), rep(2,8)); res <- lm(y~x); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x -6.661338e-16 1.000000e+00 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 1 1 1 1 1 1 1 1 2 2 2 2 2 2 2 2 named list() 1 2 3 4 5 1.942890e-16 -6.938894e-16 8.326673e-17 8.326673e-17 8.326673e-17 6 7 8 9 10 8.326673e-17 8.326673e-17 8.326673e-17 -3.697785e-32 -3.697785e-32 11 12 13 14 15 -3.697785e-32 -3.697785e-32 -3.697785e-32 -3.697785e-32 -3.697785e-32 16 -3.697785e-32 [1] 0 1 (Intercept) x -6.000000e+00 2.000000e+00 1.665335e-16 1.665335e-16 1.665335e-16 1.665335e-16 1.665335e-16 1.665335e-16 -2.220446e-16 -2.220446e-16 -2.220446e-16 -2.220446e-16 -2.220446e-16 -2.220446e-16 -2.220446e-16 -2.220446e-16 (Intercept) x 1 -4.00 -6.0 2 0.25 2.0 3 0.25 0.2 4 0.25 0.2 5 0.25 0.2 6 0.25 0.2 7 0.25 0.2 8 0.25 0.2 9 0.25 -0.3 10 0.25 -0.3 11 0.25 -0.3 12 0.25 -0.3 13 0.25 -0.3 14 0.25 -0.3 15 0.25 -0.3 16 0.25 -0.3 attr(,"assign") [1] 0 1 [1] 2 y x 1 1 1 2 1 1 3 1 1 4 1 1 5 1 1 6 1 1 7 1 1 8 1 1 9 2 2 10 2 2 11 2 2 12 2 2 13 2 2 14 2 2 15 2 2 16 2 2 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(rep(1,8), rep(2,8)); x <- c(rep(1,8), rep(2,8)); z <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); res <- lm(y~(x:z)^3); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x:z 1.09157779 0.00498145 1 2 3 4 5 6 7 8 1.223835 1.276938 1.376915 1.543993 1.192004 1.539101 1.562126 1.193698 9 10 11 12 13 14 15 16 1.266925 1.776029 1.474253 1.857725 1.586734 1.798944 2.079798 1.250984 named list() 1 2 3 4 5 6 -0.22383528 -0.27693753 -0.37691523 -0.54399305 -0.19200381 -0.53910127 7 8 9 10 11 12 -0.56212553 -0.19369751 0.73307518 0.22397102 0.52574725 0.14227525 13 14 15 16 0.41326611 0.20105635 -0.07979778 0.74901582 [1] 0 1 (Intercept) x:z -6.00000000 1.04469651 -0.31915613 -0.51822546 -0.09883849 -0.51239701 -0.53982988 -0.10085648 0.81189488 0.20530914 0.56486848 0.10797053 0.43084983 0.17800685 -0.15662431 0.83088778 (Intercept) x:z 1 -4.00 -327.95450000 2 0.25 209.71736593 3 0.25 0.06494884 4 0.25 -0.09498069 5 0.25 0.24194897 6 0.25 -0.09029820 7 0.25 -0.11233738 8 0.25 0.24032774 9 0.25 0.17023340 10 0.25 -0.31708914 11 0.25 -0.02822418 12 0.25 -0.39528963 13 0.25 -0.13589290 14 0.25 -0.33902343 15 0.25 -0.60786144 16 0.25 0.18549203 attr(,"assign") [1] 0 1 [1] 2 y x z 1 1 1 26.550 2 1 1 37.210 3 1 1 57.280 4 1 1 90.820 5 1 1 20.160 6 1 1 89.838 7 1 1 94.460 8 1 1 20.500 9 2 2 17.600 10 2 2 68.700 11 2 2 38.410 12 2 2 76.900 13 2 2 49.700 14 2 2 71.000 15 2 2 99.190 16 2 2 16.000 ##com.oracle.truffle.r.test.library.stats.TestFitting.testLm#Output.IgnoreWhitespace#IgnoreOS.MacOS# #y <- c(rep(1,8), rep(2,8)); x <- c(rep(1,8), rep(2,8)); z <- c(26.55, 37.21, 57.28, 90.82, 20.16, 89.838, 94.46, 20.5, 17.6, 68.7, 38.41, 76.9, 49.7, 71, 99.19, 16); res <- lm(y~x*z); print(res$coefficients);print(res$fitted.values);print(res$xlevels);print(res$residuals);print(res$assign);print(res$effects);print(res$qr$qr);print(res$rank);print(res$model); (Intercept) x z x:z -6.661338e-16 1.000000e+00 2.741807e-18 -1.370904e-18 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 1 1 1 1 1 1 1 1 2 2 2 2 2 2 2 2 named list() 1 2 3 4 5 2.327460e-16 -6.700463e-16 7.959579e-17 3.361568e-17 1.304837e-16 6 7 8 9 10 3.496191e-17 2.862559e-17 1.300176e-16 0.000000e+00 0.000000e+00 11 12 13 14 15 0.000000e+00 -4.930381e-32 0.000000e+00 -4.930381e-32 0.000000e+00 16 0.000000e+00 [1] 0 1 2 3 (Intercept) x z x:z -6.000000e+00 2.000000e+00 -8.891599e-17 -7.971311e-17 2.433801e-16 4.409147e-17 3.087192e-17 2.424076e-16 -2.007663e-16 -2.405861e-16 -2.169826e-16 -2.469760e-16 -2.257803e-16 -2.423784e-16 -2.643456e-16 -1.995195e-16 (Intercept) x z x:z 1 -4.00 -6.0 -218.57950000 -327.95450000 2 0.25 2.0 0.17050000 109.54550000 3 0.25 0.2 -116.98759829 -169.11579854 4 0.25 0.2 0.37432885 58.14639876 5 0.25 0.2 -0.22966679 -0.18930680 6 0.25 0.2 0.36593480 0.30162805 7 0.25 0.2 0.40544326 0.33419358 8 0.25 0.2 -0.22676050 -0.18691124 9 0.25 -0.3 -0.29424059 0.39529683 10 0.25 -0.3 0.14255785 -0.12348079 11 0.25 -0.3 -0.11635849 0.18402947 12 0.25 -0.3 0.21265075 -0.20672887 13 0.25 -0.3 -0.01985253 0.06941108 14 0.25 -0.3 0.16221805 -0.14683086 15 0.25 -0.3 0.40318376 -0.43302150 16 0.25 -0.3 -0.30791725 0.41154036 attr(,"assign") [1] 0 1 2 3 [1] 4 y x z 1 1 1 26.550 2 1 1 37.210 3 1 1 57.280 4 1 1 90.820 5 1 1 20.160 6 1 1 89.838 7 1 1 94.460 8 1 1 20.500 9 2 2 17.600 10 2 2 68.700 11 2 2 38.410 12 2 2 76.900 13 2 2 49.700 14 2 2 71.000 15 2 2 99.190 16 2 2 16.000 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testDotWithData# #terms.formula(x ~ .^4, data=data.frame(1:5)) x ~ X1.5^4 attr(,"variables") list(x, X1.5) attr(,"factors") X1.5 x 0 X1.5 1 attr(,"term.labels") [1] "X1.5" attr(,"order") [1] 1 attr(,"intercept") [1] 1 attr(,"response") [1] 1 attr(,".Environment") ##com.oracle.truffle.r.test.library.stats.TestFormulae.testDotWithNoFramenames#Output.IgnoreErrorContext# #terms.formula(x ~ .^4) Error in terms.formula(x ~ .^4) : '.' in formula and no 'data' argument ##com.oracle.truffle.r.test.library.stats.TestFormulae.testExpandDostsAndSpecialsTermsform# #f <- terms.formula(cyl~myfun(mpg)+., specials=c('myfun'), data=mtcars); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors myfun(mpg) mpg disp hp drat wt qsec vs am gear carb cyl 0 0 0 0 0 0 0 0 0 0 0 myfun(mpg) 1 0 0 0 0 0 0 0 0 0 0 mpg 0 1 0 0 0 0 0 0 0 0 0 disp 0 0 1 0 0 0 0 0 0 0 0 hp 0 0 0 1 0 0 0 0 0 0 0 drat 0 0 0 0 1 0 0 0 0 0 0 wt 0 0 0 0 0 1 0 0 0 0 0 qsec 0 0 0 0 0 0 1 0 0 0 0 vs 0 0 0 0 0 0 0 1 0 0 0 am 0 0 0 0 0 0 0 0 1 0 0 gear 0 0 0 0 0 0 0 0 0 1 0 carb 0 0 0 0 0 0 0 0 0 0 1 $intercept [1] 1 $order [1] 1 1 1 1 1 1 1 1 1 1 1 $response [1] 1 $specials $specials$myfun [1] 2 $term.labels [1] "myfun(mpg)" "mpg" "disp" "hp" "drat" [6] "wt" "qsec" "vs" "am" "gear" [11] "carb" $variables list(cyl, myfun(mpg), mpg, disp, hp, drat, wt, qsec, vs, am, gear, carb) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testExpandDostsTermsform# #f <- terms.formula(cyl~hp*mpg+., data=mtcars); attrs <- attributes(f);envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors hp mpg disp drat wt qsec vs am gear carb hp:mpg cyl 0 0 0 0 0 0 0 0 0 0 0 hp 1 0 0 0 0 0 0 0 0 0 1 mpg 0 1 0 0 0 0 0 0 0 0 1 disp 0 0 1 0 0 0 0 0 0 0 0 drat 0 0 0 1 0 0 0 0 0 0 0 wt 0 0 0 0 1 0 0 0 0 0 0 qsec 0 0 0 0 0 1 0 0 0 0 0 vs 0 0 0 0 0 0 1 0 0 0 0 am 0 0 0 0 0 0 0 1 0 0 0 gear 0 0 0 0 0 0 0 0 1 0 0 carb 0 0 0 0 0 0 0 0 0 1 0 $intercept [1] 1 $order [1] 1 1 1 1 1 1 1 1 1 1 2 $response [1] 1 $term.labels [1] "hp" "mpg" "disp" "drat" "wt" "qsec" "vs" "am" [9] "gear" "carb" "hp:mpg" $variables list(cyl, hp, mpg, disp, drat, wt, qsec, vs, am, gear, carb) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testFormulaeWithDotdotdot# #terms.formula(... ~ w) ... ~ w attr(,"variables") list(..., w) attr(,"factors") w ... 0 w 1 attr(,"term.labels") [1] "w" attr(,"order") [1] 1 attr(,"intercept") [1] 1 attr(,"response") [1] 1 attr(,".Environment") ##com.oracle.truffle.r.test.library.stats.TestFormulae.testFormulaeWithDotdotdot# #{ f <- function(w,...) model.frame(terms.formula(... ~ w)); f(1, a=3); } ... w 1 3 1 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testFormulaeWithDotdotdot#Output.IgnoreErrorContext# #{ f <- function(w,...) model.frame(terms.formula(... ~ w)); f(1, a=3, b=4); } Error in model.frame.default(terms.formula(... ~ w)) : number of variables != number of variable names ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(u~z*k+w*m)) } u z k w m 1 5 1 2 3 4 2 6 2 3 4 5 3 7 3 4 5 6 4 8 4 5 6 7 5 9 5 6 7 8 6 10 6 7 8 9 7 11 7 8 9 10 8 12 8 9 10 11 9 13 9 10 11 12 10 14 10 11 12 13 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~(1 + w/k))) } y w k 1 0 3 2 2 1 4 3 3 2 5 4 4 3 6 5 5 4 7 6 6 5 8 7 7 6 9 8 8 7 10 9 9 8 11 10 10 9 12 11 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~(z+k)*(w+u))) } y z k w u 1 0 1 2 3 5 2 1 2 3 4 6 3 2 3 4 5 7 4 3 4 5 6 8 5 4 5 6 7 9 6 5 6 7 8 10 7 6 7 8 9 11 8 7 8 9 10 12 9 8 9 10 11 13 10 9 10 11 12 14 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~(z+k)^2)) } y z k 1 0 1 2 2 1 2 3 3 2 3 4 4 3 4 5 5 4 5 6 6 5 6 7 7 6 7 8 8 7 8 9 9 8 9 10 10 9 10 11 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~-1+z)) } y z 1 0 1 2 1 2 3 2 3 4 3 4 5 4 5 6 5 6 7 6 7 8 7 8 9 8 9 10 9 10 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~0+z)) } y z 1 0 1 2 1 2 3 2 3 4 3 4 5 4 5 6 5 6 7 6 7 8 7 8 9 8 9 10 9 10 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~1+z)) } y z 1 0 1 2 1 2 3 2 3 4 3 4 5 4 5 6 5 6 7 6 7 8 7 8 9 8 9 10 9 10 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~w%in%v)) } y w v 1 0 3 6 2 1 4 7 3 2 5 8 4 3 6 9 5 4 7 10 6 5 8 11 7 6 9 12 8 7 10 13 9 8 11 14 10 9 12 15 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~w/k)) } y w k 1 0 3 2 2 1 4 3 3 2 5 4 4 3 6 5 5 4 7 6 6 5 8 7 7 6 9 8 8 7 10 9 9 8 11 10 10 9 12 11 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~z)) } y z 1 0 1 2 1 2 3 2 3 4 3 4 5 4 5 6 5 6 7 6 7 8 7 8 9 8 9 10 9 10 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~z*((m+w)^3))) } y z m w 1 0 1 4 3 2 1 2 5 4 3 2 3 6 5 4 3 4 7 6 5 4 5 8 7 6 5 6 9 8 7 6 7 10 9 8 7 8 11 10 9 8 9 12 11 10 9 10 13 12 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~z*k)) } y z k 1 0 1 2 2 1 2 3 3 2 3 4 4 3 4 5 5 4 5 6 6 5 6 7 7 6 7 8 8 7 8 9 9 8 9 10 10 9 10 11 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~z*k+w*m)) } y z k w m 1 0 1 2 3 4 2 1 2 3 4 5 3 2 3 4 5 6 4 3 4 5 6 7 5 4 5 6 7 8 6 5 6 7 8 9 7 6 7 8 9 10 8 7 8 9 10 11 9 8 9 10 11 12 10 9 10 11 12 13 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~z:k)) } y z k 1 0 1 2 2 1 2 3 3 2 3 4 4 3 4 5 5 4 5 6 6 5 6 7 7 6 7 8 8 7 8 9 9 8 9 10 10 9 10 11 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(y~z^2)) } y z 1 0 1 2 1 2 3 2 3 4 3 4 5 4 5 6 5 6 7 6 7 8 7 8 9 8 9 10 9 10 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(~1)) } data frame with 0 columns and 0 rows ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.frame(terms.formula(~k+y+z)) } k y z 1 2 0 1 2 3 1 2 3 4 2 3 4 5 3 4 5 6 4 5 6 7 5 6 7 8 6 7 8 9 7 8 9 10 8 9 10 11 9 10 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(u~z*k+w*m)) } u z k w m 1 5 a m 3 4 2 6 b f 4 5 3 7 c m 5 6 4 8 a f 6 7 5 9 b m 7 8 6 10 c f 8 9 7 11 a m 9 10 8 12 b f 10 11 9 13 c m 11 12 10 14 c f 12 13 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~(1 + w/k))) } y w k 1 0 3 m 2 1 4 f 3 2 5 m 4 3 6 f 5 4 7 m 6 5 8 f 7 6 9 m 8 7 10 f 9 8 11 m 10 9 12 f ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~(z+k)*(w+u))) } y z k w u 1 0 a m 3 5 2 1 b f 4 6 3 2 c m 5 7 4 3 a f 6 8 5 4 b m 7 9 6 5 c f 8 10 7 6 a m 9 11 8 7 b f 10 12 9 8 c m 11 13 10 9 c f 12 14 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~(z+k)^2)) } y z k 1 0 a m 2 1 b f 3 2 c m 4 3 a f 5 4 b m 6 5 c f 7 6 a m 8 7 b f 9 8 c m 10 9 c f ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~-1+z)) } y z 1 0 a 2 1 b 3 2 c 4 3 a 5 4 b 6 5 c 7 6 a 8 7 b 9 8 c 10 9 c ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~0+z)) } y z 1 0 a 2 1 b 3 2 c 4 3 a 5 4 b 6 5 c 7 6 a 8 7 b 9 8 c 10 9 c ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~1+z)) } y z 1 0 a 2 1 b 3 2 c 4 3 a 5 4 b 6 5 c 7 6 a 8 7 b 9 8 c 10 9 c ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~w%in%v)) } y w v 1 0 3 6 2 1 4 7 3 2 5 8 4 3 6 9 5 4 7 10 6 5 8 11 7 6 9 12 8 7 10 13 9 8 11 14 10 9 12 15 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~w/k)) } y w k 1 0 3 m 2 1 4 f 3 2 5 m 4 3 6 f 5 4 7 m 6 5 8 f 7 6 9 m 8 7 10 f 9 8 11 m 10 9 12 f ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~z)) } y z 1 0 a 2 1 b 3 2 c 4 3 a 5 4 b 6 5 c 7 6 a 8 7 b 9 8 c 10 9 c ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~z*((m+w)^3))) } y z m w 1 0 a 4 3 2 1 b 5 4 3 2 c 6 5 4 3 a 7 6 5 4 b 8 7 6 5 c 9 8 7 6 a 10 9 8 7 b 11 10 9 8 c 12 11 10 9 c 13 12 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~z*k)) } y z k 1 0 a m 2 1 b f 3 2 c m 4 3 a f 5 4 b m 6 5 c f 7 6 a m 8 7 b f 9 8 c m 10 9 c f ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~z*k+w*m)) } y z k w m 1 0 a m 3 4 2 1 b f 4 5 3 2 c m 5 6 4 3 a f 6 7 5 4 b m 7 8 6 5 c f 8 9 7 6 a m 9 10 8 7 b f 10 11 9 8 c m 11 12 10 9 c f 12 13 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~z:k)) } y z k 1 0 a m 2 1 b f 3 2 c m 4 3 a f 5 4 b m 6 5 c f 7 6 a m 8 7 b f 9 8 c m 10 9 c f ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(y~z^2)) } y z 1 0 a 2 1 b 3 2 c 4 3 a 5 4 b 6 5 c 7 6 a 8 7 b 9 8 c 10 9 c ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(~1)) } data frame with 0 columns and 0 rows ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrame# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.frame(terms.formula(~k+y+z)) } k y z 1 m 0 a 2 f 1 b 3 m 2 c 4 f 3 a 5 m 4 b 6 f 5 c 7 m 6 a 8 f 7 b 9 m 8 c 10 f 9 c ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelFrameWithWeights# #model.frame(formula = cyl ~ disp, data = mtcars[1:4,], weights = seq_len(nrow(mtcars[1:4,]))) cyl disp (weights) Mazda RX4 6 160 1 Mazda RX4 Wag 6 160 2 Datsun 710 4 108 3 Hornet 4 Drive 6 258 4 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(u~z*k+w*m))) } (Intercept) z k w m z:k w:m 1 1 1 2 3 4 2 12 2 1 2 3 4 5 6 20 3 1 3 4 5 6 12 30 4 1 4 5 6 7 20 42 5 1 5 6 7 8 30 56 6 1 6 7 8 9 42 72 7 1 7 8 9 10 56 90 8 1 8 9 10 11 72 110 9 1 9 10 11 12 90 132 10 1 10 11 12 13 110 156 attr(,"assign") [1] 0 1 2 3 4 5 6 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~(1 + w/k)))) } (Intercept) w w:k 1 1 3 6 2 1 4 12 3 1 5 20 4 1 6 30 5 1 7 42 6 1 8 56 7 1 9 72 8 1 10 90 9 1 11 110 10 1 12 132 attr(,"assign") [1] 0 1 2 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~(z+k)*(w+u)))) } (Intercept) z k w u z:w z:u k:w k:u 1 1 1 2 3 5 3 5 6 10 2 1 2 3 4 6 8 12 12 18 3 1 3 4 5 7 15 21 20 28 4 1 4 5 6 8 24 32 30 40 5 1 5 6 7 9 35 45 42 54 6 1 6 7 8 10 48 60 56 70 7 1 7 8 9 11 63 77 72 88 8 1 8 9 10 12 80 96 90 108 9 1 9 10 11 13 99 117 110 130 10 1 10 11 12 14 120 140 132 154 attr(,"assign") [1] 0 1 2 3 4 5 6 7 8 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~(z+k)^2))) } (Intercept) z k z:k 1 1 1 2 2 2 1 2 3 6 3 1 3 4 12 4 1 4 5 20 5 1 5 6 30 6 1 6 7 42 7 1 7 8 56 8 1 8 9 72 9 1 9 10 90 10 1 10 11 110 attr(,"assign") [1] 0 1 2 3 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~-1+z))) } z 1 1 2 2 3 3 4 4 5 5 6 6 7 7 8 8 9 9 10 10 attr(,"assign") [1] 1 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~0+z))) } z 1 1 2 2 3 3 4 4 5 5 6 6 7 7 8 8 9 9 10 10 attr(,"assign") [1] 1 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~1+z))) } (Intercept) z 1 1 1 2 1 2 3 1 3 4 1 4 5 1 5 6 1 6 7 1 7 8 1 8 9 1 9 10 1 10 attr(,"assign") [1] 0 1 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~w%in%v))) } (Intercept) w:v 1 1 18 2 1 28 3 1 40 4 1 54 5 1 70 6 1 88 7 1 108 8 1 130 9 1 154 10 1 180 attr(,"assign") [1] 0 1 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~w/k))) } (Intercept) w w:k 1 1 3 6 2 1 4 12 3 1 5 20 4 1 6 30 5 1 7 42 6 1 8 56 7 1 9 72 8 1 10 90 9 1 11 110 10 1 12 132 attr(,"assign") [1] 0 1 2 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~z))) } (Intercept) z 1 1 1 2 1 2 3 1 3 4 1 4 5 1 5 6 1 6 7 1 7 8 1 8 9 1 9 10 1 10 attr(,"assign") [1] 0 1 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~z*((m+w)^3)))) } (Intercept) z m w m:w z:m z:w z:m:w 1 1 1 4 3 12 4 3 12 2 1 2 5 4 20 10 8 40 3 1 3 6 5 30 18 15 90 4 1 4 7 6 42 28 24 168 5 1 5 8 7 56 40 35 280 6 1 6 9 8 72 54 48 432 7 1 7 10 9 90 70 63 630 8 1 8 11 10 110 88 80 880 9 1 9 12 11 132 108 99 1188 10 1 10 13 12 156 130 120 1560 attr(,"assign") [1] 0 1 2 3 4 5 6 7 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~z*k))) } (Intercept) z k z:k 1 1 1 2 2 2 1 2 3 6 3 1 3 4 12 4 1 4 5 20 5 1 5 6 30 6 1 6 7 42 7 1 7 8 56 8 1 8 9 72 9 1 9 10 90 10 1 10 11 110 attr(,"assign") [1] 0 1 2 3 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~z*k+w*m))) } (Intercept) z k w m z:k w:m 1 1 1 2 3 4 2 12 2 1 2 3 4 5 6 20 3 1 3 4 5 6 12 30 4 1 4 5 6 7 20 42 5 1 5 6 7 8 30 56 6 1 6 7 8 9 42 72 7 1 7 8 9 10 56 90 8 1 8 9 10 11 72 110 9 1 9 10 11 12 90 132 10 1 10 11 12 13 110 156 attr(,"assign") [1] 0 1 2 3 4 5 6 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~z:k))) } (Intercept) z:k 1 1 2 2 1 6 3 1 12 4 1 20 5 1 30 6 1 42 7 1 56 8 1 72 9 1 90 10 1 110 attr(,"assign") [1] 0 1 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(y~z^2))) } (Intercept) z 1 1 1 2 1 2 3 1 3 4 1 4 5 1 5 6 1 6 7 1 7 8 1 8 9 1 9 10 1 10 attr(,"assign") [1] 0 1 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(~1))) } (Intercept) attr(,"assign") [1] 0 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;; model.matrix(model.frame(terms.formula(~k+y+z))) } (Intercept) k y z 1 1 2 0 1 2 1 3 1 2 3 1 4 2 3 4 1 5 3 4 5 1 6 4 5 6 1 7 5 6 7 1 8 6 7 8 1 9 7 8 9 1 10 8 9 10 1 11 9 10 attr(,"assign") [1] 0 1 2 3 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(u~z*k+w*m))) } (Intercept) zb zc km w m zb:km zc:km w:m 1 1 0 0 1 3 4 0 0 12 2 1 1 0 0 4 5 0 0 20 3 1 0 1 1 5 6 0 1 30 4 1 0 0 0 6 7 0 0 42 5 1 1 0 1 7 8 1 0 56 6 1 0 1 0 8 9 0 0 72 7 1 0 0 1 9 10 0 0 90 8 1 1 0 0 10 11 0 0 110 9 1 0 1 1 11 12 0 1 132 10 1 0 1 0 12 13 0 0 156 attr(,"assign") [1] 0 1 1 2 3 4 5 5 6 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" attr(,"contrasts")$k [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~(1 + w/k)))) } (Intercept) w w:km 1 1 3 3 2 1 4 0 3 1 5 5 4 1 6 0 5 1 7 7 6 1 8 0 7 1 9 9 8 1 10 0 9 1 11 11 10 1 12 0 attr(,"assign") [1] 0 1 2 attr(,"contrasts") attr(,"contrasts")$k [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~(z+k)*(w+u)))) } (Intercept) zb zc km w u zb:w zc:w zb:u zc:u km:w km:u 1 1 0 0 1 3 5 0 0 0 0 3 5 2 1 1 0 0 4 6 4 0 6 0 0 0 3 1 0 1 1 5 7 0 5 0 7 5 7 4 1 0 0 0 6 8 0 0 0 0 0 0 5 1 1 0 1 7 9 7 0 9 0 7 9 6 1 0 1 0 8 10 0 8 0 10 0 0 7 1 0 0 1 9 11 0 0 0 0 9 11 8 1 1 0 0 10 12 10 0 12 0 0 0 9 1 0 1 1 11 13 0 11 0 13 11 13 10 1 0 1 0 12 14 0 12 0 14 0 0 attr(,"assign") [1] 0 1 1 2 3 4 5 5 6 6 7 8 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" attr(,"contrasts")$k [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~(z+k)^2))) } (Intercept) zb zc km zb:km zc:km 1 1 0 0 1 0 0 2 1 1 0 0 0 0 3 1 0 1 1 0 1 4 1 0 0 0 0 0 5 1 1 0 1 1 0 6 1 0 1 0 0 0 7 1 0 0 1 0 0 8 1 1 0 0 0 0 9 1 0 1 1 0 1 10 1 0 1 0 0 0 attr(,"assign") [1] 0 1 1 2 3 3 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" attr(,"contrasts")$k [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~-1+z))) } za zb zc 1 1 0 0 2 0 1 0 3 0 0 1 4 1 0 0 5 0 1 0 6 0 0 1 7 1 0 0 8 0 1 0 9 0 0 1 10 0 0 1 attr(,"assign") [1] 1 1 1 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~0+z))) } za zb zc 1 1 0 0 2 0 1 0 3 0 0 1 4 1 0 0 5 0 1 0 6 0 0 1 7 1 0 0 8 0 1 0 9 0 0 1 10 0 0 1 attr(,"assign") [1] 1 1 1 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~1+z))) } (Intercept) zb zc 1 1 0 0 2 1 1 0 3 1 0 1 4 1 0 0 5 1 1 0 6 1 0 1 7 1 0 0 8 1 1 0 9 1 0 1 10 1 0 1 attr(,"assign") [1] 0 1 1 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~w%in%v))) } (Intercept) w:v 1 1 18 2 1 28 3 1 40 4 1 54 5 1 70 6 1 88 7 1 108 8 1 130 9 1 154 10 1 180 attr(,"assign") [1] 0 1 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~w/k))) } (Intercept) w w:km 1 1 3 3 2 1 4 0 3 1 5 5 4 1 6 0 5 1 7 7 6 1 8 0 7 1 9 9 8 1 10 0 9 1 11 11 10 1 12 0 attr(,"assign") [1] 0 1 2 attr(,"contrasts") attr(,"contrasts")$k [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~z))) } (Intercept) zb zc 1 1 0 0 2 1 1 0 3 1 0 1 4 1 0 0 5 1 1 0 6 1 0 1 7 1 0 0 8 1 1 0 9 1 0 1 10 1 0 1 attr(,"assign") [1] 0 1 1 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~z*((m+w)^3)))) } (Intercept) zb zc m w m:w zb:m zc:m zb:w zc:w zb:m:w zc:m:w 1 1 0 0 4 3 12 0 0 0 0 0 0 2 1 1 0 5 4 20 5 0 4 0 20 0 3 1 0 1 6 5 30 0 6 0 5 0 30 4 1 0 0 7 6 42 0 0 0 0 0 0 5 1 1 0 8 7 56 8 0 7 0 56 0 6 1 0 1 9 8 72 0 9 0 8 0 72 7 1 0 0 10 9 90 0 0 0 0 0 0 8 1 1 0 11 10 110 11 0 10 0 110 0 9 1 0 1 12 11 132 0 12 0 11 0 132 10 1 0 1 13 12 156 0 13 0 12 0 156 attr(,"assign") [1] 0 1 1 2 3 4 5 5 6 6 7 7 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~z*k))) } (Intercept) zb zc km zb:km zc:km 1 1 0 0 1 0 0 2 1 1 0 0 0 0 3 1 0 1 1 0 1 4 1 0 0 0 0 0 5 1 1 0 1 1 0 6 1 0 1 0 0 0 7 1 0 0 1 0 0 8 1 1 0 0 0 0 9 1 0 1 1 0 1 10 1 0 1 0 0 0 attr(,"assign") [1] 0 1 1 2 3 3 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" attr(,"contrasts")$k [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~z*k+w*m))) } (Intercept) zb zc km w m zb:km zc:km w:m 1 1 0 0 1 3 4 0 0 12 2 1 1 0 0 4 5 0 0 20 3 1 0 1 1 5 6 0 1 30 4 1 0 0 0 6 7 0 0 42 5 1 1 0 1 7 8 1 0 56 6 1 0 1 0 8 9 0 0 72 7 1 0 0 1 9 10 0 0 90 8 1 1 0 0 10 11 0 0 110 9 1 0 1 1 11 12 0 1 132 10 1 0 1 0 12 13 0 0 156 attr(,"assign") [1] 0 1 1 2 3 4 5 5 6 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" attr(,"contrasts")$k [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~z:k))) } (Intercept) za:kf zb:kf zc:kf za:km zb:km zc:km 1 1 0 0 0 1 0 0 2 1 0 1 0 0 0 0 3 1 0 0 0 0 0 1 4 1 1 0 0 0 0 0 5 1 0 0 0 0 1 0 6 1 0 0 1 0 0 0 7 1 0 0 0 1 0 0 8 1 0 1 0 0 0 0 9 1 0 0 0 0 0 1 10 1 0 0 1 0 0 0 attr(,"assign") [1] 0 1 1 1 1 1 1 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" attr(,"contrasts")$k [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(y~z^2))) } (Intercept) zb zc 1 1 0 0 2 1 1 0 3 1 0 1 4 1 0 0 5 1 1 0 6 1 0 1 7 1 0 0 8 1 1 0 9 1 0 1 10 1 0 1 attr(,"assign") [1] 0 1 1 attr(,"contrasts") attr(,"contrasts")$z [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(~1))) } (Intercept) attr(,"assign") [1] 0 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testModelMatrix# #{y<-0:9;z<-1:10;k<-2:11;w<-3:12;m<-4:13;u<-5:14;v<-6:15;k <- factor(rep(c('m', 'f'), 5));z <- factor(c(rep(c('a', 'b', 'c'), 3), 'c')); ; model.matrix(model.frame(terms.formula(~k+y+z))) } (Intercept) km y zb zc 1 1 1 0 0 0 2 1 0 1 1 0 3 1 1 2 0 1 4 1 0 3 0 0 5 1 1 4 1 0 6 1 0 5 0 1 7 1 1 6 0 0 8 1 0 7 1 0 9 1 1 8 0 1 10 1 0 9 0 1 attr(,"assign") [1] 0 1 2 3 3 attr(,"contrasts") attr(,"contrasts")$k [1] "contr.treatment" attr(,"contrasts")$z [1] "contr.treatment" ##com.oracle.truffle.r.test.library.stats.TestFormulae.testSpecialsTermsform# #f <- terms.formula(y~myfun(z)+x, c('myfun')); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors myfun(z) x y 0 0 myfun(z) 1 0 x 0 1 $intercept [1] 1 $order [1] 1 1 $response [1] 1 $specials $specials$myfun [1] 2 $term.labels [1] "myfun(z)" "x" $variables list(y, myfun(z), x) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testSubsettingModelframe# #{x<-y<-1:10; model.frame.default(x~y, subset=3:7); } x y 3 3 3 4 4 4 5 5 5 6 6 6 7 7 7 ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(u~z*k+w*m); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z k w m z:k w:m u 0 0 0 0 0 0 z 1 0 0 0 1 0 k 0 1 0 0 1 0 w 0 0 1 0 0 1 m 0 0 0 1 0 1 $intercept [1] 1 $order [1] 1 1 1 1 2 2 $response [1] 1 $term.labels [1] "z" "k" "w" "m" "z:k" "w:m" $variables list(u, z, k, w, m) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~(1 + w/k)); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors w w:k y 0 0 w 1 2 k 0 1 $intercept [1] 1 $order [1] 1 2 $response [1] 1 $term.labels [1] "w" "w:k" $variables list(y, w, k) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~(z+k)*(w+u)); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z k w u z:w z:u k:w k:u y 0 0 0 0 0 0 0 0 z 1 0 0 0 1 1 0 0 k 0 1 0 0 0 0 1 1 w 0 0 1 0 1 0 1 0 u 0 0 0 1 0 1 0 1 $intercept [1] 1 $order [1] 1 1 1 1 2 2 2 2 $response [1] 1 $term.labels [1] "z" "k" "w" "u" "z:w" "z:u" "k:w" "k:u" $variables list(y, z, k, w, u) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~(z+k)^2); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z k z:k y 0 0 0 z 1 0 1 k 0 1 1 $intercept [1] 1 $order [1] 1 1 2 $response [1] 1 $term.labels [1] "z" "k" "z:k" $variables list(y, z, k) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~-1+z); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z y 0 z 1 $intercept [1] 0 $order [1] 1 $response [1] 1 $term.labels [1] "z" $variables list(y, z) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~0+z); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z y 0 z 1 $intercept [1] 0 $order [1] 1 $response [1] 1 $term.labels [1] "z" $variables list(y, z) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~1+z); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z y 0 z 1 $intercept [1] 1 $order [1] 1 $response [1] 1 $term.labels [1] "z" $variables list(y, z) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~w%in%v); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors w:v y 0 w 2 v 2 $intercept [1] 1 $order [1] 2 $response [1] 1 $term.labels [1] "w:v" $variables list(y, w, v) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~w/k); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors w w:k y 0 0 w 1 2 k 0 1 $intercept [1] 1 $order [1] 1 2 $response [1] 1 $term.labels [1] "w" "w:k" $variables list(y, w, k) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~z); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z y 0 z 1 $intercept [1] 1 $order [1] 1 $response [1] 1 $term.labels [1] "z" $variables list(y, z) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~z*((m+w)^3)); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z m w m:w z:m z:w z:m:w y 0 0 0 0 0 0 0 z 1 0 0 0 1 1 1 m 0 1 0 1 1 0 1 w 0 0 1 1 0 1 1 $intercept [1] 1 $order [1] 1 1 1 2 2 2 3 $response [1] 1 $term.labels [1] "z" "m" "w" "m:w" "z:m" "z:w" "z:m:w" $variables list(y, z, m, w) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~z*k); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z k z:k y 0 0 0 z 1 0 1 k 0 1 1 $intercept [1] 1 $order [1] 1 1 2 $response [1] 1 $term.labels [1] "z" "k" "z:k" $variables list(y, z, k) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~z*k+w*m); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z k w m z:k w:m y 0 0 0 0 0 0 z 1 0 0 0 1 0 k 0 1 0 0 1 0 w 0 0 1 0 0 1 m 0 0 0 1 0 1 $intercept [1] 1 $order [1] 1 1 1 1 2 2 $response [1] 1 $term.labels [1] "z" "k" "w" "m" "z:k" "w:m" $variables list(y, z, k, w, m) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~z:k); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z:k y 0 z 2 k 2 $intercept [1] 1 $order [1] 2 $response [1] 1 $term.labels [1] "z:k" $variables list(y, z, k) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(y~z^2); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors z y 0 z 1 $intercept [1] 1 $order [1] 1 $response [1] 1 $term.labels [1] "z" $variables list(y, z) ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(~1); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors integer(0) $intercept [1] 1 $order integer(0) $response [1] 0 $term.labels character(0) $variables list() ##com.oracle.truffle.r.test.library.stats.TestFormulae.testTermsform# #f <- terms.formula(~k+y+z); attrs <- attributes(f); envIdx <- which(names(attrs)=='.Environment'); print(attrs[envIdx]); attrs[sort(names(attrs[-envIdx]))] $.Environment $class [1] "terms" "formula" $factors k y z k 1 0 0 y 0 1 0 z 0 0 1 $intercept [1] 1 $order [1] 1 1 1 $response [1] 0 $term.labels [1] "k" "y" "z" $variables list(k, y, z) ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed#Ignored.ImplementationError# #exists('.Random.seed', envir = .GlobalEnv, inherits = FALSE) [1] FALSE ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed#Ignored.ImplementationError# #{ .GlobalEnv$.Random.seed } NULL ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed# #{ .Random.seed <- 1:3; .GlobalEnv$.Random.seed } [1] 1 2 3 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed# #{ .Random.seed <- 1:3; .Random.seed } [1] 1 2 3 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed# #{ .Random.seed <- 1:3; print(.Random.seed) } [1] 1 2 3 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed#Ignored.ImplementationError# #{ .Random.seed <- c(1,2,3); rm(list=ls(all.names=TRUE, envir=.GlobalEnv), envir=.GlobalEnv); set.seed(11) } ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed#Ignored.ImplementationError# #{ .Random.seed <- c(1,2,3); rm(list=ls(all.names=TRUE, envir=.GlobalEnv), envir=.GlobalEnv); set.seed(11); rnorm(5) } [1] -0.59103110 0.02659437 -1.51655310 -1.36265335 1.17848916 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed#Ignored.ImplementationError#Output.IgnoreErrorContext# #{ .Random.seed } Error: object '.Random.seed' not found ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed#Ignored.ImplementationError#Output.IgnoreErrorContext# #{ get('.Random.seed', envir = .GlobalEnv, inherits = FALSE) } Error in get(".Random.seed", envir = .GlobalEnv, inherits = FALSE) : object '.Random.seed' not found ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed#Ignored.ImplementationError#Output.IgnoreErrorContext# #{ get('.Random.seed', envir = .GlobalEnv, inherits = TRUE) } Error in get(".Random.seed", envir = .GlobalEnv, inherits = TRUE) : object '.Random.seed' not found ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed#Ignored.ImplementationError# #{ get0('.Random.seed', envir = .GlobalEnv, inherits = FALSE) } NULL ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed#Ignored.ImplementationError# #{ get0('.Random.seed', envir = .GlobalEnv, inherits = TRUE) } NULL ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed#Ignored.ImplementationError#Output.IgnoreErrorContext# #{ print(.Random.seed) } Error in print(.Random.seed) : object '.Random.seed' not found ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed# #{ runif(1); length(.GlobalEnv$.Random.seed) } [1] 626 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed# #{ runif(1); length(.Random.seed) } [1] 626 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testDotRandomSeed# #{ runif(1); print(length(.Random.seed)) } [1] 626 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions1#Output.IgnoreWhitespace# #set.seed(10); rsignrank(12, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.6, 0.0653, 0.000123, 32e-80, 10)) [1] NA NA 0 NA NA 1 0 NA 0 0 0 21 Warning message: In rsignrank(12, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.6, 0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions1#Output.IgnoreWhitespace# #set.seed(2); rchisq(13, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.5, 0.0653, 0.000123, 32e-80, 8833, 79e70)) [1] NaN NaN NaN NaN NaN [6] 9.582518e-02 7.012801e-02 NaN 2.294588e-10 0.000000e+00 [11] 0.000000e+00 8.813564e+03 7.900000e+71 Warning message: In rchisq(13, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.5, 0.0653, 0.000123, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions1#Output.IgnoreWhitespace# #set.seed(2); rexp(13, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.5, 0.0653, 0.000123, 32e-80, 8833, 79e70)) [1] NaN NaN 0.000000e+00 0.000000e+00 NaN [6] 1.865352e+00 1.349160e+00 NaN 2.245830e+00 1.407081e+04 [11] 2.797693e+77 7.550069e-05 1.359958e-72 Warning message: In rexp(13, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.5, 0.0653, 0.000123, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions1#Ignored.ImplementationError# #set.seed(2); rgeom(13, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.5, 0.0653, 0.000123, 32e-80, 8833, 79e70)) [1] NA NA NA NA NA [6] 0.000000e+00 1.000000e+00 NA 3.200000e+01 1.164300e+04 [11] 3.123984e+77 NaN NaN Warning message: In rgeom(13, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.5, 0.0653, 0.000123, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions1#Ignored.ImplementationError# #set.seed(2); rpois(13, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.5, 0.0653, 0.000123, 32e-80, 8833, 79e70)) [1] NA NA NA NA NA 0.000e+00 0.000e+00 [8] NA 0.000e+00 0.000e+00 0.000e+00 8.981e+03 7.900e+71 Warning message: In rpois(13, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.5, 0.0653, 0.000123, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions1#Output.IgnoreWhitespace# #set.seed(2); rt(13, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.5, 0.0653, 0.000123, 32e-80, 8833, 79e70)) [1] NaN NaN -0.89691455 NaN NaN 0.19975785 [7] -0.06927937 NaN 0.96073767 -Inf Inf 0.87841766 [13] 1.01282869 Warning message: In rt(13, c(NA, NaN, 1/0, -1/0, -1, 1, 0.3, -0.5, 0.0653, 0.000123, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rbeta(10, 10, 10) [1] 0.4202441 0.5231868 0.3929161 0.7104015 0.5416782 0.3949132 0.5618393 [8] 0.5943116 0.5732049 0.4613867 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rbeta(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] NaN 0.00000000 1.00000000 0.82338531 0.17213601 NaN [7] 1.00000000 NaN 0.00000000 0.06525112 NaN 1.00000000 [13] 0.99955874 0.92371833 NaN NaN 1.00000000 0.99409008 [19] 0.93534230 0.58348863 Warning message: In rbeta(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rbeta(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] 9.999998e-01 6.842102e-313 1.000000e+00 5.020914e-01 5.000000e-01 [6] 1.000000e+00 NaN 0.000000e+00 1.000000e+00 1.000000e+00 [11] 2.914034e-12 6.842102e-313 1.000000e+00 NaN 1.000000e+00 [16] 1.000000e+00 1.000000e+00 0.000000e+00 1.117379e-68 1.000000e+00 [21] NaN 6.842102e-313 0.000000e+00 1.000000e+00 Warning message: In rbeta(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rbeta(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NaN NaN NaN 1.0 NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN 0.0 NaN NaN [20] NaN NaN 0.0 NaN NaN NaN NaN NaN NaN 0.5 NaN Warning message: In rbeta(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rcauchy(10, 10, 10) [1] 21.025199 33.538306 -32.926262 7.033574 17.346469 6.694780 [7] 8.244206 -8.082431 -13.286244 11.965824 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rcauchy(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] NaN 0.0000000 0.3102520 4.1184475 -9.8778787 NaN [7] 5.0000000 -1.0296643 0.6611822 -0.7915660 NaN 3.0000000 [13] 3.9824421 3.3725812 -7.9858732 NaN 0.2000000 2.0196582 [19] 3.6800580 5.8586450 Warning message: In rcauchy(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rcauchy(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] 1.372945e-01 4.125212e-04 -1.053640e-78 6.212756e+03 1.370371e+72 [6] 6.530000e-02 NaN -2.158309e-02 8.833000e+03 7.900000e+71 [11] -2.056867e+04 1.553001e+71 3.200000e-79 NaN 7.900000e+71 [16] 6.537620e-02 1.230000e-04 2.317827e+04 -6.971785e+71 7.900000e+71 [21] NaN 9.034221e+00 -1.509671e-04 8.833000e+03 Warning message: In rcauchy(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rcauchy(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NaN NaN NaN Inf NaN NaN NaN NaN NaN -Inf NaN NaN NaN NaN NaN [16] NaN NaN NaN NaN NaN NaN 0 NaN NaN NaN NaN NaN NaN NaN NaN Warning message: In rcauchy(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rchisq(10, 10, 10) [1] 11.63643 18.45545 21.64372 16.07794 20.36424 15.71556 20.77667 26.42402 [9] 20.58523 10.62996 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rchisq(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] NaN 0.000000e+00 1.461521e-04 1.839736e+00 6.956474e-01 [6] NaN 3.209835e+00 NaN 7.291872e+00 7.885483e+00 [11] NaN 9.504888e-01 6.388242e+00 4.745204e+00 NaN [16] NaN 1.439251e-07 2.498584e+00 4.578127e+00 5.322404e+00 Warning message: In rchisq(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rchisq(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] 2.046068e-13 0.000000e+00 0.000000e+00 1.771339e+04 1.580000e+72 [6] 8.055558e-18 NaN 0.000000e+00 8.829848e+03 7.900000e+71 [11] 9.032093e+03 7.900000e+71 0.000000e+00 NaN 7.900000e+71 [16] 1.767431e-01 0.000000e+00 8.563832e+03 7.900000e+71 7.900000e+71 [21] NaN 0.000000e+00 0.000000e+00 8.986379e+03 Warning message: In rchisq(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rchisq(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NaN NaN NaN Inf NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN [20] NaN NaN 0 NaN NaN NaN NaN NaN NaN NaN NaN Warning message: In rchisq(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rf(10, 10, 10) [1] 0.4211249 1.4022872 0.3264808 1.0686054 1.3072335 0.8433459 1.5694522 [8] 1.0962100 1.0552082 3.6708927 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rf(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] NaN NaN 5.990604e-02 2.030321e+00 4.383017e-01 [6] NaN NaN NaN NaN 4.387668e-04 [11] NaN NaN 1.015302e+10 1.322782e-01 NaN [16] NaN NaN 2.373490e-01 1.865997e+00 1.215399e+00 Warning message: In rf(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rf(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] 5.907040e-11 NaN NaN 1.024705e+00 1.000000e+00 [6] NaN NaN 0.000000e+00 Inf Inf [11] 1.607677e-07 0.000000e+00 NaN NaN 2.079267e+10 [16] Inf NaN 0.000000e+00 9.974128e-01 NaN [21] NaN 0.000000e+00 NaN Inf Warning message: In rf(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rf(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN [20] NaN NaN NaN NaN NaN NaN NaN NaN NaN 1 NaN Warning message: In rf(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rgamma(10, 10, 10) [1] 0.7667251 1.4040808 1.3826660 1.0820993 0.5346417 1.1061754 1.1911950 [8] 1.1357558 0.8582045 0.7196892 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rgamma(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] NaN 0.00000000 0.01881730 1.92594160 0.45110798 NaN [7] Inf NaN 0.00000000 0.05989429 NaN Inf [13] 62.08824595 6.89167118 NaN 0.00000000 Inf 22.88066299 [19] 2.26717120 0.72159817 Warning message: In rgamma(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rgamma(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] 3.336908e-08 0.000000e+00 0.000000e+00 1.003452e+00 1.000000e+00 [6] Inf NaN 0.000000e+00 7.180454e+07 2.468750e+150 [11] 7.939465e-15 0.000000e+00 Inf NaN 1.209801e+73 [16] 1.378517e+03 0.000000e+00 0.000000e+00 1.129294e-68 Inf [21] NaN 0.000000e+00 0.000000e+00 2.783175e+82 Warning message: In rgamma(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rgamma(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NaN NaN NaN Inf 0 NaN NaN NaN NaN NaN NaN 0 NaN NaN NaN NaN 0 NaN NaN [20] NaN NaN 0 NaN 0 NaN NaN NaN NaN 0 0 Warning message: In rgamma(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rlnorm(10, 10, 10) [1] 4.190738e+01 1.381967e+05 5.174351e+00 1.867073e+11 5.942633e+05 [6] 6.021378e+00 2.882852e+06 3.543629e+07 6.974795e+06 1.039106e+03 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rlnorm(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] NaN 1.0000000 1.1472349 8.7170336 1.6374074 NaN [7] 148.4131591 0.4315068 1.3452192 0.1042040 NaN 20.0855369 [13] 57.3253483 288.4414833 2.0695766 NaN 1.2214028 7.1668137 [19] 78.3043417 175.8321258 Warning message: In rlnorm(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rlnorm(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] 1.0246925 1.0001456 1.0000000 Inf Inf 1.0674792 NaN [8] 0.9478333 Inf Inf Inf 0.0000000 1.0000000 NaN [15] Inf 1.0675304 1.0001230 0.0000000 Inf Inf NaN [22] 0.9971928 0.9999980 Inf Warning message: In rlnorm(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rlnorm(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NaN NaN NaN Inf NaN NaN NaN NaN NaN 0 NaN NaN NaN NaN NaN NaN NaN NaN NaN [20] NaN NaN 1 NaN NaN NaN NaN NaN NaN NaN NaN Warning message: In rlnorm(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rlogis(10, 10, 10) [1] -0.1753073 4.7688401 12.9350241 32.9194576 -3.7581524 31.7945887 [7] 38.3762121 16.6685147 15.2841793 -17.2029660 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rlogis(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] 0.01753073 0.00000000 0.14768840 2.26415217 9.87583728 5.37581524 [7] 5.00000000 -0.78205411 2.55385909 2.20055441 1.47158207 3.00000000 [13] 3.72797034 3.78557353 -5.61955679 -0.78623735 0.20000000 1.95278340 [19] 4.08667440 3.97239071 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rlogis(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] -1.144757e-03 5.865673e-05 4.139208e-79 2.907776e+04 -2.968940e+71 [6] 6.530000e-02 -2.179336e+00 1.852967e-01 8.833000e+03 7.900000e+71 [11] -2.402831e+04 -1.065997e+72 3.200000e-79 8.834540e+03 7.900000e+71 [16] 6.524192e-02 1.230000e-04 -8.129095e+01 7.368165e+71 7.900000e+71 [21] -4.743217e+00 -3.183475e-02 1.538533e-04 8.833000e+03 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rlogis(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NaN NaN NaN Inf NaN NaN NaN NaN NaN -Inf NaN NaN NaN NaN NaN [16] NaN NaN NaN NaN NaN NaN 0 NaN NaN NaN NaN NaN NaN NaN NaN Warning message: In rlogis(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rnbinom(10, 10, 10) [1] NA NA NA NA NA NA NA NA NA NA Warning message: In rnbinom(10, 10, 10) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rnbinom(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] NA NA 0 1 NA NA NA NA NA NA NA NA 66 0 NA NA NA 25 0 NA Warning message: In rnbinom(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Ignored.ImplementationError# #set.seed(1); rnbinom(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] 0.000000e+00 0.000000e+00 0.000000e+00 NA NA [6] NA NA 0.000000e+00 7.109868e+07 2.468750e+150 [11] NaN NaN NaN NaN 1.130801e+73 [16] 0.000000e+00 0.000000e+00 NaN NaN NaN [21] NaN 0.000000e+00 0.000000e+00 2.787212e+82 Warning message: In rnbinom(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rnbinom(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA NA [26] NA NA NA NA NA Warning message: In rnbinom(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rnorm(10, 10, 10) [1] 3.735462 11.836433 1.643714 25.952808 13.295078 1.795316 14.874291 [8] 17.383247 15.757814 6.946116 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rnorm(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] NaN 0.0000000 0.1373546 2.1652790 0.4931142 NaN [7] 5.0000000 -0.8404719 0.2965570 -2.2614052 NaN 3.0000000 [13] 4.0487429 5.6644922 0.7273441 NaN 0.2000000 1.9694612 [19] 4.3606031 5.1695297 Warning message: In rnorm(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rnorm(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] 2.439257e-02 1.455881e-04 5.259884e-80 2.292412e+04 1.050311e+72 [6] 6.530000e-02 NaN -5.357659e-02 8.833000e+03 7.900000e+71 [11] 5.085942e+03 -2.412568e+71 3.200000e-79 NaN 7.900000e+71 [16] 6.534795e-02 1.230000e-04 -1.956244e+04 8.886954e+71 7.900000e+71 [21] NaN -2.811165e-03 -1.991402e-06 8.833000e+03 Warning message: In rnorm(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rnorm(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NaN NaN NaN Inf NaN NaN NaN NaN NaN -Inf NaN NaN NaN NaN NaN [16] NaN NaN NaN NaN NaN NaN 0 NaN NaN NaN NaN NaN NaN NaN NaN Warning message: In rnorm(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); runif(10, 10, 10) [1] 10 10 10 10 10 10 10 10 10 10 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); runif(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] -1.0000000 0.0000000 NaN NaN 3.0000000 NaN [7] NaN -0.7079405 0.3349115 1.8039894 NaN NaN [13] NaN NaN 2.6328312 NaN NaN NaN [19] NaN NaN Warning message: In runif(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); runif(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] 6.530000e-02 1.230000e-04 3.200000e-79 8.833000e+03 7.900000e+71 [6] NaN NaN 1.733772e-02 NaN NaN [11] 3.287011e+03 4.525542e+71 NaN NaN NaN [16] NaN NaN 8.022199e+03 1.593287e+71 NaN [21] NaN 5.867734e-02 1.161951e-04 NaN Warning message: In runif(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); runif(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN [20] NaN NaN 0 NaN NaN NaN NaN NaN NaN NaN NaN Warning message: In runif(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rweibull(10, 10, 10) [1] 10.286269 9.988469 9.431816 7.913244 10.481920 7.998338 7.507960 [8] 9.156558 9.259757 11.078171 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rweibull(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] NaN 0.000000e+00 4.101041e-01 8.948229e-01 2.468533e+00 [6] NaN 0.000000e+00 NaN NaN 2.482268e-05 [11] NaN 0.000000e+00 1.124869e-01 5.757607e-01 NaN [16] NaN 0.000000e+00 2.385666e-02 6.709396e-01 2.475257e+00 Warning message: In rweibull(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rweibull(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) [1] 4.921274e+00 2.245712e-45 0.000000e+00 8.830660e+03 7.900000e+71 [6] 0.000000e+00 NaN 0.000000e+00 1.229601e-04 3.200000e-79 [11] 6.779436e-02 Inf 0.000000e+00 NaN 6.530000e-02 [16] 5.637942e-01 0.000000e+00 0.000000e+00 7.898801e+71 0.000000e+00 [21] NaN 0.000000e+00 0.000000e+00 3.198257e-79 Warning message: In rweibull(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rweibull(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) [1] NaN NaN NaN 0 NaN NaN NaN NaN NaN 0 NaN NaN NaN NaN NaN 0 NaN NaN NaN [20] NaN NaN 0 NaN NaN NaN NaN NaN 0 NaN NaN Warning message: In rweibull(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rwilcox(10, 10, 10) [1] 36 55 41 63 69 59 83 66 51 75 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rwilcox(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) [1] NA 0 0 0 1 NA 0 NA 0 0 NA 0 0 4 NA NA 0 0 2 5 Warning message: In rwilcox(20, c(-1, 0, 0.2, 2:5), c(-1, 0, 0.1, 0.9, 3)) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rwilcox(24, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1)) Error in rwilcox(24, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : 'Calloc' could not allocate memory (18446744071562067968 of 4 bytes) ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2#Output.IgnoreWhitespace# #set.seed(1); rwilcox(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0)) Error in rwilcox(30, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, : 'Calloc' could not allocate memory (18446744071562067968 of 4 bytes) ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2Infrastructure# #length(runif('3')) [1] 3 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2Infrastructure# #length(runif(c('a', 'b', 'b', 'd'))) [1] 4 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2Infrastructure# #length(runif(c(1,2,3))) [1] 3 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2Infrastructure# #runif('hello') Error in runif("hello") : invalid arguments In addition: Warning message: In runif("hello") : NAs introduced by coercion ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2Infrastructure# #runif(-1, 1, 2) Error in runif(-1, 1, 2) : invalid arguments ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2Infrastructure# #runif(2, 2, numeric()) [1] NA NA Warning message: In runif(2, 2, numeric()) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions2Infrastructure# #runif(2, numeric(), 2) [1] NA NA Warning message: In runif(2, numeric(), 2) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions3# #rhyper(1, -5, 5, 20) [1] NA Warning message: In rhyper(1, -5, 5, 20) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions3# #rhyper(1, 5, 5, -1/0) [1] NA Warning message: In rhyper(1, 5, 5, -1/0) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions3# #rhyper(1, 5, 5, 1/0) [1] NA Warning message: In rhyper(1, 5, 5, 1/0) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions3# #rhyper(1, 5, 5, 20) [1] NA Warning message: In rhyper(1, 5, 5, 20) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions3# #rhyper(1, 5, NaN, 20) [1] NA Warning message: In rhyper(1, 5, NaN, 20) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions3# #rhyper(1, NA, 5, 20) [1] NA Warning message: In rhyper(1, NA, 5, 20) : NAs produced ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions3# #set.seed(3); rhyper(2, 1000, 1000, 5) [1] 1 3 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions3# #set.seed(3); rhyper(3, 10, 10, 5) [1] 2 3 2 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testFunctions3# #set.seed(3); rhyper(3, 10, 79e70, 2) [1] 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testGenerators# #for(gen in c("Buggy Kinderman-Ramage", "Ahrens-Dieter", "Box-Muller", "Inversion", "Kinderman-Ramage", "default")) { print(paste0(gen, ":")); RNGkind(NULL,gen); set.seed(42); print(rnorm(30)); } [1] "Buggy Kinderman-Ramage:" [1] -0.79604712 1.28771872 0.71745084 -0.42255829 0.56567165 1.65777846 [7] -0.55131328 1.00482417 -0.24735845 0.24860615 -0.36036694 -1.73747216 [13] -0.25369717 -1.04076998 2.23551204 -0.28116912 -0.46380894 -0.16281811 [19] 1.16178557 -1.20815956 0.57057609 2.45914868 0.33370144 0.29920774 [25] 0.05462671 -1.79697222 -0.61127365 -0.12708318 -1.36417253 -0.92312656 [1] "Ahrens-Dieter:" [1] -1.273084700 -1.414657032 0.739312189 -0.893074355 -0.321064732 [6] -0.008679202 -0.584610918 0.302830939 -0.361476229 -0.493404872 [11] 1.546579146 -0.553905239 -1.531588211 -0.112289664 -1.217388818 [16] 0.313559035 -2.138347829 1.148211398 -1.226981451 1.478797153 [21] -0.915508892 -0.587726941 -0.825282001 1.137582651 -0.438588414 [26] 2.420172264 2.565920821 1.405014135 0.054642602 -1.756587679 [1] "Box-Muller:" [1] 0.31010081 -0.18390356 -0.13723045 0.59392645 -0.72021551 -0.89029361 [7] -0.16854514 -1.99536938 -0.46122133 -0.69728478 -0.78362342 0.21309613 [13] 1.51492034 -0.65927181 -0.34191267 0.08255685 2.05016803 -0.28224116 [19] -1.06305839 0.16839189 1.63711374 -1.12720712 0.33027271 -0.02308900 [25] 1.00206928 0.57104929 -0.34322783 0.28320445 -0.56561519 0.19576159 [1] "Inversion:" [1] 1.37095845 -0.56469817 0.36312841 0.63286260 0.40426832 -0.10612452 [7] 1.51152200 -0.09465904 2.01842371 -0.06271410 1.30486965 2.28664539 [13] -1.38886070 -0.27878877 -0.13332134 0.63595040 -0.28425292 -2.65645542 [19] -2.44046693 1.32011335 -0.30663859 -1.78130843 -0.17191736 1.21467470 [25] 1.89519346 -0.43046913 -0.25726938 -1.76316309 0.46009735 -0.63999488 [1] "Kinderman-Ramage:" [1] -0.79604712 1.28771872 0.71745084 -0.42255829 0.56567165 1.65777846 [7] -0.55131328 1.00482417 -0.24735845 0.21355380 1.43016945 0.27516802 [13] -0.36036694 -1.73747216 -0.25369717 -1.04076998 2.23551204 -0.28116912 [19] -0.46380894 -0.16281811 1.16178557 -1.20815956 0.57057609 2.45914868 [25] 0.33370144 0.29920774 0.05462671 -1.79697222 -0.61127365 -0.12708318 [1] "default:" [1] 1.37095845 -0.56469817 0.36312841 0.63286260 0.40426832 -0.10612452 [7] 1.51152200 -0.09465904 2.01842371 -0.06271410 1.30486965 2.28664539 [13] -1.38886070 -0.27878877 -0.13332134 0.63595040 -0.28425292 -2.65645542 [19] -2.44046693 1.32011335 -0.30663859 -1.78130843 -0.17191736 1.21467470 [25] 1.89519346 -0.43046913 -0.25726938 -1.76316309 0.46009735 -0.63999488 Warning message: In RNGkind(NULL, gen) : buggy version of Kinderman-Ramage generator used ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testRmultinom# #rmultinom('string', 1, 0.15) Error in rmultinom("string", 1, 0.15) : invalid first argument 'n' In addition: Warning message: In rmultinom("string", 1, 0.15) : NAs introduced by coercion ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testRmultinom# #rmultinom(1, 1, -0.15) Error in rmultinom(1, 1, -0.15) : negative probability ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testRmultinom# #rmultinom(1, NA, 0.2) Error in rmultinom(1, NA, 0.2) : invalid second argument 'size' ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testRmultinom# #rmultinom(NA, 1, 0.2) Error in rmultinom(NA, 1, 0.2) : invalid first argument 'n' ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testRmultinom# #set.seed(11); rmultinom(10, 5, c(0.1, 0.1, 0.3, 0.2, 0.3)) [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] 0 0 1 1 0 0 0 0 0 0 [2,] 0 2 0 1 0 1 0 0 0 0 [3,] 2 0 1 2 1 1 2 2 3 1 [4,] 0 1 1 0 2 1 0 1 1 0 [5,] 3 2 2 1 2 2 3 2 1 4 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testRmultinom# #set.seed(11); rmultinom(7, 8, structure(c(0.1, 0.1), .Names=c('a', 'B'))) [,1] [,2] [,3] [,4] [,5] [,6] [,7] a 3 0 4 1 2 6 2 B 5 8 4 7 6 2 6 ##com.oracle.truffle.r.test.library.stats.TestRandGenerationFunctions.testRmultinom# #set.seed(12); rmultinom('5', 3.1, c(2, 5, 10)) [,1] [,2] [,3] [,4] [,5] [1,] 0 1 0 0 0 [2,] 2 0 0 1 0 [3,] 1 2 3 2 3 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 'abc', c(1:5), c(1:5)) $method [1] NA $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, -1, c(1:5), c(1:5)) $method [1] -1 $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 0, c(1:5), c(1:5)) $method [1] 0 $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, NA, NA) $method [1] 1 $n [1] 1 $x [1] NA $y [1] NA $b [1] 0 $c [1] 0 $d [1] 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, NA, c(1:5)) Error: inputs of different lengths ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, NULL, NULL) $method [1] 1 $n [1] 0 $x numeric(0) $y numeric(0) $b numeric(0) $c numeric(0) $d numeric(0) ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, NULL, c(1:5)) Error: inputs of different lengths ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, c(1), c(1)) $method [1] 1 $n [1] 1 $x [1] 1 $y [1] 1 $b [1] 0 $c [1] 0 $d [1] 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, c(1), list(1)) $method [1] 1 $n [1] 1 $x [1] 1 $y [1] 1 $b [1] 0 $c [1] 0 $d [1] 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, c(1:5), NA) Error: inputs of different lengths ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, c(1:5), NULL) Error: inputs of different lengths ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, c(1:5), c(1:5)) $method [1] 1 $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, c(1:6), c(1:5, 1)) $method [1] 1 $n [1] 6 $x [1] 1 2 3 4 5 6 $y [1] 1 2 3 4 5 1 $b [1] -2.1818182 1.9090909 0.5454545 1.9090909 -2.1818182 -2.1818182 $c [1] 5.454545e+00 -1.363636e+00 -2.154731e-17 1.363636e+00 -5.454545e+00 [6] 5.454545e+00 $d [1] -2.2727273 0.4545455 0.4545455 -2.2727273 3.6363636 -2.2727273 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 1, list(1), c(1)) $method [1] 1 $n [1] 1 $x [1] 1 $y [1] 1 $b [1] 0 $c [1] 0 $d [1] 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 111, c(1:5), c(1:5)) $method [1] 111 $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 2, c(1), c(1)) $method [1] 2 $n [1] 1 $x [1] 1 $y [1] 1 $b [1] 0 $c [1] 0 $d [1] 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 2, c(1:5), c(1:5)) $method [1] 2 $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 1 1 1 1 1 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 3, c(1:5), c(1:5)) $method [1] 3 $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 1 1 1 1 1 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, 4, c(1:5), c(1:5)) $method [1] 4 $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, NA, c(1:5), c(1:5)) $method [1] NA $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, NULL, c(1:5), c(1:5)) $method [1] NA $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, c('a'), c(1), c(1)) $method [1] NA $n [1] 1 $x [1] 1 $y [1] 1 $b [1] 0 $c [1] 0 $d [1] 0 Warning message: NAs introduced by coercion ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, c(), c(1:5), c(1:5)) $method [1] NA $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, c(1), c(1:5), c(1:5)) $method [1] 1 $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, c(1, 2, 3), c(1), c(1)) $method [1] 1 $n [1] 1 $x [1] 1 $y [1] 1 $b [1] 0 $c [1] 0 $d [1] 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, c(list()), c(1:5), c(1:5)) $method [1] NA $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef#Ignored.WrongCaller# #.Call(stats:::C_SplineCoef, environment(), c(1:5), c(1:5)) $method [1] NA $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef#Ignored.WrongCaller# #.Call(stats:::C_SplineCoef, function() {}, c(1:5), c(1:5)) $method [1] NA $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef# #.Call(stats:::C_SplineCoef, list(), c(1:5), c(1:5)) $method [1] NA $n [1] 5 $x [1] 1 2 3 4 5 $y [1] 1 2 3 4 5 $b [1] 0 0 0 0 0 $c [1] 0 0 0 0 0 $d [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestSplineFunctions.basicSplineCoef#Ignored.WrongCaller# #.Call(stats:::C_SplineCoef, list(1), c(1), c(1)) $method [1] NA $n [1] 1 $x [1] 1 $y [1] 1 $b [1] 0 $c [1] 0 $d [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dchisq(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), log=FALSE) [1] Inf Inf Inf 0 0 Inf NaN Warning message: In dchisq(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dchisq(10, 10, log=TRUE) [1] -2.433449 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dchisq(3, 3, log=FALSE) [1] 0.1541803 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log=FALSE) [1] NaN Inf 0.207096473 0.093458828 0.000000000 NaN [7] 0.000000000 0.009447299 0.000000000 0.000000000 NaN 0.000000000 [13] 0.000000000 Inf 0.161434226 NaN 0.000000000 Inf [19] 0.815615297 0.207553749 Warning message: In dchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log=TRUE) [1] NaN Inf -1.5745705 -2.3702343 -Inf NaN [7] -Inf -4.6620264 -Inf -Inf NaN -Inf [13] -Inf Inf -1.8236575 NaN -Inf Inf [19] -0.2038125 -1.5723649 Warning message: In dchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log = TRUE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dchisq(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), log=FALSE) [1] NA Inf NaN 0 0 NA Inf NaN 0 0 NA Inf NaN 0 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dgeom(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), log=FALSE) [1] 6.53e-02 1.23e-04 3.20e-79 NaN NaN NaN NaN Warning message: In dgeom(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dgeom(10, 10, log=TRUE) [1] NaN Warning message: In dgeom(10, 10, log = TRUE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dgeom(3, 3, log=FALSE) [1] NaN Warning message: In dgeom(3, 3, log = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log=FALSE) [1] NaN NaN 0.000 0.009 NaN NaN NaN 0.081 0.000 NaN NaN NaN [13] 0.000 0.900 NaN NaN NaN 0.100 0.000 NaN Warning messages: 1: In dgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log = FALSE) : non-integer x = 0.200000 2: In dgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log = FALSE) : non-integer x = 0.200000 3: In dgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log=TRUE) [1] NaN NaN -Inf -4.7105307 NaN NaN [7] NaN -2.5133061 -Inf NaN NaN NaN [13] -Inf -0.1053605 NaN NaN NaN -2.3025851 [19] -Inf NaN Warning messages: 1: In dgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log = TRUE) : non-integer x = 0.200000 2: In dgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log = TRUE) : non-integer x = 0.200000 3: In dgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log = TRUE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dgeom(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), log=FALSE) [1] NA NaN NaN 0.0 NaN NA 1.0 NaN 0.0 0.0 NA 0.1 NaN NaN 0.0 Warning message: In dgeom(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), log = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dt(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), log=FALSE) [1] 1.223197e-01 5.544796e-03 2.828427e-40 3.989310e-01 3.989423e-01 [6] NaN NaN Warning message: In dt(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), log = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dt(10, 10, log=TRUE) [1] -14.13232 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dt(3, 3, log=FALSE) [1] 0.02297204 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log=FALSE) [1] NaN NaN 0.12307265 0.06230778 0.20674834 NaN [7] NaN 0.01920883 0.15325430 0.36755260 NaN NaN [13] 0.03960646 0.31167229 0.35794379 NaN NaN 0.14809212 [19] 0.29905916 0.06750966 Warning message: In dt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log=TRUE) [1] NaN NaN -2.094980 -2.775669 -1.576253 NaN NaN [8] -3.952385 -1.875657 -1.000889 NaN NaN -3.228763 -1.165803 [15] -1.027379 NaN NaN -1.909921 -1.207114 -2.695485 Warning message: In dt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), log = TRUE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions21#Output.IgnoreWhitespace# #set.seed(1); dt(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), log=FALSE) [1] NA NaN NaN 0.0000000 NaN NA 0.3183099 [8] NaN 0.0000000 0.0000000 NA 0.1480921 NaN NaN [15] 0.0000000 Warning message: In dt(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), log = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(0, 10, lower.tail=FALSE, log.p=FALSE) [1] 1 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(0, 10, lower.tail=FALSE, log.p=TRUE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(0, 10, lower.tail=TRUE, log.p=FALSE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(0, 10, lower.tail=TRUE, log.p=TRUE) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=FALSE) [1] 1 1 1 1 1 1 NaN Warning message: In pchisq(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=TRUE) [1] 0 0 0 0 0 0 NaN Warning message: In pchisq(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=FALSE) [1] 0 0 0 0 0 0 NaN Warning message: In pchisq(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=TRUE) [1] -Inf -Inf -Inf -Inf -Inf -Inf NaN Warning message: In pchisq(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=FALSE) [1] NaN 1.00000000 0.08874237 0.13808560 1.00000000 NaN [7] 0.00000000 0.01152365 1.00000000 1.00000000 NaN 0.00000000 [13] 1.00000000 1.00000000 0.97758930 NaN 1.00000000 1.00000000 [19] 0.61145396 0.57240670 Warning message: In pchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=TRUE) [1] NaN 0.00000000 -2.42201777 -1.97988153 0.00000000 NaN [7] -Inf -4.46335358 0.00000000 0.00000000 NaN -Inf [13] 0.00000000 0.00000000 -0.02266564 NaN 0.00000000 0.00000000 [19] -0.49191562 -0.55790552 Warning message: In pchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=FALSE) [1] NaN 0.0000000 0.9112576 0.8619144 0.0000000 NaN 1.0000000 [8] 0.9884763 0.0000000 0.0000000 NaN 1.0000000 0.0000000 0.0000000 [15] 0.0224107 NaN 0.0000000 0.0000000 0.3885460 0.4275933 Warning message: In pchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=TRUE) [1] NaN -Inf -0.09292963 -0.14859931 -Inf NaN [7] 0.00000000 -0.01159056 -Inf -Inf NaN 0.00000000 [13] -Inf -Inf -3.79821666 NaN -Inf -Inf [19] -0.94534361 -0.84958278 Warning message: In pchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pchisq(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA 0 NaN 1 0 NA 0 NaN 1 0 NA 0 NaN 1 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.MayIgnoreWarningMessage# #set.seed(1); pchisq(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA 0 NaN NaN NaN NA 1 NaN NaN NaN NA 1 NaN 0 NaN Warning message: In pchisq(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(0, 10, lower.tail=FALSE, log.p=FALSE) [1] NaN Warning message: In pgeom(0, 10, lower.tail = FALSE, log.p = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(0, 10, lower.tail=FALSE, log.p=TRUE) [1] NaN Warning message: In pgeom(0, 10, lower.tail = FALSE, log.p = TRUE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(0, 10, lower.tail=TRUE, log.p=FALSE) [1] NaN Warning message: In pgeom(0, 10, lower.tail = TRUE, log.p = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(0, 10, lower.tail=TRUE, log.p=TRUE) [1] NaN Warning message: In pgeom(0, 10, lower.tail = TRUE, log.p = TRUE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=FALSE) [1] 0.934700 0.999877 1.000000 NaN NaN NaN NaN Warning message: In pgeom(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=TRUE) [1] -6.752966e-02 -1.230076e-04 -3.200000e-79 NaN NaN [6] NaN NaN Warning message: In pgeom(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=FALSE) [1] 6.53e-02 1.23e-04 3.20e-79 NaN NaN NaN NaN Warning message: In pgeom(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=TRUE) [1] -2.728763 -9.003326 -180.741072 NaN NaN NaN [7] NaN Warning message: In pgeom(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=FALSE) [1] NaN NaN 0.900 0.001 NaN NaN NaN 0.729 1.000 NaN NaN NaN [13] 1.000 0.100 NaN NaN NaN 0.900 0.100 NaN Warning message: In pgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=TRUE) [1] NaN NaN -0.1053605 -6.9077553 NaN NaN [7] NaN -0.3160815 0.0000000 NaN NaN NaN [13] 0.0000000 -2.3025851 NaN NaN NaN -0.1053605 [19] -2.3025851 NaN Warning message: In pgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=FALSE) [1] NaN NaN 0.100 0.999 NaN NaN NaN 0.271 0.000 NaN NaN NaN [13] 0.000 0.900 NaN NaN NaN 0.100 0.900 NaN Warning message: In pgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=TRUE) [1] NaN NaN -2.3025851 -0.0010005 NaN NaN [7] NaN -1.3056365 -Inf NaN NaN NaN [13] -Inf -0.1053605 NaN NaN NaN -2.3025851 [19] -0.1053605 NaN Warning message: In pgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pgeom(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA NaN NaN 1.0 NaN NA 1.0 NaN 1.0 0.0 NA 0.1 NaN NaN 0.0 Warning message: In pgeom(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.MayIgnoreWarningMessage# #set.seed(1); pgeom(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA NaN NaN NaN NaN NA NaN NaN NaN NaN NA NaN NaN NaN NaN Warning message: In pgeom(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(0, 10, lower.tail=FALSE, log.p=FALSE) [1] 0.5 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(0, 10, lower.tail=FALSE, log.p=TRUE) [1] -0.6931472 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(0, 10, lower.tail=TRUE, log.p=FALSE) [1] 0.5 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(0, 10, lower.tail=TRUE, log.p=TRUE) [1] -0.6931472 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=FALSE) [1] 0.5 0.5 0.5 0.5 0.5 NaN NaN Warning message: In pt(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=TRUE) [1] -0.6931472 -0.6931472 -0.6931472 -0.6931472 -0.6931472 NaN NaN Warning message: In pt(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=FALSE) [1] 0.5 0.5 0.5 0.5 0.5 NaN NaN Warning message: In pt(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=TRUE) [1] -0.6931472 -0.6931472 -0.6931472 -0.6931472 -0.6931472 NaN NaN Warning message: In pt(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=FALSE) [1] NaN NaN 0.47222678 0.15801721 0.80449889 NaN [7] NaN 0.38917711 0.74287641 0.50000000 NaN NaN [13] 0.58367176 0.50000000 0.42713516 NaN NaN 0.50000000 [19] 0.43852072 0.06966298 Warning message: In pt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=TRUE) [1] NaN NaN -0.7502959 -1.8450513 -0.2175357 NaN [7] NaN -0.9437207 -0.2972256 -0.6931472 NaN NaN [13] -0.5384165 -0.6931472 -0.8506548 NaN NaN -0.6931472 [19] -0.8243482 -2.6640862 Warning message: In pt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=FALSE) [1] NaN NaN 0.5277732 0.8419828 0.1955011 NaN NaN [8] 0.6108229 0.2571236 0.5000000 NaN NaN 0.4163282 0.5000000 [15] 0.5728648 NaN NaN 0.5000000 0.5614793 0.9303370 Warning message: In pt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=TRUE) [1] NaN NaN -0.63908859 -0.17199570 -1.63218922 NaN [7] NaN -0.49294824 -1.35819841 -0.69314718 NaN NaN [13] -0.87628129 -0.69314718 -0.55710548 NaN NaN -0.69314718 [19] -0.57718041 -0.07220838 Warning message: In pt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); pt(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA NaN NaN 1.0 NaN NA 0.5 NaN 1.0 0.0 NA 0.5 NaN NaN 0.0 Warning message: In pt(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.MayIgnoreWarningMessage# #set.seed(1); pt(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA NaN NaN 0.8413447 NaN NA NaN [8] NaN 0.5398278 NaN NA NaN NaN 0.5000000 [15] NaN Warning message: In pt(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(0, 10, lower.tail=FALSE, log.p=FALSE) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(0, 10, lower.tail=FALSE, log.p=TRUE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(0, 10, lower.tail=TRUE, log.p=FALSE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(0, 10, lower.tail=TRUE, log.p=TRUE) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=FALSE) [1] Inf Inf Inf Inf Inf Inf Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=TRUE) [1] 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=FALSE) [1] 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=TRUE) [1] Inf Inf Inf Inf Inf Inf Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=FALSE) [1] NaN Inf 0.013564 NaN NaN Inf 0.000000 NaN [9] NaN Inf NaN NaN NaN Inf 4.641628 NaN [17] NaN Inf 1.468957 NaN Warning message: In qchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=TRUE) [1] NaN 0.000000000 NaN NaN 3.158142952 0.000000000 [7] NaN NaN 0.691572992 0.000000000 NaN NaN [13] 0.000121286 0.000000000 NaN NaN 0.000000000 0.000000000 [19] NaN NaN Warning message: In qchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=FALSE) [1] NaN 0.000000e+00 1.225708e-14 NaN NaN [6] 0.000000e+00 0.000000e+00 NaN NaN 0.000000e+00 [11] NaN NaN NaN 0.000000e+00 1.005174e+00 [16] NaN NaN 0.000000e+00 4.335644e-02 NaN Warning message: In qchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=TRUE) [1] NaN Inf NaN NaN 1.721698e+00 [6] Inf NaN NaN 1.756852e-01 Inf [11] NaN NaN 2.409337e-09 Inf NaN [16] NaN 0.000000e+00 Inf NaN NaN Warning message: In qchisq(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qchisq(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA 0 NaN NaN NaN NA 0 NaN NaN NaN NA 0 NaN NaN NaN Warning message: In qchisq(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.MayIgnoreWarningMessage# #set.seed(1); qchisq(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA 0 NaN Inf 0 NA Inf NaN Inf Inf NA 0 NaN 0 NaN Warning message: In qchisq(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(0, 10, lower.tail=FALSE, log.p=FALSE) [1] NaN Warning message: In qgeom(0, 10, lower.tail = FALSE, log.p = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(0, 10, lower.tail=FALSE, log.p=TRUE) [1] NaN Warning message: In qgeom(0, 10, lower.tail = FALSE, log.p = TRUE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(0, 10, lower.tail=TRUE, log.p=FALSE) [1] NaN Warning message: In qgeom(0, 10, lower.tail = TRUE, log.p = FALSE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(0, 10, lower.tail=TRUE, log.p=TRUE) [1] NaN Warning message: In qgeom(0, 10, lower.tail = TRUE, log.p = TRUE) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=FALSE) [1] Inf Inf Inf NaN NaN NaN NaN Warning message: In qgeom(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=TRUE) [1] 0 0 0 NaN NaN NaN NaN Warning message: In qgeom(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=FALSE) [1] 0 0 0 NaN NaN NaN NaN Warning message: In qgeom(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=TRUE) [1] Inf Inf Inf NaN NaN NaN NaN Warning message: In qgeom(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=FALSE) [1] NaN NaN 15 NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN Inf NaN NaN NaN Inf 0 [20] NaN Warning message: In qgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=TRUE) [1] NaN NaN NaN NaN NaN NaN NaN NaN 0 NaN NaN NaN 9 0 NaN NaN NaN 0 NaN [20] NaN Warning message: In qgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=FALSE) [1] NaN NaN 2 NaN NaN NaN NaN NaN NaN NaN NaN NaN NaN 0 NaN NaN NaN 0 0 [20] NaN Warning message: In qgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=TRUE) [1] NaN NaN NaN NaN NaN NaN NaN NaN 0 NaN NaN NaN 4 Inf NaN NaN NaN Inf NaN [20] NaN Warning message: In qgeom(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qgeom(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA NaN NaN NaN NaN NA 0 NaN NaN NaN NA 0 NaN NaN NaN Warning message: In qgeom(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.MayIgnoreWarningMessage# #set.seed(1); qgeom(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA NaN NaN NaN NaN NA NaN NaN NaN NaN NA NaN NaN NaN NaN Warning message: In qgeom(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(0, 10, lower.tail=FALSE, log.p=FALSE) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(0, 10, lower.tail=FALSE, log.p=TRUE) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(0, 10, lower.tail=TRUE, log.p=FALSE) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(0, 10, lower.tail=TRUE, log.p=TRUE) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=FALSE) [1] Inf Inf Inf Inf Inf Inf Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=FALSE, log.p=TRUE) [1] -Inf -Inf -Inf -Inf -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=FALSE) [1] -Inf -Inf -Inf -Inf -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), lower.tail=TRUE, log.p=TRUE) [1] Inf Inf Inf Inf Inf Inf Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=FALSE) [1] NaN Inf 1566.8219615 NaN NaN [6] Inf NaN NaN NaN Inf [11] NaN NaN NaN Inf 0.9784723 [16] NaN NaN Inf 1.4638968 NaN Warning message: In qt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=FALSE, log.p=TRUE) [1] NaN -Inf NaN NaN 0.3702990 -Inf NaN [8] NaN 0.4528167 -Inf NaN NaN 3.5265712 -Inf [15] NaN NaN NaN -Inf NaN NaN Warning message: In qt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = FALSE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=FALSE) [1] NaN -Inf -1566.8219615 NaN NaN [6] -Inf NaN NaN NaN -Inf [11] NaN NaN NaN -Inf -0.9784723 [16] NaN NaN -Inf -1.4638968 NaN Warning message: In qt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail=TRUE, log.p=TRUE) [1] NaN Inf NaN NaN -0.3702990 Inf [7] NaN NaN -0.4528167 Inf NaN NaN [13] -3.5265712 Inf NaN NaN NaN Inf [19] NaN NaN Warning message: In qt(c(-1, 0, 0.2, 2), rep(c(-1, 0, 0.1, 0.9, 3), 4), lower.tail = TRUE, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.IgnoreWhitespace# #set.seed(1); qt(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA -Inf NaN NaN NaN NA -Inf NaN NaN NaN NA -Inf NaN NaN NaN Warning message: In qt(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions22#Output.MayIgnoreWarningMessage# #set.seed(1); qt(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA -Inf NaN Inf -Inf NA Inf [8] NaN -1.281552 Inf NA NaN NaN -Inf [15] NaN Warning message: In qt(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlnorm(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), log=FALSE) [1] 0 0 0 0 0 0 NaN Warning message: In dlnorm(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlnorm(0, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0), log=FALSE) [1] NA NaN NA 0 0 NA ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlnorm(10, 10, 10, log=TRUE) [1] -5.82036 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlnorm(3, 3, 3, log=FALSE) [1] 0.03626103 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlnorm(c(-1, 0, 1), c(-1, 0, 0.2, 2:5), rep(c(-1, 0, 0.1, 0.9, 3), 12), log=FALSE) [1] NaN 0.000000e+00 5.399097e-01 0.000000e+00 0.000000e+00 [6] NaN 0.000000e+00 0.000000e+00 4.432692e-01 0.000000e+00 [11] NaN 0.000000e+00 0.000000e+00 0.000000e+00 1.257944e-01 [16] NaN 0.000000e+00 5.520948e-87 0.000000e+00 0.000000e+00 [21] NaN 0.000000e+00 0.000000e+00 4.324583e-01 0.000000e+00 [26] NaN 0.000000e+00 0.000000e+00 0.000000e+00 1.329808e-01 [31] NaN 0.000000e+00 1.473646e-195 0.000000e+00 0.000000e+00 [36] NaN 0.000000e+00 0.000000e+00 3.752628e-02 0.000000e+00 [41] NaN 0.000000e+00 0.000000e+00 0.000000e+00 1.326856e-01 [46] NaN 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00 [51] NaN 0.000000e+00 0.000000e+00 1.713643e-03 0.000000e+00 [56] NaN 0.000000e+00 0.000000e+00 0.000000e+00 1.064827e-01 Warning message: In dlnorm(c(-1, 0, 1), c(-1, 0, 0.2, 2:5), rep(c(-1, 0, 0.1, 0.9, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlnorm(c(-1, 0, 1), c(-1, 0, 0.2, 2:5), rep(c(-1, 0, 0.1, 0.9, 3), 12), log=TRUE) [1] NaN -Inf -0.6163534 -Inf -Inf [6] NaN -Inf -Inf -0.8135780 -Inf [11] NaN -Inf -Inf -Inf -2.0731064 [16] NaN -Inf -198.6163534 -Inf -Inf [21] NaN -Inf -Inf -0.8382694 -Inf [26] NaN -Inf -Inf -Inf -2.0175508 [31] NaN -Inf -448.6163534 -Inf -Inf [36] NaN -Inf -Inf -3.2827138 -Inf [41] NaN -Inf -Inf -Inf -2.0197730 [46] NaN -Inf -798.6163534 -Inf -Inf [51] NaN -Inf -Inf -6.3691336 -Inf [56] NaN -Inf -Inf -Inf -2.2397730 Warning message: In dlnorm(c(-1, 0, 1), c(-1, 0, 0.2, 2:5), rep(c(-1, 0, 0.1, 0.9, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlnorm(c(NA, NaN, 1/0, -1/0), 2, 2, log=FALSE) [1] NA NaN 0 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlogis(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70), c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), log=FALSE) [1] 3.010902e+00 1.598471e+03 6.144123e+77 2.225879e-05 2.488759e-73 [6] NaN NaN Warning message: In dlogis(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71), c(0.0653, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlogis(0, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0), log=FALSE) [1] NA NaN NA NaN NaN NA Warning message: In dlogis(0, c(NA, 0, NaN, 1/0, -1/0), c(NaN, NaN, NA, 0, 1/0, -1/0), : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlogis(10, 10, 10, log=TRUE) [1] -3.688879 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlogis(3, 3, 3, log=FALSE) [1] 0.08333333 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlogis(c(-1, 0, 1), c(-1, 0, 0.2, 2:5), rep(c(-1, 0, 0.1, 0.9, 3), 12), log=FALSE) [1] NaN NaN 3.352377e-03 3.695414e-02 6.553731e-02 [6] NaN NaN 4.539581e-04 2.070294e-01 8.008692e-02 [11] NaN NaN 1.928750e-21 4.262447e-03 7.471913e-02 [16] NaN NaN 4.539581e-04 1.274732e-02 5.503034e-02 [21] NaN NaN 2.500000e+00 2.294007e-01 6.553731e-02 [26] NaN NaN 8.756511e-26 2.070294e-01 8.106072e-02 [31] NaN NaN 2.061154e-08 4.262447e-03 4.454324e-02 [36] NaN NaN 1.049936e+00 2.070294e-01 5.503034e-02 [41] NaN NaN 2.500000e+00 2.777778e-01 8.186923e-02 [46] NaN NaN 9.357623e-13 1.410445e-03 8.106072e-02 [51] NaN NaN 2.061154e-08 9.801458e-02 4.454324e-02 [56] NaN NaN 4.539581e-04 2.743765e-01 8.106072e-02 Warning message: In dlogis(c(-1, 0, 1), c(-1, 0, 0.2, 2:5), rep(c(-1, 0, 0.1, 0.9, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlogis(c(-1, 0, 1), c(-1, 0, 0.2, 2:5), rep(c(-1, 0, 0.1, 0.9, 3), 12), log=TRUE) [1] NaN NaN -5.69808572 -3.29807765 -2.72513566 [6] NaN NaN -7.69750570 -1.57489456 -2.52464279 [11] NaN NaN -47.69741491 -5.45791197 -2.59401913 [16] NaN NaN -7.69750570 -4.36243434 -2.89987067 [21] NaN NaN 0.91629073 -1.47228488 -2.72513566 [26] NaN NaN -57.69741491 -1.57489456 -2.51255677 [31] NaN NaN -17.69741491 -5.45791197 -3.11129493 [36] NaN NaN 0.04872907 -1.57489456 -2.89987067 [41] NaN NaN 0.91629073 -1.28093385 -2.50263200 [46] NaN NaN -27.69741491 -6.56384980 -2.51255677 [51] NaN NaN -17.69741491 -2.32263907 -3.11129493 [56] NaN NaN -7.69750570 -1.29325421 -2.51255677 Warning message: In dlogis(c(-1, 0, 1), c(-1, 0, 0.2, 2:5), rep(c(-1, 0, 0.1, 0.9, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions31#Output.IgnoreWhitespace# #set.seed(1); dlogis(c(NA, NaN, 1/0, -1/0), 2, 2, log=FALSE) [1] NA NaN 0 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(0, 10, 10, lower.tail=FALSE, log.p=FALSE) [1] 1 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(0, 10, 10, lower.tail=FALSE, log.p=TRUE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(0, 10, 10, lower.tail=TRUE, log.p=FALSE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(0, 10, 10, lower.tail=TRUE, log.p=TRUE) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=FALSE) [1] 1 1 1 1 1 NaN NaN 1 1 1 1 1 NaN NaN 1 1 1 1 1 [20] NaN NaN 1 1 1 1 1 NaN NaN 1 1 1 1 1 NaN NaN Warning message: In pf(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), rep(c(0.0653, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=TRUE) [1] 0 0 0 0 0 NaN NaN 0 0 0 0 0 NaN NaN 0 0 0 0 0 [20] NaN NaN 0 0 0 0 0 NaN NaN 0 0 0 0 0 NaN NaN Warning message: In pf(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), rep(c(0.0653, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=FALSE) [1] 0 0 0 0 0 NaN NaN 0 0 0 0 0 NaN NaN 0 0 0 0 0 [20] NaN NaN 0 0 0 0 0 NaN NaN 0 0 0 0 0 NaN NaN Warning message: In pf(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), rep(c(0.0653, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=TRUE) [1] -Inf -Inf -Inf -Inf -Inf NaN NaN -Inf -Inf -Inf -Inf -Inf NaN NaN -Inf [16] -Inf -Inf -Inf -Inf NaN NaN -Inf -Inf -Inf -Inf -Inf NaN NaN -Inf -Inf [31] -Inf -Inf -Inf NaN NaN Warning message: In pf(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), rep(c(0.0653, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=FALSE) [1] NaN NaN 0.2301826 0.7995678 NaN NaN NaN [8] NaN 1.0000000 1.0000000 NaN NaN NaN NaN [15] 0.8886328 NaN NaN 1.0000000 NaN NaN NaN [22] NaN NaN 0.9994274 NaN NaN NaN 0.4838017 [29] NaN 1.0000000 NaN NaN 1.0000000 1.0000000 NaN [36] NaN NaN NaN 0.7109050 0.8385293 NaN NaN [43] NaN NaN 1.0000000 NaN NaN 0.9986254 NaN [50] NaN NaN NaN NaN 1.0000000 NaN NaN [57] NaN 1.0000000 NaN 0.9994807 NaN NaN 0.2301826 [64] 0.7995678 NaN NaN NaN NaN 1.0000000 1.0000000 [71] NaN NaN NaN NaN 0.8886328 NaN NaN [78] 1.0000000 NaN NaN NaN NaN NaN 0.9994274 [85] NaN NaN NaN 0.4838017 NaN 1.0000000 NaN [92] NaN 1.0000000 1.0000000 NaN NaN NaN NaN [99] 0.7109050 0.8385293 NaN NaN NaN NaN 1.0000000 [106] NaN NaN 0.9986254 NaN NaN NaN NaN [113] NaN 1.0000000 NaN NaN NaN 1.0000000 NaN [120] 0.9994807 Warning message: In pf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=TRUE) [1] NaN NaN -1.4688821632 -0.2236838870 NaN [6] NaN NaN NaN 0.0000000000 0.0000000000 [11] NaN NaN NaN NaN -0.1180711262 [16] NaN NaN 0.0000000000 NaN NaN [21] NaN NaN NaN -0.0005727184 NaN [26] NaN NaN -0.7260801256 NaN 0.0000000000 [31] NaN NaN 0.0000000000 0.0000000000 NaN [36] NaN NaN NaN -0.3412165338 -0.1761057482 [41] NaN NaN NaN NaN 0.0000000000 [46] NaN NaN -0.0013755783 NaN NaN [51] NaN NaN NaN 0.0000000000 NaN [56] NaN NaN 0.0000000000 NaN -0.0005194218 [61] NaN NaN -1.4688821632 -0.2236838870 NaN [66] NaN NaN NaN 0.0000000000 0.0000000000 [71] NaN NaN NaN NaN -0.1180711262 [76] NaN NaN 0.0000000000 NaN NaN [81] NaN NaN NaN -0.0005727184 NaN [86] NaN NaN -0.7260801256 NaN 0.0000000000 [91] NaN NaN 0.0000000000 0.0000000000 NaN [96] NaN NaN NaN -0.3412165338 -0.1761057482 [101] NaN NaN NaN NaN 0.0000000000 [106] NaN NaN -0.0013755783 NaN NaN [111] NaN NaN NaN 0.0000000000 NaN [116] NaN NaN 0.0000000000 NaN -0.0005194218 Warning message: In pf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=FALSE) [1] NaN NaN 0.7698173519 0.2004321518 NaN [6] NaN NaN NaN 0.0000000000 0.0000000000 [11] NaN NaN NaN NaN 0.1113671547 [16] NaN NaN 0.0000000000 NaN NaN [21] NaN NaN NaN 0.0005725544 NaN [26] NaN NaN 0.5161982800 NaN 0.0000000000 [31] NaN NaN 0.0000000000 0.0000000000 NaN [36] NaN NaN NaN 0.2890950434 0.1614706943 [41] NaN NaN NaN NaN 0.0000000000 [46] NaN NaN 0.0013746326 NaN NaN [51] NaN NaN NaN 0.0000000000 NaN [56] NaN NaN 0.0000000000 NaN 0.0005192870 [61] NaN NaN 0.7698173519 0.2004321518 NaN [66] NaN NaN NaN 0.0000000000 0.0000000000 [71] NaN NaN NaN NaN 0.1113671547 [76] NaN NaN 0.0000000000 NaN NaN [81] NaN NaN NaN 0.0005725544 NaN [86] NaN NaN 0.5161982800 NaN 0.0000000000 [91] NaN NaN 0.0000000000 0.0000000000 NaN [96] NaN NaN NaN 0.2890950434 0.1614706943 [101] NaN NaN NaN NaN 0.0000000000 [106] NaN NaN 0.0013746326 NaN NaN [111] NaN NaN NaN 0.0000000000 NaN [116] NaN NaN 0.0000000000 NaN 0.0005192870 Warning message: In pf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=TRUE) [1] NaN NaN -0.2616020 -1.6072795 NaN NaN [7] NaN NaN -Inf -Inf NaN NaN [13] NaN NaN -2.1949228 NaN NaN -Inf [19] NaN NaN NaN NaN NaN -7.4654027 [25] NaN NaN NaN -0.6612643 NaN -Inf [31] NaN NaN -Inf -Inf NaN NaN [37] NaN NaN -1.2409998 -1.8234316 NaN NaN [43] NaN NaN -Inf NaN NaN -6.5895688 [49] NaN NaN NaN NaN NaN -Inf [55] NaN NaN NaN -Inf NaN -7.5630539 [61] NaN NaN -0.2616020 -1.6072795 NaN NaN [67] NaN NaN -Inf -Inf NaN NaN [73] NaN NaN -2.1949228 NaN NaN -Inf [79] NaN NaN NaN NaN NaN -7.4654027 [85] NaN NaN NaN -0.6612643 NaN -Inf [91] NaN NaN -Inf -Inf NaN NaN [97] NaN NaN -1.2409998 -1.8234316 NaN NaN [103] NaN NaN -Inf NaN NaN -6.5895688 [109] NaN NaN NaN NaN NaN -Inf [115] NaN NaN NaN -Inf NaN -7.5630539 Warning message: In pf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5)) [1] NA NaN NaN 1 NaN NA 0 NaN 1 0 NA 0 NaN NaN 0 Warning message: In pf(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA NaN NaN 0.31731051 NaN NA [7] NaN NaN 0.02868263 NaN NA NaN [13] NaN NaN NaN Warning message: In pf(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); pf(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA NaN NaN 0.6826895 NaN NA NaN [8] NaN 0.7879658 NaN NA NaN NaN NaN [15] NaN Warning message: In pf(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(0, 10, 10, lower.tail=FALSE, log.p=FALSE) [1] 1 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(0, 10, 10, lower.tail=FALSE, log.p=TRUE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(0, 10, 10, lower.tail=TRUE, log.p=FALSE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(0, 10, 10, lower.tail=TRUE, log.p=TRUE) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=FALSE) [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=TRUE) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=FALSE) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=TRUE) [1] -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf [16] -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf [31] -Inf -Inf -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=FALSE) [1] NaN 1.000000e+00 9.563151e-01 9.807048e-01 NaN [6] 1.000000e+00 NaN 0.000000e+00 1.000000e+00 1.000000e+00 [11] NaN 0.000000e+00 NaN 1.000000e+00 9.999980e-01 [16] 1.318515e-64 NaN 1.000000e+00 NaN 1.000000e+00 [21] 1.000000e+00 1.000000e+00 NaN 1.000000e+00 NaN [26] 1.000000e+00 9.462397e-01 1.501156e-09 NaN 1.000000e+00 [31] NaN 0.000000e+00 1.000000e+00 1.000000e+00 NaN [36] 0.000000e+00 NaN 1.000000e+00 9.939538e-01 1.000000e+00 [41] NaN 1.000000e+00 NaN 1.000000e+00 1.000000e+00 [46] 1.000000e+00 NaN 0.000000e+00 NaN 1.000000e+00 [51] 7.288829e-01 2.082422e-12 NaN 1.000000e+00 NaN [56] 0.000000e+00 1.000000e+00 1.000000e+00 NaN 1.000000e+00 [61] NaN 1.000000e+00 9.563151e-01 9.807048e-01 NaN [66] 1.000000e+00 NaN 0.000000e+00 1.000000e+00 1.000000e+00 [71] NaN 0.000000e+00 NaN 1.000000e+00 9.999980e-01 [76] 1.318515e-64 NaN 1.000000e+00 NaN 1.000000e+00 [81] 1.000000e+00 1.000000e+00 NaN 1.000000e+00 NaN [86] 1.000000e+00 9.462397e-01 1.501156e-09 NaN 1.000000e+00 [91] NaN 0.000000e+00 1.000000e+00 1.000000e+00 NaN [96] 0.000000e+00 NaN 1.000000e+00 9.939538e-01 1.000000e+00 [101] NaN 1.000000e+00 NaN 1.000000e+00 1.000000e+00 [106] 1.000000e+00 NaN 0.000000e+00 NaN 1.000000e+00 [111] 7.288829e-01 2.082422e-12 NaN 1.000000e+00 NaN [116] 0.000000e+00 1.000000e+00 1.000000e+00 NaN 1.000000e+00 Warning message: In plnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=TRUE) [1] NaN 0.000000e+00 -4.466785e-02 -1.948377e-02 NaN [6] 0.000000e+00 NaN -Inf 0.000000e+00 0.000000e+00 [11] NaN -2.402266e+07 NaN 0.000000e+00 -2.018797e-06 [16] -1.470889e+02 NaN 0.000000e+00 NaN 0.000000e+00 [21] 0.000000e+00 0.000000e+00 NaN 0.000000e+00 NaN [26] 0.000000e+00 -5.525937e-02 -2.031703e+01 NaN 0.000000e+00 [31] NaN -Inf 0.000000e+00 0.000000e+00 NaN [36] -1.433374e+08 NaN 0.000000e+00 -6.064526e-03 -4.793526e-118 [41] NaN 0.000000e+00 NaN 0.000000e+00 0.000000e+00 [46] 0.000000e+00 NaN -1.759119e+07 NaN 0.000000e+00 [51] -3.162422e-01 -2.689749e+01 NaN 0.000000e+00 NaN [56] -Inf 0.000000e+00 0.000000e+00 NaN 0.000000e+00 [61] NaN 0.000000e+00 -4.466785e-02 -1.948377e-02 NaN [66] 0.000000e+00 NaN -Inf 0.000000e+00 0.000000e+00 [71] NaN -2.402266e+07 NaN 0.000000e+00 -2.018797e-06 [76] -1.470889e+02 NaN 0.000000e+00 NaN 0.000000e+00 [81] 0.000000e+00 0.000000e+00 NaN 0.000000e+00 NaN [86] 0.000000e+00 -5.525937e-02 -2.031703e+01 NaN 0.000000e+00 [91] NaN -Inf 0.000000e+00 0.000000e+00 NaN [96] -1.433374e+08 NaN 0.000000e+00 -6.064526e-03 -4.793526e-118 [101] NaN 0.000000e+00 NaN 0.000000e+00 0.000000e+00 [106] 0.000000e+00 NaN -1.759119e+07 NaN 0.000000e+00 [111] -3.162422e-01 -2.689749e+01 NaN 0.000000e+00 NaN [116] -Inf 0.000000e+00 0.000000e+00 NaN 0.000000e+00 Warning message: In plnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=FALSE) [1] NaN 0.000000e+00 4.368493e-02 1.929519e-02 NaN [6] 0.000000e+00 NaN 1.000000e+00 0.000000e+00 0.000000e+00 [11] NaN 1.000000e+00 NaN 0.000000e+00 2.018795e-06 [16] 1.000000e+00 NaN 0.000000e+00 NaN 0.000000e+00 [21] 0.000000e+00 0.000000e+00 NaN 0.000000e+00 NaN [26] 0.000000e+00 5.376031e-02 1.000000e+00 NaN 0.000000e+00 [31] NaN 1.000000e+00 0.000000e+00 0.000000e+00 NaN [36] 1.000000e+00 NaN 0.000000e+00 6.046174e-03 4.793526e-118 [41] NaN 0.000000e+00 NaN 0.000000e+00 0.000000e+00 [46] 0.000000e+00 NaN 1.000000e+00 NaN 0.000000e+00 [51] 2.711171e-01 1.000000e+00 NaN 0.000000e+00 NaN [56] 1.000000e+00 0.000000e+00 0.000000e+00 NaN 0.000000e+00 [61] NaN 0.000000e+00 4.368493e-02 1.929519e-02 NaN [66] 0.000000e+00 NaN 1.000000e+00 0.000000e+00 0.000000e+00 [71] NaN 1.000000e+00 NaN 0.000000e+00 2.018795e-06 [76] 1.000000e+00 NaN 0.000000e+00 NaN 0.000000e+00 [81] 0.000000e+00 0.000000e+00 NaN 0.000000e+00 NaN [86] 0.000000e+00 5.376031e-02 1.000000e+00 NaN 0.000000e+00 [91] NaN 1.000000e+00 0.000000e+00 0.000000e+00 NaN [96] 1.000000e+00 NaN 0.000000e+00 6.046174e-03 4.793526e-118 [101] NaN 0.000000e+00 NaN 0.000000e+00 0.000000e+00 [106] 0.000000e+00 NaN 1.000000e+00 NaN 0.000000e+00 [111] 2.711171e-01 1.000000e+00 NaN 0.000000e+00 NaN [116] 1.000000e+00 0.000000e+00 0.000000e+00 NaN 0.000000e+00 Warning message: In plnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=TRUE) [1] NaN -Inf -3.130752e+00 -3.947899e+00 NaN [6] -Inf NaN 0.000000e+00 -Inf -Inf [11] NaN 0.000000e+00 NaN -Inf -1.311301e+01 [16] -1.318515e-64 NaN -Inf NaN -Inf [21] -Inf -Inf NaN -2.139413e+06 NaN [26] -Inf -2.923220e+00 -1.501156e-09 NaN -Inf [31] NaN 0.000000e+00 -Inf -Inf NaN [36] 0.000000e+00 NaN -Inf -5.108330e+00 -2.701378e+02 [41] NaN -Inf NaN -Inf -Inf [46] -Inf NaN 0.000000e+00 NaN -Inf [51] -1.305204e+00 -2.082422e-12 NaN -Inf NaN [56] 0.000000e+00 -Inf -Inf NaN -2.660785e+08 [61] NaN -Inf -3.130752e+00 -3.947899e+00 NaN [66] -Inf NaN 0.000000e+00 -Inf -Inf [71] NaN 0.000000e+00 NaN -Inf -1.311301e+01 [76] -1.318515e-64 NaN -Inf NaN -Inf [81] -Inf -Inf NaN -2.139413e+06 NaN [86] -Inf -2.923220e+00 -1.501156e-09 NaN -Inf [91] NaN 0.000000e+00 -Inf -Inf NaN [96] 0.000000e+00 NaN -Inf -5.108330e+00 -2.701378e+02 [101] NaN -Inf NaN -Inf -Inf [106] -Inf NaN 0.000000e+00 NaN -Inf [111] -1.305204e+00 -2.082422e-12 NaN -Inf NaN [116] 0.000000e+00 -Inf -Inf NaN -2.660785e+08 Warning message: In plnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5)) [1] NA 0 NaN 1 0 NA 0 NaN 1 0 NA 0 NaN 1 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA 0.000000e+00 NaN 0.000000e+00 0.000000e+00 [6] NA 5.000000e-01 NaN 0.000000e+00 1.000000e+00 [11] NA 1.284176e-117 NaN 0.000000e+00 1.000000e+00 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plnorm(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA 0.0 NaN 0.5 NaN NA 0.0 NaN 0.5 NaN NA 0.0 NaN 0.0 NaN Warning message: In plnorm(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(0, 10, 10, lower.tail=FALSE, log.p=FALSE) [1] 0.7310586 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(0, 10, 10, lower.tail=FALSE, log.p=TRUE) [1] -0.3132617 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(0, 10, 10, lower.tail=TRUE, log.p=FALSE) [1] 0.2689414 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(0, 10, 10, lower.tail=TRUE, log.p=TRUE) [1] -1.313262 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=FALSE) [1] 7.310586e-01 7.310586e-01 7.310586e-01 7.310586e-01 7.310586e-01 [6] 5.000000e-01 0.000000e+00 1.000000e+00 5.000000e-01 5.000000e-01 [11] 1.000000e+00 1.000000e+00 5.000000e-01 4.999717e-01 5.000000e-01 [16] 5.004709e-01 5.000000e-01 1.000000e+00 1.000000e+00 5.000000e-01 [21] 2.234818e-07 1.000000e+00 1.000000e+00 5.000000e-01 5.000000e-01 [26] 1.000000e+00 5.000000e-01 0.000000e+00 5.000018e-01 5.000000e-01 [31] 5.000000e-01 1.000000e+00 1.000000e+00 5.000000e-01 5.000000e-01 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=TRUE) [1] -3.132617e-01 -3.132617e-01 -3.132617e-01 -3.132617e-01 -3.132617e-01 [6] -6.931472e-01 -8.130081e+03 0.000000e+00 -6.931472e-01 -6.931472e-01 [11] 0.000000e+00 0.000000e+00 -6.931472e-01 -6.932038e-01 -6.931472e-01 [16] -6.922058e-01 -6.931472e-01 0.000000e+00 0.000000e+00 -6.931472e-01 [21] -1.531394e+01 -2.726033e-231 0.000000e+00 -6.931472e-01 -6.931472e-01 [26] 0.000000e+00 -6.931472e-01 -3.125000e+78 -6.931435e-01 -6.931472e-01 [31] -6.931472e-01 0.000000e+00 0.000000e+00 -6.931472e-01 -6.931472e-01 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=FALSE) [1] 2.689414e-01 2.689414e-01 2.689414e-01 2.689414e-01 2.689414e-01 [6] 5.000000e-01 1.000000e+00 0.000000e+00 5.000000e-01 5.000000e-01 [11] 0.000000e+00 0.000000e+00 5.000000e-01 5.000283e-01 5.000000e-01 [16] 4.995291e-01 5.000000e-01 0.000000e+00 0.000000e+00 5.000000e-01 [21] 9.999998e-01 2.726033e-231 0.000000e+00 5.000000e-01 5.000000e-01 [26] 0.000000e+00 5.000000e-01 1.000000e+00 4.999982e-01 5.000000e-01 [31] 5.000000e-01 0.000000e+00 0.000000e+00 5.000000e-01 5.000000e-01 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=TRUE) [1] -1.313262e+00 -1.313262e+00 -1.313262e+00 -1.313262e+00 -1.313262e+00 [6] -6.931472e-01 0.000000e+00 -2.040625e+77 -6.931472e-01 -6.931472e-01 [11] -1.352680e+05 -6.422764e+75 -6.931472e-01 -6.930906e-01 -6.931472e-01 [16] -6.940894e-01 -6.931472e-01 -2.760313e+82 -8.943734e+67 -6.931472e-01 [21] -2.234818e-07 -5.308943e+02 -3.843750e+74 -6.931472e-01 -6.931472e-01 [26] -1.209801e+73 -6.931472e-01 0.000000e+00 -6.931509e-01 -6.931472e-01 [31] -6.931472e-01 -7.181301e+07 -2.468750e+150 -6.931472e-01 -6.931472e-01 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=FALSE) [1] NaN NaN 4.750208e-01 1.670142e-05 NaN [6] 0.000000e+00 NaN NaN 8.698915e-01 1.000000e+00 [11] NaN 0.000000e+00 NaN NaN 9.426758e-01 [16] 9.357623e-14 NaN 1.000000e+00 NaN NaN [21] 5.000000e-01 5.000000e-01 NaN 0.000000e+00 NaN [26] NaN 4.501660e-01 5.602796e-09 NaN 1.000000e+00 [31] NaN NaN 7.502601e-01 9.998766e-01 NaN [36] 0.000000e+00 NaN NaN 6.681878e-01 9.999546e-01 [41] NaN 5.000000e-01 NaN NaN 9.820138e-01 [46] 4.539787e-05 NaN 0.000000e+00 NaN NaN [51] 2.314752e-01 2.061154e-09 NaN 1.000000e+00 NaN [56] NaN 7.310586e-01 7.310586e-01 NaN 1.000000e+00 [61] NaN NaN 4.750208e-01 1.670142e-05 NaN [66] 0.000000e+00 NaN NaN 8.698915e-01 1.000000e+00 [71] NaN 0.000000e+00 NaN NaN 9.426758e-01 [76] 9.357623e-14 NaN 1.000000e+00 NaN NaN [81] 5.000000e-01 5.000000e-01 NaN 0.000000e+00 NaN [86] NaN 4.501660e-01 5.602796e-09 NaN 1.000000e+00 [91] NaN NaN 7.502601e-01 9.998766e-01 NaN [96] 0.000000e+00 NaN NaN 6.681878e-01 9.999546e-01 [101] NaN 5.000000e-01 NaN NaN 9.820138e-01 [106] 4.539787e-05 NaN 0.000000e+00 NaN NaN [111] 2.314752e-01 2.061154e-09 NaN 1.000000e+00 NaN [116] NaN 7.310586e-01 7.310586e-01 NaN 1.000000e+00 Warning message: In plogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=TRUE) [1] NaN NaN -7.443967e-01 -1.100002e+01 NaN [6] -1.000000e+04 NaN NaN -1.393868e-01 -9.357623e-14 [11] NaN -2.000000e+04 NaN NaN -5.903283e-02 [16] -3.000000e+01 NaN 0.000000e+00 NaN NaN [21] -6.931472e-01 -6.931472e-01 NaN -1.100000e+04 NaN [26] NaN -7.981389e-01 -1.900000e+01 NaN 0.000000e+00 [31] NaN NaN -2.873353e-01 -1.234022e-04 NaN [36] -3.000000e+04 NaN NaN -4.031860e-01 -4.539890e-05 [41] NaN -6.931472e-01 NaN NaN -1.814993e-02 [46] -1.000005e+01 NaN -1.900000e+04 NaN NaN [51] -1.463282e+00 -2.000000e+01 NaN 0.000000e+00 NaN [56] NaN -3.132617e-01 -3.132617e-01 NaN 0.000000e+00 [61] NaN NaN -7.443967e-01 -1.100002e+01 NaN [66] -1.000000e+04 NaN NaN -1.393868e-01 -9.357623e-14 [71] NaN -2.000000e+04 NaN NaN -5.903283e-02 [76] -3.000000e+01 NaN 0.000000e+00 NaN NaN [81] -6.931472e-01 -6.931472e-01 NaN -1.100000e+04 NaN [86] NaN -7.981389e-01 -1.900000e+01 NaN 0.000000e+00 [91] NaN NaN -2.873353e-01 -1.234022e-04 NaN [96] -3.000000e+04 NaN NaN -4.031860e-01 -4.539890e-05 [101] NaN -6.931472e-01 NaN NaN -1.814993e-02 [106] -1.000005e+01 NaN -1.900000e+04 NaN NaN [111] -1.463282e+00 -2.000000e+01 NaN 0.000000e+00 NaN [116] NaN -3.132617e-01 -3.132617e-01 NaN 0.000000e+00 Warning message: In plogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=FALSE) [1] NaN NaN 5.249792e-01 9.999833e-01 NaN [6] 1.000000e+00 NaN NaN 1.301085e-01 9.357623e-14 [11] NaN 1.000000e+00 NaN NaN 5.732418e-02 [16] 1.000000e+00 NaN 0.000000e+00 NaN NaN [21] 5.000000e-01 5.000000e-01 NaN 1.000000e+00 NaN [26] NaN 5.498340e-01 1.000000e+00 NaN 0.000000e+00 [31] NaN NaN 2.497399e-01 1.233946e-04 NaN [36] 1.000000e+00 NaN NaN 3.318122e-01 4.539787e-05 [41] NaN 5.000000e-01 NaN NaN 1.798621e-02 [46] 9.999546e-01 NaN 1.000000e+00 NaN NaN [51] 7.685248e-01 1.000000e+00 NaN 0.000000e+00 NaN [56] NaN 2.689414e-01 2.689414e-01 NaN 0.000000e+00 [61] NaN NaN 5.249792e-01 9.999833e-01 NaN [66] 1.000000e+00 NaN NaN 1.301085e-01 9.357623e-14 [71] NaN 1.000000e+00 NaN NaN 5.732418e-02 [76] 1.000000e+00 NaN 0.000000e+00 NaN NaN [81] 5.000000e-01 5.000000e-01 NaN 1.000000e+00 NaN [86] NaN 5.498340e-01 1.000000e+00 NaN 0.000000e+00 [91] NaN NaN 2.497399e-01 1.233946e-04 NaN [96] 1.000000e+00 NaN NaN 3.318122e-01 4.539787e-05 [101] NaN 5.000000e-01 NaN NaN 1.798621e-02 [106] 9.999546e-01 NaN 1.000000e+00 NaN NaN [111] 7.685248e-01 1.000000e+00 NaN 0.000000e+00 NaN [116] NaN 2.689414e-01 2.689414e-01 NaN 0.000000e+00 Warning message: In plogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=TRUE) [1] NaN NaN -6.443967e-01 -1.670156e-05 NaN [6] 0.000000e+00 NaN NaN -2.039387e+00 -3.000000e+01 [11] NaN 0.000000e+00 NaN NaN -2.859033e+00 [16] -9.357623e-14 NaN -1.000000e+03 NaN NaN [21] -6.931472e-01 -6.931472e-01 NaN 0.000000e+00 NaN [26] NaN -5.981389e-01 -5.602796e-09 NaN -3.000000e+04 [31] NaN NaN -1.387335e+00 -9.000123e+00 NaN [36] 0.000000e+00 NaN NaN -1.103186e+00 -1.000005e+01 [41] NaN -6.931472e-01 NaN NaN -4.018150e+00 [46] -4.539890e-05 NaN 0.000000e+00 NaN NaN [51] -2.632825e-01 -2.061154e-09 NaN -9.000000e+03 NaN [56] NaN -1.313262e+00 -1.313262e+00 NaN -1.000000e+04 [61] NaN NaN -6.443967e-01 -1.670156e-05 NaN [66] 0.000000e+00 NaN NaN -2.039387e+00 -3.000000e+01 [71] NaN 0.000000e+00 NaN NaN -2.859033e+00 [76] -9.357623e-14 NaN -1.000000e+03 NaN NaN [81] -6.931472e-01 -6.931472e-01 NaN 0.000000e+00 NaN [86] NaN -5.981389e-01 -5.602796e-09 NaN -3.000000e+04 [91] NaN NaN -1.387335e+00 -9.000123e+00 NaN [96] 0.000000e+00 NaN NaN -1.103186e+00 -1.000005e+01 [101] NaN -6.931472e-01 NaN NaN -4.018150e+00 [106] -4.539890e-05 NaN 0.000000e+00 NaN NaN [111] -2.632825e-01 -2.061154e-09 NaN -9.000000e+03 NaN [116] NaN -1.313262e+00 -1.313262e+00 NaN -1.000000e+04 Warning message: In plogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5)) [1] NA NaN NaN 1.0000000 NaN NA 0.2689414 [8] NaN 1.0000000 0.0000000 NA 0.2689414 NaN NaN [15] 0.0000000 Warning message: In plogis(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA NaN NaN 0.0000000 NaN NA 0.7310586 [8] NaN 0.0000000 1.0000000 NA 0.7310586 NaN NaN [15] 1.0000000 Warning message: In plogis(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0), rep(c(1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); plogis(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA NaN NaN 0.5 NaN NA NaN NaN 0.5 NaN NA NaN NaN 0.5 NaN Warning message: In plogis(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(0, 10, 10, lower.tail=FALSE, log.p=FALSE) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(0, 10, 10, lower.tail=FALSE, log.p=TRUE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(0, 10, 10, lower.tail=TRUE, log.p=FALSE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(0, 10, 10, lower.tail=TRUE, log.p=TRUE) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=FALSE) [1] Inf Inf Inf Inf Inf NaN NaN Inf Inf Inf Inf Inf NaN NaN Inf Inf Inf Inf Inf [20] NaN NaN Inf Inf Inf Inf Inf NaN NaN Inf Inf Inf Inf Inf NaN NaN Warning message: In qf(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), rep(c(0.0653, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=TRUE) [1] 0 0 0 0 0 NaN NaN 0 0 0 0 0 NaN NaN 0 0 0 0 0 [20] NaN NaN 0 0 0 0 0 NaN NaN 0 0 0 0 0 NaN NaN Warning message: In qf(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), rep(c(0.0653, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=FALSE) [1] 0 0 0 0 0 NaN NaN 0 0 0 0 0 NaN NaN 0 0 0 0 0 [20] NaN NaN 0 0 0 0 0 NaN NaN 0 0 0 0 0 NaN NaN Warning message: In qf(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), rep(c(0.0653, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=TRUE) [1] Inf Inf Inf Inf Inf NaN NaN Inf Inf Inf Inf Inf NaN NaN Inf Inf Inf Inf Inf [20] NaN NaN Inf Inf Inf Inf Inf NaN NaN Inf Inf Inf Inf Inf NaN NaN Warning message: In qf(0, c(0.0653, 0.000123, 3.2e-79, 8833, 7.9e+71, 0, -1), rep(c(0.0653, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=FALSE) [1] NaN NaN 0.4368535 NaN NaN NaN [7] NaN NaN NaN Inf NaN NaN [13] NaN NaN 13.0639281 NaN NaN Inf [19] NaN NaN NaN NaN NaN NaN [25] NaN NaN NaN NaN NaN Inf [31] NaN NaN NaN Inf NaN NaN [37] NaN NaN 9.0192419 NaN NaN NaN [43] NaN NaN NaN NaN NaN NaN [49] NaN NaN NaN NaN NaN Inf [55] NaN NaN NaN Inf NaN NaN [61] NaN NaN 0.4368535 NaN NaN NaN [67] NaN NaN NaN Inf NaN NaN [73] NaN NaN 13.0639281 NaN NaN Inf [79] NaN NaN NaN NaN NaN NaN [85] NaN NaN NaN NaN NaN Inf [91] NaN NaN NaN Inf NaN NaN [97] NaN NaN 9.0192419 NaN NaN NaN [103] NaN NaN NaN NaN NaN NaN [109] NaN NaN NaN NaN NaN Inf [115] NaN NaN NaN Inf NaN NaN Warning message: In qf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=TRUE) [1] NaN NaN NaN NaN NaN NaN [7] NaN NaN 2.19885391 0.00000000 NaN NaN [13] NaN NaN NaN NaN NaN 0.00000000 [19] NaN NaN NaN NaN NaN NaN [25] NaN NaN NaN NaN NaN 0.00000000 [31] NaN NaN 0.00384456 0.00000000 NaN NaN [37] NaN NaN NaN NaN NaN NaN [43] NaN NaN 3.54447244 NaN NaN NaN [49] NaN NaN NaN NaN NaN 0.00000000 [55] NaN NaN NaN 0.00000000 NaN NaN [61] NaN NaN NaN NaN NaN NaN [67] NaN NaN 2.19885391 0.00000000 NaN NaN [73] NaN NaN NaN NaN NaN 0.00000000 [79] NaN NaN NaN NaN NaN NaN [85] NaN NaN NaN NaN NaN 0.00000000 [91] NaN NaN 0.00384456 0.00000000 NaN NaN [97] NaN NaN NaN NaN NaN NaN [103] NaN NaN 3.54447244 NaN NaN NaN [109] NaN NaN NaN NaN NaN 0.00000000 [115] NaN NaN NaN 0.00000000 NaN NaN Warning message: In qf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=FALSE) [1] NaN NaN 3.885781e-13 NaN NaN [6] NaN NaN NaN NaN 0.000000e+00 [11] NaN NaN NaN NaN 3.728274e-01 [16] NaN NaN 0.000000e+00 NaN NaN [21] NaN NaN NaN NaN NaN [26] NaN NaN NaN NaN 0.000000e+00 [31] NaN NaN NaN 0.000000e+00 NaN [36] NaN NaN NaN 8.286649e-02 NaN [41] NaN NaN NaN NaN NaN [46] NaN NaN NaN NaN NaN [51] NaN NaN NaN 0.000000e+00 NaN [56] NaN NaN 0.000000e+00 NaN NaN [61] NaN NaN 3.885781e-13 NaN NaN [66] NaN NaN NaN NaN 0.000000e+00 [71] NaN NaN NaN NaN 3.728274e-01 [76] NaN NaN 0.000000e+00 NaN NaN [81] NaN NaN NaN NaN NaN [86] NaN NaN NaN NaN 0.000000e+00 [91] NaN NaN NaN 0.000000e+00 NaN [96] NaN NaN NaN 8.286649e-02 NaN [101] NaN NaN NaN NaN NaN [106] NaN NaN NaN NaN NaN [111] NaN NaN NaN 0.000000e+00 NaN [116] NaN NaN 0.000000e+00 NaN NaN Warning message: In qf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=TRUE) [1] NaN NaN NaN NaN NaN [6] NaN NaN NaN 3.712400e-01 Inf [11] NaN NaN NaN NaN NaN [16] NaN NaN Inf NaN NaN [21] NaN NaN NaN NaN NaN [26] NaN NaN NaN NaN Inf [31] NaN NaN 7.636093e-08 Inf NaN [36] NaN NaN NaN NaN NaN [41] NaN NaN NaN NaN 8.941077e-01 [46] NaN NaN NaN NaN NaN [51] NaN NaN NaN Inf NaN [56] NaN NaN Inf NaN NaN [61] NaN NaN NaN NaN NaN [66] NaN NaN NaN 3.712400e-01 Inf [71] NaN NaN NaN NaN NaN [76] NaN NaN Inf NaN NaN [81] NaN NaN NaN NaN NaN [86] NaN NaN NaN NaN Inf [91] NaN NaN 7.636093e-08 Inf NaN [96] NaN NaN NaN NaN NaN [101] NaN NaN NaN NaN 8.941077e-01 [106] NaN NaN NaN NaN NaN [111] NaN NaN NaN Inf NaN [116] NaN NaN Inf NaN NaN Warning message: In qf(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5)) [1] NA NaN NaN NaN NaN NA 0 NaN NaN NaN NA 0 NaN NaN NaN Warning message: In qf(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA NaN NaN Inf NaN NA NaN NaN [9] 0.655161 NaN NA NaN NaN NaN NaN Warning message: In qf(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qf(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA NaN NaN Inf NaN [6] NA NaN NaN 1.168926e-19 NaN [11] NA NaN NaN NaN NaN Warning message: In qf(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(0, 10, 10, lower.tail=FALSE, log.p=FALSE) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(0, 10, 10, lower.tail=FALSE, log.p=TRUE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(0, 10, 10, lower.tail=TRUE, log.p=FALSE) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(0, 10, 10, lower.tail=TRUE, log.p=TRUE) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=FALSE) [1] Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf [20] Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=TRUE) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=FALSE) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=TRUE) [1] Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf [20] Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=FALSE) [1] NaN Inf 2.5641351 NaN NaN Inf [7] NaN NaN NaN Inf NaN NaN [13] NaN Inf 46.6009643 NaN NaN Inf [19] NaN NaN NaN Inf NaN NaN [25] NaN Inf 2.3201254 NaN NaN Inf [31] NaN NaN NaN Inf NaN NaN [37] NaN Inf 5.7065876 NaN NaN Inf [43] NaN NaN NaN Inf NaN NaN [49] NaN Inf 0.8535264 NaN NaN Inf [55] NaN NaN NaN Inf NaN NaN [61] NaN Inf 2.5641351 NaN NaN Inf [67] NaN NaN NaN Inf NaN NaN [73] NaN Inf 46.6009643 NaN NaN Inf [79] NaN NaN NaN Inf NaN NaN [85] NaN Inf 2.3201254 NaN NaN Inf [91] NaN NaN NaN Inf NaN NaN [97] NaN Inf 5.7065876 NaN NaN Inf [103] NaN NaN NaN Inf NaN NaN [109] NaN Inf 0.8535264 NaN NaN Inf [115] NaN NaN NaN Inf NaN NaN Warning message: In qlnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=TRUE) [1] NaN 0.0000000 NaN NaN NaN 0.0000000 [7] NaN NaN 3.4468989 0.0000000 NaN NaN [13] NaN 0.0000000 NaN NaN NaN 0.0000000 [19] NaN NaN 0.5155479 0.0000000 NaN NaN [25] NaN 0.0000000 NaN NaN NaN 0.0000000 [31] NaN NaN 1.5487915 0.0000000 NaN NaN [37] NaN 0.0000000 NaN NaN NaN 0.0000000 [43] NaN NaN 28.1479623 0.0000000 NaN NaN [49] NaN 0.0000000 NaN NaN NaN 0.0000000 [55] NaN NaN 1.4014045 0.0000000 NaN NaN [61] NaN 0.0000000 NaN NaN NaN 0.0000000 [67] NaN NaN 3.4468989 0.0000000 NaN NaN [73] NaN 0.0000000 NaN NaN NaN 0.0000000 [79] NaN NaN 0.5155479 0.0000000 NaN NaN [85] NaN 0.0000000 NaN NaN NaN 0.0000000 [91] NaN NaN 1.5487915 0.0000000 NaN NaN [97] NaN 0.0000000 NaN NaN NaN 0.0000000 [103] NaN NaN 28.1479623 0.0000000 NaN NaN [109] NaN 0.0000000 NaN NaN NaN 0.0000000 [115] NaN NaN 1.4014045 0.0000000 NaN NaN Warning message: In qlnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=FALSE) [1] NaN 0.0000000 0.4763410 NaN NaN 0.0000000 NaN [8] NaN NaN 0.0000000 NaN NaN NaN 0.0000000 [15] 8.6570911 NaN NaN 0.0000000 NaN NaN NaN [22] 0.0000000 NaN NaN NaN 0.0000000 0.4310112 NaN [29] NaN 0.0000000 NaN NaN NaN 0.0000000 NaN [36] NaN NaN 0.0000000 1.0601165 NaN NaN 0.0000000 [43] NaN NaN NaN 0.0000000 NaN NaN NaN [50] 0.0000000 0.1585602 NaN NaN 0.0000000 NaN NaN [57] NaN 0.0000000 NaN NaN NaN 0.0000000 0.4763410 [64] NaN NaN 0.0000000 NaN NaN NaN 0.0000000 [71] NaN NaN NaN 0.0000000 8.6570911 NaN NaN [78] 0.0000000 NaN NaN NaN 0.0000000 NaN NaN [85] NaN 0.0000000 0.4310112 NaN NaN 0.0000000 NaN [92] NaN NaN 0.0000000 NaN NaN NaN 0.0000000 [99] 1.0601165 NaN NaN 0.0000000 NaN NaN NaN [106] 0.0000000 NaN NaN NaN 0.0000000 0.1585602 NaN [113] NaN 0.0000000 NaN NaN NaN 0.0000000 NaN [120] NaN Warning message: In qlnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=TRUE) [1] NaN Inf NaN NaN NaN Inf [7] NaN NaN 1.7550986 Inf NaN NaN [13] NaN Inf NaN NaN NaN Inf [19] NaN NaN 0.2625077 Inf NaN NaN [25] NaN Inf NaN NaN NaN Inf [31] NaN NaN 0.7886166 Inf NaN NaN [37] NaN Inf NaN NaN NaN Inf [43] NaN NaN 14.3324334 Inf NaN NaN [49] NaN Inf NaN NaN NaN Inf [55] NaN NaN 0.7135698 Inf NaN NaN [61] NaN Inf NaN NaN NaN Inf [67] NaN NaN 1.7550986 Inf NaN NaN [73] NaN Inf NaN NaN NaN Inf [79] NaN NaN 0.2625077 Inf NaN NaN [85] NaN Inf NaN NaN NaN Inf [91] NaN NaN 0.7886166 Inf NaN NaN [97] NaN Inf NaN NaN NaN Inf [103] NaN NaN 14.3324334 Inf NaN NaN [109] NaN Inf NaN NaN NaN Inf [115] NaN NaN 0.7135698 Inf NaN NaN Warning message: In qlnorm(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5)) [1] NA 0 NaN NaN NaN NA 0 NaN NaN NaN NA 0 NaN NaN NaN Warning message: In qlnorm(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA 0.0000000 NaN Inf 0.0000000 NA Inf [8] NaN Inf Inf NA 0.8797169 NaN 0.0000000 [15] 0.0000000 ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlnorm(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA 0.000000 NaN Inf 0.000000 NA Inf NaN [9] 0.000000 Inf NA 1.105171 NaN 0.000000 NaN Warning message: In qlnorm(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(0, 10, 10, lower.tail=FALSE, log.p=FALSE) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(0, 10, 10, lower.tail=FALSE, log.p=TRUE) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(0, 10, 10, lower.tail=TRUE, log.p=FALSE) [1] -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(0, 10, 10, lower.tail=TRUE, log.p=TRUE) [1] Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=FALSE) [1] Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf [20] Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=FALSE, log.p=TRUE) [1] -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf [16] -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf [31] -Inf -Inf -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=FALSE) [1] -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf [16] -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf -Inf [31] -Inf -Inf -Inf -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(0, c(0.0653, 0.000123, 32e-80, 8833, 79e70, 0, -1), rep(c(0.0653, 0.000123, 32e-80, 8833, 79e70), 7), lower.tail=TRUE, log.p=TRUE) [1] Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf [20] Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=FALSE) [1] NaN Inf 1.4862944 NaN NaN Inf NaN [8] NaN NaN Inf NaN NaN NaN Inf [15] 4.3862944 NaN NaN Inf NaN NaN NaN [22] Inf NaN NaN NaN Inf 1.3862944 NaN [29] NaN Inf NaN NaN NaN Inf NaN [36] NaN NaN Inf 2.2862944 NaN NaN Inf [43] NaN NaN NaN Inf NaN NaN NaN [50] Inf 0.3862944 NaN NaN Inf NaN NaN [57] NaN Inf NaN NaN NaN Inf 1.4862944 [64] NaN NaN Inf NaN NaN NaN Inf [71] NaN NaN NaN Inf 4.3862944 NaN NaN [78] Inf NaN NaN NaN Inf NaN NaN [85] NaN Inf 1.3862944 NaN NaN Inf NaN [92] NaN NaN Inf NaN NaN NaN Inf [99] 2.2862944 NaN NaN Inf NaN NaN NaN [106] Inf NaN NaN NaN Inf 0.3862944 NaN [113] NaN Inf NaN NaN NaN Inf NaN [120] NaN Warning message: In qlogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=FALSE, log.p=TRUE) [1] NaN -Inf NaN NaN NaN -Inf [7] NaN NaN 1.4413249 -Inf NaN NaN [13] NaN -Inf NaN NaN NaN -Inf [19] NaN NaN -0.4586751 -Inf NaN NaN [25] NaN -Inf NaN NaN NaN -Inf [31] NaN NaN 0.6413249 -Inf NaN NaN [37] NaN -Inf NaN NaN NaN -Inf [43] NaN NaN 3.5413249 -Inf NaN NaN [49] NaN -Inf NaN NaN NaN -Inf [55] NaN NaN 0.5413249 -Inf NaN NaN [61] NaN -Inf NaN NaN NaN -Inf [67] NaN NaN 1.4413249 -Inf NaN NaN [73] NaN -Inf NaN NaN NaN -Inf [79] NaN NaN -0.4586751 -Inf NaN NaN [85] NaN -Inf NaN NaN NaN -Inf [91] NaN NaN 0.6413249 -Inf NaN NaN [97] NaN -Inf NaN NaN NaN -Inf [103] NaN NaN 3.5413249 -Inf NaN NaN [109] NaN -Inf NaN NaN NaN -Inf [115] NaN NaN 0.5413249 -Inf NaN NaN Warning message: In qlogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=FALSE) [1] NaN -Inf -1.2862944 NaN NaN -Inf [7] NaN NaN NaN -Inf NaN NaN [13] NaN -Inf 1.6137056 NaN NaN -Inf [19] NaN NaN NaN -Inf NaN NaN [25] NaN -Inf -1.3862944 NaN NaN -Inf [31] NaN NaN NaN -Inf NaN NaN [37] NaN -Inf -0.4862944 NaN NaN -Inf [43] NaN NaN NaN -Inf NaN NaN [49] NaN -Inf -2.3862944 NaN NaN -Inf [55] NaN NaN NaN -Inf NaN NaN [61] NaN -Inf -1.2862944 NaN NaN -Inf [67] NaN NaN NaN -Inf NaN NaN [73] NaN -Inf 1.6137056 NaN NaN -Inf [79] NaN NaN NaN -Inf NaN NaN [85] NaN -Inf -1.3862944 NaN NaN -Inf [91] NaN NaN NaN -Inf NaN NaN [97] NaN -Inf -0.4862944 NaN NaN -Inf [103] NaN NaN NaN -Inf NaN NaN [109] NaN -Inf -2.3862944 NaN NaN -Inf [115] NaN NaN NaN -Inf NaN NaN Warning message: In qlogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, 1, 0.1, -0.1, 0.0001), 20), lower.tail=TRUE, log.p=TRUE) [1] NaN Inf NaN NaN NaN Inf [7] NaN NaN 0.3586751 Inf NaN NaN [13] NaN Inf NaN NaN NaN Inf [19] NaN NaN -1.5413249 Inf NaN NaN [25] NaN Inf NaN NaN NaN Inf [31] NaN NaN -0.4413249 Inf NaN NaN [37] NaN Inf NaN NaN NaN Inf [43] NaN NaN 2.4586751 Inf NaN NaN [49] NaN Inf NaN NaN NaN Inf [55] NaN NaN -0.5413249 Inf NaN NaN [61] NaN Inf NaN NaN NaN Inf [67] NaN NaN 0.3586751 Inf NaN NaN [73] NaN Inf NaN NaN NaN Inf [79] NaN NaN -1.5413249 Inf NaN NaN [85] NaN Inf NaN NaN NaN Inf [91] NaN NaN -0.4413249 Inf NaN NaN [97] NaN Inf NaN NaN NaN Inf [103] NaN NaN 2.4586751 Inf NaN NaN [109] NaN Inf NaN NaN NaN Inf [115] NaN NaN -0.5413249 Inf NaN NaN Warning message: In qlogis(c(-1, 0, 0.2, 2), c(-1, 0, 0.1, 0.9, 3), rep(c(-1, 0, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5)) [1] NA -Inf NaN NaN NaN NA -Inf NaN NaN NaN NA -Inf NaN NaN NaN Warning message: In qlogis(c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5), rep(c(1, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0), rep(c(1, 0, 0.1), 5)) [1] NA -Inf NaN Inf -Inf NA [7] Inf NaN Inf Inf NA -0.2197225 [13] NaN -Inf -Inf ##com.oracle.truffle.r.test.library.stats.TestStatFunctions.testFunctions32#Output.MayIgnoreWarningContext# #set.seed(1); qlogis(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, 1/0, -1/0)) [1] NA -Inf NaN Inf -Inf NA Inf NaN -Inf Inf NA 0.1 NaN -Inf NaN Warning message: In qlogis(rep(c(1, 0, 0.1), 5), rep(c(1, 0, 0.1), 5), c(NA, 0, NaN, : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStats.testCor# #{ as.integer(cor(c(1,2,3),c(1,2,5))*10000000) } [1] 9607689 ##com.oracle.truffle.r.test.library.stats.TestStats.testCor# #{ cor(c(1,2,3),c(1,2,3)) } [1] 1 ##com.oracle.truffle.r.test.library.stats.TestStats.testCor#Output.IgnoreWarningContext# #{ cor(cbind(c(1, 1, 1), c(1, 1, 1))) } [,1] [,2] [1,] 1 NA [2,] NA 1 Warning message: In cor(cbind(c(1, 1, 1), c(1, 1, 1))) : the standard deviation is zero ##com.oracle.truffle.r.test.library.stats.TestStats.testCor# #{ cor(cbind(c(1:9,0/0), 101:110)) } [,1] [,2] [1,] 1 NA [2,] NA 1 ##com.oracle.truffle.r.test.library.stats.TestStats.testCor# #{ cor(cbind(c(3,2,1), c(1,2,3))) } [,1] [,2] [1,] 1 -1 [2,] -1 1 ##com.oracle.truffle.r.test.library.stats.TestStats.testCor# #{ round( cor(cbind(c(10,5,4,1), c(2,5,10,5))), digits=5 ) } [,1] [,2] [1,] 1.00000 -0.53722 [2,] -0.53722 1.00000 ##com.oracle.truffle.r.test.library.stats.TestStats.testCov# #{ cov(c(1,2,3),c(1,2,3)) } [1] 1 ##com.oracle.truffle.r.test.library.stats.TestStats.testCov# #{ cov(c(1,2,3),c(1,2,4)) } [1] 1.5 ##com.oracle.truffle.r.test.library.stats.TestStats.testCov# #{ cov(c(1,2,3),c(1,2,5)) } [1] 2 ##com.oracle.truffle.r.test.library.stats.TestStats.testDbinom# #round(dbinom(0.9,c(10,12,14),c(0.3,0.4,0.3,0.1,0.33)),digits=9) [1] 0 0 0 0 0 Warning messages: 1: In dbinom(0.9, c(10, 12, 14), c(0.3, 0.4, 0.3, 0.1, 0.33)) : non-integer x = 0.900000 2: In dbinom(0.9, c(10, 12, 14), c(0.3, 0.4, 0.3, 0.1, 0.33)) : non-integer x = 0.900000 3: In dbinom(0.9, c(10, 12, 14), c(0.3, 0.4, 0.3, 0.1, 0.33)) : non-integer x = 0.900000 4: In dbinom(0.9, c(10, 12, 14), c(0.3, 0.4, 0.3, 0.1, 0.33)) : non-integer x = 0.900000 5: In dbinom(0.9, c(10, 12, 14), c(0.3, 0.4, 0.3, 0.1, 0.33)) : non-integer x = 0.900000 ##com.oracle.truffle.r.test.library.stats.TestStats.testDbinom# #round(dbinom(2,14,0.33),digits=9) [1] 0.08108993 ##com.oracle.truffle.r.test.library.stats.TestStats.testDbinom# #round(dbinom(81,c(10,12,14),c(0.3,0.4,0.3,0.1,0.33)),digits=9) [1] 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestStats.testDbinom# #round(dbinom(c(81,2,4,9),c(10,12,14),c(0.3,0.4,0.3,0.1,0.33)),digits=9) [1] 0.000000000 0.063852282 0.229033757 0.000000009 0.000000000 ##com.oracle.truffle.r.test.library.stats.TestStats.testFFT# #{ fft(10) } [1] 10+0i ##com.oracle.truffle.r.test.library.stats.TestStats.testFFT# #{ fft(1:4) } [1] 10+0i -2+2i -2+0i -2-2i ##com.oracle.truffle.r.test.library.stats.TestStats.testFFT# #{ fft(1:4, inverse=TRUE) } [1] 10+0i -2-2i -2+0i -2+2i ##com.oracle.truffle.r.test.library.stats.TestStats.testFFT# #{ fft(c(0, 1, integer(6))) } [1] 1.0000000+0.0000000i 0.7071068-0.7071068i 0.0000000-1.0000000i [4] -0.7071068-0.7071068i -1.0000000+0.0000000i -0.7071068+0.7071068i [7] 0.0000000+1.0000000i 0.7071068+0.7071068i ##com.oracle.truffle.r.test.library.stats.TestStats.testFFT# #{ fft(c(complex(real=1, imaginary=0), integer(7))) } [1] 1+0i 1+0i 1+0i 1+0i 1+0i 1+0i 1+0i 1+0i ##com.oracle.truffle.r.test.library.stats.TestStats.testFFT# #{ fft(cbind(1:2,3:4)) } [,1] [,2] [1,] 10+0i -4+0i [2,] -2+0i 0+0i ##com.oracle.truffle.r.test.library.stats.TestStats.testNaFail#Output.IgnoreErrorContext# #na.fail(NULL) Error in complete.cases(object) : no input has determined the number of cases ##com.oracle.truffle.r.test.library.stats.TestStats.testNaFail#Output.IgnoreErrorContext# #na.fail(c()) Error in complete.cases(object) : no input has determined the number of cases ##com.oracle.truffle.r.test.library.stats.TestStats.testNaFail# #na.fail(c(1,2,3)) [1] 1 2 3 ##com.oracle.truffle.r.test.library.stats.TestStats.testNaFail# #na.fail(c(1,NA,3)) Error in na.fail.default(c(1, NA, 3)) : missing values in object ##com.oracle.truffle.r.test.library.stats.TestStats.testNaFail# #na.fail(c(1L, 2L)) [1] 1 2 ##com.oracle.truffle.r.test.library.stats.TestStats.testNaFail# #na.fail(c(NA, 2L)) Error in na.fail.default(c(NA, 2L)) : missing values in object ##com.oracle.truffle.r.test.library.stats.TestStats.testNumericDeriv# #{ env <- new.env(); env$a <- 1; env$q <- 2; env$x <- c(1,2,3,4); numericDeriv(quote(a * x^q), c('a', 'q'), env) } [1] 1 4 9 16 attr(,"gradient") [,1] [,2] [1,] 1 0.000000 [2,] 4 2.772589 [3,] 9 9.887511 [4,] 16 22.180710 ##com.oracle.truffle.r.test.library.stats.TestStats.testNumericDeriv# #{ env <- new.env(); env$a <- 1; env$q <- seq(from=2.2, to=2.5, by=0.1); env$x <- c(1,2,3,4); r<-numericDeriv(quote(a * x^q), c('a', 'q'), env); rna<-r; attributes(rna)<-NULL; print(rna); print(round(attr(r, 'gradient'), 4)) } [1] 1.000000 4.924578 13.966610 32.000000 [,1] [,2] [,3] [,4] [,5] [1,] 1.0000 0 0.0000 0.0000 0.0000 [2,] 4.9246 0 3.4135 0.0000 0.0000 [3,] 13.9666 0 0.0000 15.3439 0.0000 [4,] 32.0000 0 0.0000 0.0000 44.3614 ##com.oracle.truffle.r.test.library.stats.TestStats.testNumericDeriv#IgnoreOS.MacOS# #{ regressionData <- data.frame(x = c(1, 2, 3, 4), y = c(1.5, 3.3, 99, 16)); startingParams <- list(a = 1, q = 2); nls(formula = 'y ~ a*x^q', data = regressionData, start = startingParams) } Nonlinear regression model model: y ~ a * x^q data: regressionData a q 14.1977 0.8766 residual sum-of-squares: 5515 Number of iterations to convergence: 25 Achieved convergence tolerance: 8.787e-06 ##com.oracle.truffle.r.test.library.stats.TestStats.testPnorm# #pnorm(1:10/10,10L,c(3)) [1] 0.0004834241 0.0005441087 0.0006117735 0.0006871379 0.0007709848 [6] 0.0008641652 0.0009676032 0.0010823005 0.0012093414 0.0013498980 ##com.oracle.truffle.r.test.library.stats.TestStats.testPnorm# #pnorm(1:10/10,c(2,10.5),c(3)) [1] 0.2632579950 0.0002981043 0.2854703359 0.0003804130 0.3085375387 [6] 0.0004834241 0.3323863126 0.0006117735 0.3569338367 0.0007709848 ##com.oracle.truffle.r.test.library.stats.TestStats.testPnorm# #pnorm(1:10/10,c(2,10.5),c(3,7)) [1] 0.26325800 0.07058763 0.28547034 0.07453036 0.30853754 0.07863901 [7] 0.33238631 0.08291708 0.35693384 0.08736791 ##com.oracle.truffle.r.test.library.stats.TestStats.testPnorm# #round(pnorm(1:10/10,c(2,NA),c(3)),digits=7) [1] 0.2632580 NA 0.2854703 NA 0.3085375 NA 0.3323863 [8] NA 0.3569338 NA ##com.oracle.truffle.r.test.library.stats.TestStats.testPnorm# #round(pnorm(1:10/10,c(2,NaN),c(3)),digits=7) [1] 0.2632580 NaN 0.2854703 NaN 0.3085375 NaN 0.3323863 [8] NaN 0.3569338 NaN ##com.oracle.truffle.r.test.library.stats.TestStats.testQbinom# #qbinom(0,20,0.1) [1] 0 ##com.oracle.truffle.r.test.library.stats.TestStats.testQbinom# #qbinom(0,20,c(0.1,0.9)) [1] 0 0 ##com.oracle.truffle.r.test.library.stats.TestStats.testQbinom# #qbinom(0,20,c(0.1,1.9)) [1] 0 NaN Warning message: In qbinom(0, 20, c(0.1, 1.9)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStats.testQbinom# #qbinom(0,integer(),c(0.1,0.9)) numeric(0) ##com.oracle.truffle.r.test.library.stats.TestStats.testQbinom# #qbinom(0.66,20,0.1) [1] 2 ##com.oracle.truffle.r.test.library.stats.TestStats.testQbinom# #qbinom(1,20,0.1) [1] 20 ##com.oracle.truffle.r.test.library.stats.TestStats.testQbinom# #qbinom(1:100/100,0,0.1) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [38] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [75] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 ##com.oracle.truffle.r.test.library.stats.TestStats.testQbinom# #qbinom(1:100/100,20,0.1) [1] 0 0 0 0 0 0 0 0 0 0 0 0 1 1 1 1 1 1 1 1 1 1 1 1 1 [26] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 2 2 2 2 2 2 2 2 2 2 2 [51] 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 2 3 3 3 3 3 3 3 3 [76] 3 3 3 3 3 3 3 3 3 3 3 4 4 4 4 4 4 4 4 4 5 5 5 6 20 ##com.oracle.truffle.r.test.library.stats.TestStats.testQbinom# #qbinom(1:100/100,5,0.1) [1] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 [38] 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 [75] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 2 2 2 2 2 2 2 2 5 ##com.oracle.truffle.r.test.library.stats.TestStats.testQbinom# #qbinom(1:50/100,20,0.7) [1] 9 10 10 10 11 11 11 11 11 11 11 12 12 12 12 12 12 12 12 12 12 12 13 13 13 [26] 13 13 13 13 13 13 13 13 13 13 13 13 13 13 14 14 14 14 14 14 14 14 14 14 14 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ p <- (1:9)/10 ; qgamma(p, shape=1) } [1] 0.1053605 0.2231436 0.3566749 0.5108256 0.6931472 0.9162907 1.2039728 [8] 1.6094379 2.3025851 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ qgamma(0.5, shape=1) } [1] 0.6931472 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ qgamma(0.5, shape=1, rate=double()) } numeric(0) ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ qgamma(0.5, shape=c(2,1), scale=c(3,4)) } [1] 5.035041 2.772589 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ qgamma(0.5, shape=c(2,1), scale=c(3,4,5)) } [1] 5.035041 2.772589 8.391735 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ qgamma(0.5, shape=c(2,1,2), scale=c(3,4,5)) } [1] 5.035041 2.772589 8.391735 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ qgamma(0.5, shape=double()) } numeric(0) ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ qgamma(c(0.5, 0.7), shape=c(2,1,2), scale=c(3,4,5)) } [1] 5.035041 4.815891 8.391735 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ qgamma(c(0.5, 0.7, 0.5), shape=c(2,1,2), scale=c(3,4,5)) } [1] 5.035041 4.815891 8.391735 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ x<-c(0.5); y<-c(s1=1); z<-c(s1=7); attr(z, "foo")<-"foo"; qgamma(x, shape=y, rate=z) } [1] 0.09902103 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ x<-c(0.5); y<-c(s1=1); z<-c(s1=7); qgamma(x, shape=y, rate=z) } [1] 0.09902103 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ x<-c(0.5); y<-c(s1=1, s2=2); z<-c(s1=7, s2=8); qgamma(0.5, shape=y, rate=z) } s1 s2 0.09902103 0.20979337 ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ x<-c(a=0.5); y<-c(s1=1); attr(y, "bar")<-"bar"; z<-c(7, s3=8); attr(z, "foo")<-"foo"; qgamma(x, shape=y, rate=z) } s3 0.09902103 0.08664340 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.library.stats.TestStats.testQgamma# #{ x<-c(a=0.5, b=0.7); attr(x, "foo")<-"foo"; qgamma(x, shape=1) } a b 0.6931472 1.2039728 attr(,"foo") [1] "foo" ##com.oracle.truffle.r.test.library.stats.TestStats.testQnorm# #qnorm(c(0.1,0.9,0.5,0.00001,0.99999), 100, c(20,1)) [1] 74.36897 101.28155 100.00000 95.73511 185.29782 ##com.oracle.truffle.r.test.library.stats.TestStats.testQnorm# #round(qnorm(c(0.1,0.9,0.5,1.00001,0.99999), 100, c(20,1)), digits=5) [1] 74.36897 101.28155 100.00000 NaN 185.29782 Warning message: In qnorm(c(0.1, 0.9, 0.5, 1.00001, 0.99999), 100, c(20, 1)) : NaNs produced ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(4336, "default"); sum(runif(10000)) } [1] 4997.493 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(4357, "default"); round( rnorm(3), digits = 5 ) } [1] -0.13102 0.98938 -0.30562 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(4357, "default"); round( rnorm(3,1000,10), digits = 5 ) } [1] 998.6898 1009.8938 996.9438 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(4357, "default"); sum(runif(10)) } [1] 6.631059 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); matrix(rnorm(10), ncol=5) } [,1] [,2] [,3] [,4] [,5] [1,] 2.287247 -0.6942925 -0.9706733 0.7481393 0.1526576 [2,] -1.196772 -0.4122930 -0.9472799 -0.1169552 2.1899781 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); matrix(rnorm(100), ncol=10) } [,1] [,2] [,3] [,4] [,5] [,6] [1,] 2.2872472 0.356986230 0.8397504 -0.87085102 1.2185505 -0.262742349 [2,] -1.1967717 2.716751783 0.7053418 0.71871055 -0.6993171 -0.007668105 [3,] -0.6942925 2.281451926 1.3059647 0.11065288 -0.2854328 0.367153007 [4,] -0.4122930 0.324020540 -1.3879962 -0.07846677 -1.3115527 1.707162545 [5,] -0.9706733 1.896067067 1.2729169 -0.42049046 -0.3910124 0.723740263 [6,] -0.9472799 0.467680511 0.1841928 -0.56212588 -0.4015266 0.481036049 [7,] 0.7481393 -0.893800723 0.7522799 0.99751344 1.3505176 -1.567868244 [8,] -0.1169552 -0.307328300 0.5917451 -1.10513006 0.5911900 0.318250283 [9,] 0.1526576 -0.004822422 -0.9830526 -0.14228783 0.1005255 0.165991451 [10,] 2.1899781 0.988164149 -0.2760640 0.31499490 0.9310720 -0.899907630 [,7] [,8] [,9] [,10] [1,] 0.07637147 0.43262716 0.342585350 1.6357944 [2,] 0.15915528 -0.92260172 0.004248236 -0.6454235 [3,] 0.54367418 -0.61558421 0.029219842 0.6189922 [4,] 0.70480735 -0.86665969 -0.393423429 0.2363936 [5,] 0.31896914 -1.63951709 -0.792704563 0.8465009 [6,] 1.10924979 -1.32583924 -0.311701865 -0.5736457 [7,] 0.76915419 -0.88903673 -0.346068592 1.1179932 [8,] 1.15347367 -0.55760233 -0.304607588 -1.5400011 [9,] 1.26068350 -0.06240231 -1.785893487 -0.4381239 [10,] 0.70062351 2.42269298 0.587274672 -0.1506730 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); matrix(rnorm(25*25), ncol=25) } [,1] [,2] [,3] [,4] [,5] [1,] 2.287247161 0.18419277 -0.262742349 -1.325839244 0.51905837 [2,] -1.196771682 0.75227990 -0.007668105 -0.889036728 0.58753970 [3,] -0.694292510 0.59174505 0.367153007 -0.557602330 -0.07933306 [4,] -0.412292951 -0.98305260 1.707162545 -0.062402309 -1.17436101 [5,] -0.970673341 -0.27606396 0.723740263 2.422692977 0.30872212 [6,] -0.947279945 -0.87085102 0.481036049 0.342585350 -1.60387854 [7,] 0.748139340 0.71871055 -1.567868244 0.004248236 0.99128963 [8,] -0.116955226 0.11065288 0.318250283 0.029219842 1.02322044 [9,] 0.152657626 -0.07846677 0.165991451 -0.393423429 0.84014544 [10,] 2.189978107 -0.42049046 -0.899907630 -0.792704563 0.12007861 [11,] 0.356986230 -0.56212588 0.076371474 -0.311701865 -0.42625506 [12,] 2.716751783 0.99751344 0.159155278 -0.346068592 0.45892624 [13,] 2.281451926 -1.10513006 0.543674185 -0.304607588 0.64504795 [14,] 0.324020540 -0.14228783 0.704807353 -1.785893487 0.61153055 [15,] 1.896067067 0.31499490 0.318969143 0.587274672 -0.88921129 [16,] 0.467680511 1.21855053 1.109249789 1.635794434 1.54389235 [17,] -0.893800723 -0.69931708 0.769154195 -0.645423474 -1.24176360 [18,] -0.307328300 -0.28543275 1.153473675 0.618992169 1.10344734 [19,] -0.004822422 -1.31155267 1.260683503 0.236393598 0.98277236 [20,] 0.988164149 -0.39101243 0.700623507 0.846500899 0.30432717 [21,] 0.839750360 -0.40152661 0.432627161 -0.573645739 -1.55471822 [22,] 0.705341831 1.35051758 -0.922601718 1.117993204 1.56989078 [23,] 1.305964721 0.59119003 -0.615584207 -1.540001132 0.68844969 [24,] -1.387996217 0.10052546 -0.866659688 -0.438123899 -0.17760366 [25,] 1.272916864 0.93107200 -1.639517087 -0.150672971 0.72920127 [,6] [,7] [,8] [,9] [,10] [,11] [1,] 1.53325093 -0.355694443 0.25604208 2.02334405 1.242064560 -1.47759178 [2,] 0.50657845 1.097300411 0.72783900 0.86249250 -0.015258466 -2.97325571 [3,] 0.03332768 -0.906691970 1.32411092 -0.02490949 -0.791788389 -1.33976214 [4,] -1.46755072 -0.207456624 0.14715849 0.60063495 -0.401618743 -0.26584203 [5,] 1.01915772 0.678861434 -0.59853939 1.21648074 -1.896701290 -0.38399341 [6,] -0.59333933 -0.797787741 2.19252993 -1.17653155 0.971974934 -0.60294233 [7,] 0.81240989 -1.591538938 2.32711280 -0.60934003 -0.513954856 -0.65152404 [8,] 0.86616783 1.180348125 1.13486960 0.38726257 0.014561673 1.75767151 [9,] 0.36830830 1.222569290 -0.19088456 -1.39914014 -0.260935570 -0.01903487 [10,] 1.13481910 -0.010909187 0.47484456 1.23249185 1.522358392 0.15528461 [11,] -0.75709928 0.345522466 -0.54547494 0.01550750 -1.473369746 -0.76084644 [12,] 0.44522057 0.094189158 1.05564854 -1.62095905 -0.016558014 -1.54972691 [13,] 0.91593294 0.006793368 0.42902183 -0.66546466 0.024540609 2.75016501 [14,] 0.26975874 0.742622878 -1.81995641 -0.57484051 -0.001256989 1.04742325 [15,] 1.00754045 1.042186536 -0.69197609 -0.90189298 -0.433932707 0.91799247 [16,] -1.46143326 -0.319337138 -1.93182825 1.49159937 -0.405559057 0.47010951 [17,] -0.87478561 0.322643396 1.20967201 -0.13727932 0.155233319 -0.61737209 [18,] 0.16522894 0.685052979 -0.27900005 0.10828170 -0.972381818 0.04210627 [19,] 0.20720703 0.320242774 -1.09578323 -1.03521510 1.548174930 -0.90189890 [20,] 0.48236189 -1.914938024 -0.10218604 -0.44474392 -0.370123333 1.33958321 [21,] -0.07165837 -2.339962899 0.35702296 -0.19604927 1.961525257 0.80385435 [22,] -0.88892843 0.482864294 -0.88230257 -1.26936449 -0.609995576 0.31847865 [23,] 0.48594357 1.178530047 -0.05664779 0.95352118 -0.077428757 -0.19045331 [24,] 0.34049676 -1.292777034 -0.58101895 0.47254665 -1.828859263 -1.08726669 [25,] -1.09792419 0.615773085 0.64408819 -0.55877810 0.805924242 0.14539973 [,12] [,13] [,14] [,15] [,16] [,17] [1,] 2.46280025 0.52526155 -0.61315746 0.49138316 -0.9997716 -0.31970564 [2,] 0.92361969 -0.27572731 0.15250297 -0.06901262 0.5492103 1.16506594 [3,] 0.74187669 0.05470977 -0.59170745 -1.35079631 0.2797712 -0.62171055 [4,] 1.41602179 -0.38824961 -0.96070497 0.79935757 0.9166359 1.24821319 [5,] 1.25166337 -0.41702305 -0.58495799 -0.32009408 -1.7312573 1.44040154 [6,] 2.10890569 -1.16417517 0.65667289 -0.35695119 -1.4795811 0.76199344 [7,] 0.71031260 1.73786414 -0.29024959 -0.51072794 2.2298110 0.55937124 [8,] -1.47518201 -0.25407735 0.90409773 -1.87888008 0.3864989 1.59926381 [9,] -0.58972648 -0.97371862 0.19902022 -0.95184509 0.6602657 -0.09845773 [10,] 0.13970325 1.11119895 -0.05157481 2.27315661 -0.2762352 -1.44955378 [11,] -0.51172423 0.97349906 -0.90820518 0.20268763 0.2759330 -0.25766131 [12,] 0.15093735 1.25712868 -1.14247834 -2.30855470 -2.2742312 -2.03307133 [13,] 0.44203940 1.77628758 0.99032494 -0.05663566 0.9080857 0.58696417 [14,] -0.16239912 -2.68316852 0.11227328 0.06284384 -1.0862531 0.16058653 [15,] 0.97183854 0.65986308 1.14963167 0.71022814 -0.2155267 0.11315287 [16,] -0.67126548 1.17944967 -0.91049532 -0.59230740 -0.7334274 0.57169061 [17,] 1.63839716 0.39351378 -1.10381972 0.29852463 0.2121178 -0.96552965 [18,] -1.06827268 -1.18985867 -1.63486731 0.64253563 -0.9391419 0.31800115 [19,] -0.01141212 -0.35652737 -1.61638249 2.11279510 -0.6191936 -0.17350759 [20,] -1.86528134 -1.46550804 -0.83673701 0.91777963 0.2440112 -0.91261118 [21,] 0.01825086 -1.09073015 1.09299912 -1.57285475 0.3717434 -1.84689477 [22,] -0.24702055 -0.65725422 1.23509818 0.99264173 0.6272082 0.66951802 [23,] -0.91942511 2.26294100 0.17206660 0.47952087 -1.0731139 -0.10878652 [24,] -2.17316443 0.08769003 0.12049317 -0.29658056 -0.7086927 1.56657535 [25,] -0.64937705 0.76752300 0.55753267 0.81584023 0.9071317 -0.84484523 [,18] [,19] [,20] [,21] [,22] [,23] [1,] 1.09764928 -1.30582273 0.11689002 -0.20601575 0.28303792 -0.027191653 [2,] 0.30088034 2.02341262 0.42113270 -0.58784361 -2.25259008 1.561392979 [3,] -0.77696625 -0.75564882 1.57740438 -0.68545295 0.73435019 -0.991078158 [4,] -0.03843418 -0.24159462 -0.25138852 1.00482418 0.14580574 0.004193986 [5,] 1.10948957 1.09715890 -0.05562434 -0.77264909 -0.64942858 -0.044804842 [6,] 0.53632527 -0.94661275 -0.02253187 -1.99373370 -0.56122436 -0.688653669 [7,] -0.36334846 -1.13395992 2.33096097 -0.90925448 0.33479205 -0.130254649 [8,] -0.10550071 -0.88338352 -0.09883035 -0.56315608 0.03201843 0.155092788 [9,] 0.33387464 0.51641340 0.16643158 -1.21785562 1.23691719 1.277341552 [10,] 0.81023105 -0.33795540 -0.26963540 -1.82031785 0.05641342 1.053548212 [11,] -1.68369538 -0.02245186 0.84447361 -0.39962935 -0.14543271 -0.371716546 [12,] 0.66572784 -0.10205096 1.40876775 2.11836835 -0.59234963 -0.103132501 [13,] -0.79238753 0.30040860 -1.56623622 1.41515755 -1.26071298 2.498073606 [14,] 1.52772330 0.80662041 0.16903819 0.56476512 -0.68360578 -0.777260866 [15,] -1.48669240 -0.03720589 -1.50567917 -1.08129716 -0.16343720 0.757384577 [16,] -0.67114858 -1.45647599 0.99493295 -0.94197609 -0.43847351 0.022545035 [17,] 1.67517745 -0.62389065 1.24390841 -0.24418344 -0.57870301 -1.650031528 [18,] 0.61193206 -0.16959827 -0.03625683 1.08548855 1.58109043 -0.889116216 [19,] -0.23220565 1.27612317 -0.41125588 0.55834383 1.54066131 -0.608369722 [20,] 0.60529332 -0.25591448 1.28414896 -2.17622835 0.70298100 -0.213062904 [21,] -1.15910612 -0.16536827 -1.11780766 0.87730123 -0.06374862 1.471211256 [22,] -1.16442927 -0.42732111 -0.83506970 0.84253534 -0.74062398 0.466388474 [23,] -0.86992495 -0.05687275 1.50081170 -0.05158399 -1.03394717 1.818358361 [24,] -0.26110572 -1.44538360 0.89915086 -0.69012140 -0.29606366 1.923396212 [25,] -0.49419566 1.88280702 -0.45641208 -1.83898285 -1.44294972 -0.539003564 [,24] [,25] [1,] -0.38627880 -1.22783170 [2,] -0.86180767 0.13415845 [3,] -0.40200658 -0.37323349 [4,] 0.59896282 0.03906038 [5,] 0.08183728 0.14312432 [6,] 0.33102576 0.10494725 [7,] -0.46124694 0.60219574 [8,] 0.35903924 -0.11839549 [9,] -0.51579118 0.55916954 [10,] 0.58727622 0.04186138 [11,] 1.61961103 0.06362112 [12,] 0.44523123 1.46620369 [13,] 1.25526120 -0.47263087 [14,] -0.57490665 0.16347454 [15,] 0.31608949 0.30635016 [16,] -2.18787056 0.79257622 [17,] 2.37210132 -0.94907675 [18,] 0.97657987 0.90478698 [19,] 0.61445181 -0.34011041 [20,] -0.31526265 1.53100750 [21,] 0.23103795 0.38940339 [22,] 2.07548009 0.49598198 [23,] 0.65268490 0.64485868 [24,] -0.03739630 -0.04376477 [25,] -0.70639151 -1.35686873 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); rnorm(10) } [1] 2.2872472 -1.1967717 -0.6942925 -0.4122930 -0.9706733 -0.9472799 [7] 0.7481393 -0.1169552 0.1526576 2.1899781 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); rnorm(100) } [1] 2.287247161 -1.196771682 -0.694292510 -0.412292951 -0.970673341 [6] -0.947279945 0.748139340 -0.116955226 0.152657626 2.189978107 [11] 0.356986230 2.716751783 2.281451926 0.324020540 1.896067067 [16] 0.467680511 -0.893800723 -0.307328300 -0.004822422 0.988164149 [21] 0.839750360 0.705341831 1.305964721 -1.387996217 1.272916864 [26] 0.184192771 0.752279896 0.591745052 -0.983052596 -0.276063955 [31] -0.870851023 0.718710553 0.110652878 -0.078466768 -0.420490459 [36] -0.562125876 0.997513445 -1.105130059 -0.142287831 0.314994905 [41] 1.218550535 -0.699317079 -0.285432752 -1.311552673 -0.391012431 [46] -0.401526613 1.350517581 0.591190027 0.100525456 0.931071996 [51] -0.262742349 -0.007668105 0.367153007 1.707162545 0.723740263 [56] 0.481036049 -1.567868244 0.318250283 0.165991451 -0.899907630 [61] 0.076371474 0.159155278 0.543674185 0.704807353 0.318969143 [66] 1.109249789 0.769154195 1.153473675 1.260683503 0.700623507 [71] 0.432627161 -0.922601718 -0.615584207 -0.866659688 -1.639517087 [76] -1.325839244 -0.889036728 -0.557602330 -0.062402309 2.422692977 [81] 0.342585350 0.004248236 0.029219842 -0.393423429 -0.792704563 [86] -0.311701865 -0.346068592 -0.304607588 -1.785893487 0.587274672 [91] 1.635794434 -0.645423474 0.618992169 0.236393598 0.846500899 [96] -0.573645739 1.117993204 -1.540001132 -0.438123899 -0.150672971 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); rnorm(25*25) } [1] 2.287247161 -1.196771682 -0.694292510 -0.412292951 -0.970673341 [6] -0.947279945 0.748139340 -0.116955226 0.152657626 2.189978107 [11] 0.356986230 2.716751783 2.281451926 0.324020540 1.896067067 [16] 0.467680511 -0.893800723 -0.307328300 -0.004822422 0.988164149 [21] 0.839750360 0.705341831 1.305964721 -1.387996217 1.272916864 [26] 0.184192771 0.752279896 0.591745052 -0.983052596 -0.276063955 [31] -0.870851023 0.718710553 0.110652878 -0.078466768 -0.420490459 [36] -0.562125876 0.997513445 -1.105130059 -0.142287831 0.314994905 [41] 1.218550535 -0.699317079 -0.285432752 -1.311552673 -0.391012431 [46] -0.401526613 1.350517581 0.591190027 0.100525456 0.931071996 [51] -0.262742349 -0.007668105 0.367153007 1.707162545 0.723740263 [56] 0.481036049 -1.567868244 0.318250283 0.165991451 -0.899907630 [61] 0.076371474 0.159155278 0.543674185 0.704807353 0.318969143 [66] 1.109249789 0.769154195 1.153473675 1.260683503 0.700623507 [71] 0.432627161 -0.922601718 -0.615584207 -0.866659688 -1.639517087 [76] -1.325839244 -0.889036728 -0.557602330 -0.062402309 2.422692977 [81] 0.342585350 0.004248236 0.029219842 -0.393423429 -0.792704563 [86] -0.311701865 -0.346068592 -0.304607588 -1.785893487 0.587274672 [91] 1.635794434 -0.645423474 0.618992169 0.236393598 0.846500899 [96] -0.573645739 1.117993204 -1.540001132 -0.438123899 -0.150672971 [101] 0.519058365 0.587539705 -0.079333061 -1.174361015 0.308722118 [106] -1.603878543 0.991289625 1.023220445 0.840145439 0.120078608 [111] -0.426255055 0.458926244 0.645047948 0.611530549 -0.889211294 [116] 1.543892349 -1.241763605 1.103447340 0.982772357 0.304327174 [121] -1.554718216 1.569890776 0.688449693 -0.177603659 0.729201266 [126] 1.533250931 0.506578448 0.033327676 -1.467550715 1.019157716 [131] -0.593339333 0.812409890 0.866167830 0.368308303 1.134819099 [136] -0.757099280 0.445220569 0.915932944 0.269758742 1.007540449 [141] -1.461433265 -0.874785611 0.165228938 0.207207027 0.482361891 [146] -0.071658375 -0.888928425 0.485943570 0.340496757 -1.097924194 [151] -0.355694443 1.097300411 -0.906691970 -0.207456624 0.678861434 [156] -0.797787741 -1.591538938 1.180348125 1.222569290 -0.010909187 [161] 0.345522466 0.094189158 0.006793368 0.742622878 1.042186536 [166] -0.319337138 0.322643396 0.685052979 0.320242774 -1.914938024 [171] -2.339962899 0.482864294 1.178530047 -1.292777034 0.615773085 [176] 0.256042081 0.727839002 1.324110919 0.147158490 -0.598539393 [181] 2.192529927 2.327112796 1.134869600 -0.190884556 0.474844564 [186] -0.545474935 1.055648545 0.429021832 -1.819956414 -0.691976089 [191] -1.931828248 1.209672013 -0.279000048 -1.095783227 -0.102186042 [196] 0.357022958 -0.882302566 -0.056647794 -0.581018951 0.644088189 [201] 2.023344053 0.862492498 -0.024909491 0.600634949 1.216480735 [206] -1.176531550 -0.609340034 0.387262573 -1.399140144 1.232491851 [211] 0.015507501 -1.620959052 -0.665464664 -0.574840510 -0.901892975 [216] 1.491599370 -0.137279317 0.108281698 -1.035215103 -0.444743919 [221] -0.196049266 -1.269364492 0.953521185 0.472546654 -0.558778101 [226] 1.242064560 -0.015258466 -0.791788389 -0.401618743 -1.896701290 [231] 0.971974934 -0.513954856 0.014561673 -0.260935570 1.522358392 [236] -1.473369746 -0.016558014 0.024540609 -0.001256989 -0.433932707 [241] -0.405559057 0.155233319 -0.972381818 1.548174930 -0.370123333 [246] 1.961525257 -0.609995576 -0.077428757 -1.828859263 0.805924242 [251] -1.477591780 -2.973255713 -1.339762142 -0.265842026 -0.383993408 [256] -0.602942330 -0.651524037 1.757671509 -0.019034865 0.155284612 [261] -0.760846441 -1.549726907 2.750165012 1.047423248 0.917992474 [266] 0.470109508 -0.617372088 0.042106273 -0.901898901 1.339583210 [271] 0.803854350 0.318478653 -0.190453307 -1.087266691 0.145399729 [276] 2.462800251 0.923619692 0.741876688 1.416021792 1.251663370 [281] 2.108905691 0.710312603 -1.475182009 -0.589726484 0.139703246 [286] -0.511724233 0.150937351 0.442039395 -0.162399123 0.971838541 [291] -0.671265482 1.638397161 -1.068272681 -0.011412125 -1.865281340 [296] 0.018250863 -0.247020546 -0.919425112 -2.173164432 -0.649377054 [301] 0.525261550 -0.275727311 0.054709765 -0.388249606 -0.417023046 [306] -1.164175165 1.737864135 -0.254077350 -0.973718623 1.111198947 [311] 0.973499056 1.257128676 1.776287583 -2.683168522 0.659863075 [316] 1.179449667 0.393513776 -1.189858667 -0.356527365 -1.465508044 [321] -1.090730152 -0.657254216 2.262941004 0.087690029 0.767523002 [326] -0.613157464 0.152502970 -0.591707447 -0.960704967 -0.584957995 [331] 0.656672889 -0.290249588 0.904097729 0.199020224 -0.051574807 [336] -0.908205179 -1.142478339 0.990324936 0.112273278 1.149631674 [341] -0.910495324 -1.103819717 -1.634867306 -1.616382494 -0.836737007 [346] 1.092999116 1.235098180 0.172066602 0.120493170 0.557532670 [351] 0.491383162 -0.069012624 -1.350796315 0.799357571 -0.320094077 [356] -0.356951189 -0.510727938 -1.878880082 -0.951845090 2.273156615 [361] 0.202687630 -2.308554698 -0.056635663 0.062843842 0.710228137 [366] -0.592307397 0.298524630 0.642535627 2.112795096 0.917779633 [371] -1.572854753 0.992641731 0.479520871 -0.296580555 0.815840235 [376] -0.999771613 0.549210294 0.279771204 0.916635890 -1.731257258 [381] -1.479581067 2.229811027 0.386498946 0.660265688 -0.276235210 [386] 0.275932999 -2.274231202 0.908085740 -1.086253108 -0.215526715 [391] -0.733427376 0.212117835 -0.939141903 -0.619193637 0.244011158 [396] 0.371743383 0.627208219 -1.073113926 -0.708692714 0.907131672 [401] -0.319705638 1.165065941 -0.621710549 1.248213190 1.440401542 [406] 0.761993438 0.559371235 1.599263806 -0.098457735 -1.449553784 [411] -0.257661306 -2.033071331 0.586964172 0.160586532 0.113152868 [416] 0.571690607 -0.965529654 0.318001153 -0.173507590 -0.912611181 [421] -1.846894773 0.669518018 -0.108786519 1.566575351 -0.844845232 [426] 1.097649284 0.300880343 -0.776966252 -0.038434179 1.109489569 [431] 0.536325266 -0.363348458 -0.105500712 0.333874643 0.810231052 [436] -1.683695383 0.665727843 -0.792387535 1.527723303 -1.486692398 [441] -0.671148581 1.675177447 0.611932061 -0.232205646 0.605293318 [446] -1.159106124 -1.164429272 -0.869924947 -0.261105718 -0.494195664 [451] -1.305822731 2.023412621 -0.755648821 -0.241594619 1.097158899 [456] -0.946612751 -1.133959921 -0.883383523 0.516413399 -0.337955399 [461] -0.022451856 -0.102050958 0.300408597 0.806620413 -0.037205895 [466] -1.456475992 -0.623890647 -0.169598272 1.276123168 -0.255914477 [471] -0.165368271 -0.427321111 -0.056872747 -1.445383596 1.882807020 [476] 0.116890018 0.421132703 1.577404382 -0.251388524 -0.055624336 [481] -0.022531871 2.330960973 -0.098830347 0.166431579 -0.269635400 [486] 0.844473608 1.408767749 -1.566236221 0.169038186 -1.505679169 [491] 0.994932947 1.243908408 -0.036256826 -0.411255878 1.284148964 [496] -1.117807659 -0.835069705 1.500811698 0.899150860 -0.456412078 [501] -0.206015750 -0.587843606 -0.685452946 1.004824182 -0.772649093 [506] -1.993733701 -0.909254485 -0.563156081 -1.217855617 -1.820317853 [511] -0.399629346 2.118368348 1.415157546 0.564765116 -1.081297164 [516] -0.941976094 -0.244183443 1.085488554 0.558343827 -2.176228351 [521] 0.877301231 0.842535336 -0.051583988 -0.690121403 -1.838982845 [526] 0.283037917 -2.252590083 0.734350187 0.145805741 -0.649428581 [531] -0.561224360 0.334792049 0.032018427 1.236917189 0.056413424 [536] -0.145432708 -0.592349626 -1.260712980 -0.683605784 -0.163437195 [541] -0.438473508 -0.578703015 1.581090432 1.540661310 0.702981004 [546] -0.063748618 -0.740623984 -1.033947166 -0.296063663 -1.442949725 [551] -0.027191653 1.561392979 -0.991078158 0.004193986 -0.044804842 [556] -0.688653669 -0.130254649 0.155092788 1.277341552 1.053548212 [561] -0.371716546 -0.103132501 2.498073606 -0.777260866 0.757384577 [566] 0.022545035 -1.650031528 -0.889116216 -0.608369722 -0.213062904 [571] 1.471211256 0.466388474 1.818358361 1.923396212 -0.539003564 [576] -0.386278801 -0.861807666 -0.402006583 0.598962820 0.081837282 [581] 0.331025756 -0.461246936 0.359039240 -0.515791179 0.587276223 [586] 1.619611026 0.445231229 1.255261202 -0.574906649 0.316089488 [591] -2.187870565 2.372101320 0.976579870 0.614451811 -0.315262654 [596] 0.231037949 2.075480091 0.652684898 -0.037396298 -0.706391507 [601] -1.227831705 0.134158451 -0.373233489 0.039060375 0.143124323 [606] 0.104947251 0.602195742 -0.118395494 0.559169543 0.041861378 [611] 0.063621116 1.466203694 -0.472630868 0.163474538 0.306350163 [616] 0.792576218 -0.949076754 0.904786982 -0.340110408 1.531007499 [621] 0.389403389 0.495981980 0.644858676 -0.043764773 -1.356868729 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( rbinom(3,10,(1:5)/5), digits = 5 ) } [1] 5 4 8 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( rbinom(3,3,0.9), digits = 5 ) } [1] 1 3 3 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( rcauchy(3), digits = 5 ) } [1] -0.03486 3.00509 0.38038 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( rcauchy(3, scale=4, location=1:3), digits = 5 ) } [1] 0.86057 14.02037 4.52150 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( rgamma(3,0.5,rate=1:3), digits = 5 ) } [1] 3.63965 0.00938 0.02776 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( rgamma(3,0.5,scale=1:3), digits = 5 ) } [1] 3.63965 0.03753 0.24984 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( rgamma(3,1), digits = 5 ) } [1] 3.42520 0.95263 2.76594 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( rlnorm(3), digits = 5 ) } [1] 9.84779 0.30217 0.49943 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( rlnorm(3,sdlog=c(10,3,0.5)), digits = 5 ) } [1] 8.578043e+09 2.759000e-02 7.067000e-01 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( rnorm(3,c(1000,2,3),c(10,11)), digits = 5 ) } [1] 1022.87247 -11.16449 -3.94293 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( runif(3), digits = 5 ) } [1] 0.98891 0.39775 0.11570 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( runif(3,1,10), digits = 5 ) } [1] 9.90018 4.57971 2.04128 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); round( runif(3,1:3,3:2), digits = 5 ) } [1] 2.97782 2.00000 3.00000 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); runif(10) } [1] 0.98890930 0.39774545 0.11569778 0.06974868 0.24374939 0.79201043 [7] 0.34006235 0.97206250 0.16585548 0.45910367 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); runif(100) } [1] 0.988909298 0.397745453 0.115697779 0.069748679 0.243749391 0.792010426 [7] 0.340062353 0.972062501 0.165855485 0.459103666 0.171748077 0.231477102 [13] 0.772811946 0.096301542 0.453447770 0.084700713 0.560665867 0.008704600 [19] 0.985737091 0.316584804 0.639448942 0.295223235 0.996703694 0.906021320 [25] 0.988739144 0.065645739 0.627038758 0.490475041 0.971024413 0.362220848 [31] 0.679993461 0.263719930 0.185714261 0.185143222 0.379296747 0.847024392 [37] 0.498076133 0.790585574 0.838463872 0.456903865 0.799475815 0.381943061 [43] 0.759701231 0.436775602 0.904217721 0.319534914 0.082569093 0.816289079 [49] 0.898476221 0.966496398 0.573068883 0.720079497 0.774058624 0.627760801 [55] 0.722989341 0.386831279 0.162790778 0.187228283 0.391249474 0.273901210 [61] 0.191917748 0.504391806 0.763840357 0.693668871 0.544054188 0.659087226 [67] 0.468728380 0.481805539 0.337063598 0.424526302 0.287015131 0.601191532 [73] 0.840742326 0.620837048 0.134551619 0.567722430 0.443426331 0.437975423 [79] 0.623617233 0.932653342 0.888492583 0.878540561 0.242176948 0.741453797 [85] 0.387656313 0.078951739 0.094835550 0.762142731 0.347894026 0.416766709 [91] 0.344016231 0.008410923 0.911574991 0.182205419 0.722803449 0.571963331 [97] 0.540036414 0.354947415 0.824091838 0.186136761 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(7); runif(25*25) } [1] 0.988909298 0.397745453 0.115697779 0.069748679 0.243749391 0.792010426 [7] 0.340062353 0.972062501 0.165855485 0.459103666 0.171748077 0.231477102 [13] 0.772811946 0.096301542 0.453447770 0.084700713 0.560665867 0.008704600 [19] 0.985737091 0.316584804 0.639448942 0.295223235 0.996703694 0.906021320 [25] 0.988739144 0.065645739 0.627038758 0.490475041 0.971024413 0.362220848 [31] 0.679993461 0.263719930 0.185714261 0.185143222 0.379296747 0.847024392 [37] 0.498076133 0.790585574 0.838463872 0.456903865 0.799475815 0.381943061 [43] 0.759701231 0.436775602 0.904217721 0.319534914 0.082569093 0.816289079 [49] 0.898476221 0.966496398 0.573068883 0.720079497 0.774058624 0.627760801 [55] 0.722989341 0.386831279 0.162790778 0.187228283 0.391249474 0.273901210 [61] 0.191917748 0.504391806 0.763840357 0.693668871 0.544054188 0.659087226 [67] 0.468728380 0.481805539 0.337063598 0.424526302 0.287015131 0.601191532 [73] 0.840742326 0.620837048 0.134551619 0.567722430 0.443426331 0.437975423 [79] 0.623617233 0.932653342 0.888492583 0.878540561 0.242176948 0.741453797 [85] 0.387656313 0.078951739 0.094835550 0.762142731 0.347894026 0.416766709 [91] 0.344016231 0.008410923 0.911574991 0.182205419 0.722803449 0.571963331 [97] 0.540036414 0.354947415 0.824091838 0.186136761 0.396374585 0.486214877 [103] 0.496940902 0.387040419 0.643247554 0.343830247 0.956104083 0.042711742 [109] 0.765387396 0.203770043 0.684754565 0.396167753 0.058455937 0.736253970 [115] 0.624852455 0.629168641 0.565918159 0.789320506 0.184084703 0.832688440 [121] 0.530438221 0.473129903 0.563226733 0.221216818 0.706667149 0.321192662 [127] 0.759534939 0.160266412 0.625125045 0.108314490 0.866338781 0.778653253 [133] 0.779099110 0.505085685 0.875641987 0.657582362 0.896288547 0.809519769 [139] 0.758230993 0.805500210 0.667357171 0.513291479 0.178107399 0.562763405 [145] 0.269084484 0.719015143 0.193064248 0.924299747 0.050552808 0.967109258 [151] 0.092446474 0.903669725 0.186991671 0.202658952 0.288557984 0.798631273 [157] 0.475121226 0.770771818 0.992297024 0.811099534 0.634044782 0.846010283 [163] 0.501694796 0.663214930 0.511655369 0.524638179 0.347003380 0.809235938 [169] 0.213974988 0.423013881 0.377633552 0.784650579 0.364645584 0.731619959 [175] 0.380332519 0.714831269 0.037058254 0.498559137 0.721490374 0.978518000 [181] 0.949058695 0.296092094 0.259326394 0.923973980 0.732039236 0.739723322 [187] 0.593436368 0.080261439 0.801363316 0.261158882 0.283103776 0.714157090 [193] 0.868215054 0.701323045 0.061780042 0.437410935 0.330648232 0.904205126 [199] 0.440116849 0.384970255 0.698139974 0.873962532 0.721579354 0.442052124 [205] 0.468383849 0.866327895 0.120125231 0.016276919 0.621233539 0.450468939 [211] 0.054370416 0.397014734 0.839227910 0.517077034 0.846898185 0.338453275 [217] 0.799586573 0.722995738 0.547789566 0.290069000 0.334961002 0.652502363 [223] 0.676856431 0.734399399 0.740551948 0.242195845 0.729575800 0.258018252 [229] 0.186944764 0.904899304 0.938692790 0.967275376 0.107161898 0.386746766 [235] 0.865083527 0.394467736 0.837140262 0.051914743 0.619560680 0.528164664 [241] 0.060006598 0.130914320 0.941779737 0.725135227 0.754415178 0.454452775 [247] 0.429517122 0.708526997 0.767060720 0.280059143 0.937392981 0.047742886 [253] 0.693774679 0.727987585 0.513293359 0.338572729 0.071113148 0.676048664 [259] 0.845935948 0.425374720 0.276477046 0.186031271 0.791721761 0.292779080 [265] 0.806800934 0.303845516 0.643678320 0.543556314 0.871774436 0.506891669 [271] 0.224495193 0.708128533 0.671919822 0.395381115 0.820148962 0.931951389 [277] 0.606327066 0.410366985 0.843162433 0.358348509 0.071948284 0.836629100 [283] 0.190845285 0.417061561 0.565618111 0.050722353 0.582075913 0.174117556 [289] 0.685225555 0.278545690 0.471436888 0.475961835 0.187020776 0.346010851 [295] 0.686496411 0.723981390 0.633258768 0.049270478 0.136118793 0.559847002 [301] 0.361034700 0.649323652 0.863744956 0.336403099 0.182284860 0.153892108 [307] 0.417826634 0.288717891 0.751387168 0.556558449 0.212496839 0.828355182 [313] 0.055744168 0.824246763 0.881069107 0.813416916 0.889253792 0.427185679 [319] 0.495647947 0.811994791 0.635149184 0.966256866 0.537520557 0.168309421 [325] 0.502710135 0.944187227 0.771144985 0.614569535 0.851337402 0.319993825 [331] 0.374735431 0.921936606 0.626517335 0.629350343 0.753344758 0.388883051 [337] 0.625607855 0.250782848 0.027750204 0.323975102 0.009642830 0.438463602 [343] 0.685403952 0.187244218 0.880707320 0.472374433 0.098044091 0.394348188 [349] 0.730977848 0.687304613 0.601040831 0.357461814 0.766643930 0.052174472 [355] 0.907266900 0.342795660 0.558496540 0.435603583 0.274740044 0.117309494 [361] 0.985829362 0.926973709 0.990020368 0.556270809 0.871785018 0.752441008 [367] 0.424308022 0.421402510 0.682551119 0.122051680 0.292713461 0.198493198 [373] 0.854435593 0.049085436 0.666046329 0.397446506 0.034382821 0.163344789 [379] 0.244476175 0.428066254 0.026690355 0.694405509 0.886797613 0.861526547 [385] 0.390122391 0.343954109 0.136586823 0.355828221 0.459304503 0.870256480 [391] 0.639462688 0.477497697 0.188806608 0.509698991 0.477412879 0.176907800 [397] 0.280613845 0.114403635 0.740240878 0.496620325 0.978481153 0.651185201 [403] 0.805791720 0.911352574 0.490063579 0.046876546 0.725958425 0.098552066 [409] 0.888099081 0.393106178 0.119691266 0.827733963 0.271149533 0.951310817 [415] 0.650719090 0.139196557 0.080885481 0.451400035 0.891117295 0.787731541 [421] 0.506186348 0.803989580 0.052513209 0.795292841 0.252876663 0.923684047 [427] 0.282699579 0.797022308 0.183556859 0.925229186 0.932097897 0.185298056 [433] 0.445405010 0.356907755 0.543113886 0.014449528 0.150284231 0.368167803 [439] 0.328252418 0.129830291 0.422285806 0.023890862 0.102155550 0.449767343 [445] 0.829836969 0.201506994 0.681731676 0.558151370 0.288156588 0.110282171 [451] 0.892893629 0.149954897 0.493912989 0.200156888 0.214242040 0.416463380 [457] 0.343982318 0.068086939 0.028933688 0.693376990 0.834468489 0.913377619 [463] 0.303641777 0.404263421 0.505809065 0.051665923 0.397071097 0.475474120 [469] 0.936040343 0.800159157 0.070325686 0.225021683 0.493394610 0.554503728 [475] 0.509789303 0.124445061 0.499498537 0.390260760 0.332168660 0.071715833 [481] 0.342533308 0.462215300 0.561681310 0.154426905 0.165430319 0.279062960 [487] 0.939209907 0.866816371 0.355645297 0.971240275 0.975091108 0.264834033 [493] 0.270932370 0.026024646 0.469141233 0.293257812 0.033710347 0.204622180 [499] 0.789856732 0.254799355 0.069758541 0.467920935 0.001473298 0.210184196 [505] 0.090161342 0.698558903 0.395180434 0.475053075 0.350491667 0.168137522 [511] 0.273273522 0.965892061 0.257354132 0.998879220 0.960598297 0.122483281 [517] 0.492406644 0.281286263 0.561701527 0.771911790 0.223374396 0.924947239 [523] 0.060603541 0.250506086 0.997021737 0.302592350 0.852547788 0.794759759 [529] 0.820688596 0.877223568 0.680861612 0.275680595 0.268494662 0.798162794 [535] 0.516793009 0.668437805 0.183555288 0.655466895 0.909809557 0.688679830 [541] 0.789259453 0.399949068 0.624939055 0.456209752 0.424476959 0.785816751 [547] 0.138459486 0.154755993 0.557802361 0.531342120 0.993107169 0.388125351 [553] 0.822157821 0.830869126 0.770918974 0.209627276 0.921615443 0.162160798 [559] 0.894653726 0.131491530 0.982523636 0.473127613 0.761244842 0.803365579 [565] 0.070081810 0.115550329 0.277687014 0.707308517 0.555552766 0.489766358 [571] 0.304422007 0.771430857 0.559987429 0.828644309 0.670769653 0.536579325 [577] 0.435495781 0.261434323 0.834434558 0.888513507 0.251025711 0.480356591 [583] 0.949330568 0.492853978 0.142698761 0.873871213 0.495447319 0.605360667 [589] 0.031070987 0.641177472 0.507280635 0.544740617 0.402446161 0.482019869 [595] 0.178936627 0.885093973 0.014883971 0.884073181 0.258047348 0.459595995 [601] 0.700299312 0.123179266 0.391378759 0.787041728 0.521815158 0.578327551 [607] 0.348915665 0.591439999 0.338330774 0.995909323 0.122176517 0.425663092 [613] 0.958882616 0.907734567 0.399717898 0.462696604 0.165098135 0.432789549 [619] 0.866758644 0.078569611 0.834847336 0.601319070 0.895646481 0.305230110 [625] 0.962157237 ##com.oracle.truffle.r.test.library.stats.TestStats.testRandom# #{ set.seed(9567, "Marsaglia-Multicarry"); sum(runif(100)) } [1] 52.92218 ##com.oracle.truffle.r.test.library.stats.TestStats.testRbinom# #set.seed(123); rbinom(1,20,c(0.3,0.2)) [1] 5 ##com.oracle.truffle.r.test.library.stats.TestStats.testRbinom# #set.seed(123); rbinom(10,20,c(0.3,0.2)) [1] 5 5 5 6 9 1 6 6 6 4 ##com.oracle.truffle.r.test.library.stats.TestStats.testRbinom# #set.seed(123); rbinom(c(1,2),20,c(0.3,0.2)) [1] 5 5 ##com.oracle.truffle.r.test.library.stats.TestStats.testRbinom# #set.seed(123); rbinom(c(1,2),c(2,10),c(0.3,0.2)) [1] 0 3 ##com.oracle.truffle.r.test.library.stats.TestStats.testRbinom# #set.seed(123); rbinom(c(12),c(2,10),c(0.3)) [1] 0 4 0 5 2 1 1 5 1 3 2 3 ##com.oracle.truffle.r.test.library.stats.TestStats.testSd# #{ round(100*sd(c(1,2))^2) } [1] 50 ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(. ~ u+v, NULL ~ .) ~u + v ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(. ~ u+v, log(.) ~ .:q) log(.) ~ u:q + v:q ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(. ~ u+v, x + . ~ y:. + log(.)) x + . ~ log(u + v) + y:u + y:v ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(. ~ u+v, ~ . + x2) . ~ u + v + x2 ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(x ~ u+v, NULL ~ .) ~u + v ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(x ~ u+v, log(.) ~ .:q) log(x) ~ u:q + v:q ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(x ~ u+v, x + . ~ y:. + log(.)) x + x ~ log(u + v) + y:u + y:v ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(x ~ u+v, ~ . + x2) x ~ u + v + x2 ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(x ~ y, NULL ~ .) ~y ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(x ~ y, log(.) ~ .:q) log(x) ~ y:q ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(x ~ y, x + . ~ y:. + log(.)) x + x ~ y + log(y) ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(x ~ y, ~ . + x2) x ~ y + x2 ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(z ~ x + y , NULL ~ .) ~x + y ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(z ~ x + y , log(.) ~ .:q) log(z) ~ x:q + y:q ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(z ~ x + y , x + . ~ y:. + log(.)) x + z ~ y + log(x + y) + y:x ##com.oracle.truffle.r.test.library.stats.TestUpdateForm.basicTests# #update.formula(z ~ x + y , ~ . + x2) z ~ x + y + x2 ##com.oracle.truffle.r.test.library.tools.TestExternal_tabExpand.testtabExpand# #.Call(tools:::C_doTabExpand,"a b",1.1) Error: INTEGER() can only be applied to a 'integer', not a 'double' ##com.oracle.truffle.r.test.library.tools.TestExternal_tabExpand.testtabExpand# #.Call(tools:::C_doTabExpand,"a b",1L) [1] "a b" ##com.oracle.truffle.r.test.library.tools.TestExternal_tabExpand.testtabExpand# #.Call(tools:::C_doTabExpand,"a b",NULL) Error: INTEGER() can only be applied to a 'integer', not a 'NULL' ##com.oracle.truffle.r.test.library.tools.TestExternal_tabExpand.testtabExpand# #.Call(tools:::C_doTabExpand,.Call(tools:::C_doTabExpand,c(1,2),c(0L,1L)),1L) Error: STRING_ELT() can only be applied to a 'character vector', not a 'double' ##com.oracle.truffle.r.test.library.tools.TestExternal_tabExpand.testtabExpand# #.Call(tools:::C_doTabExpand,123,1L) Error: STRING_ELT() can only be applied to a 'character vector', not a 'double' ##com.oracle.truffle.r.test.library.tools.TestExternal_tabExpand.testtabExpand# #.Call(tools:::C_doTabExpand,c("a b c","x y z"),c(0L,1L)) [1] "a b c" "x y z" ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testBrowser#Context.NonShared# #browser()<<>>where<<>>c<<>> Called from: top level ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testBrowser#Context.NonShared# #do.call('browser', list())<<>>c<<>> Called from: do.call("browser", list()) ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testBrowser#Context.NonShared# #foo <- function() { stop('error msg') }; tryCatch(foo(), error=browser)<<>>print(msg)<<>>c<<>> Called from: tryCatchOne(expr, names, parentenv, handlers[[1L]]) [1] "error msg" ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testBrowser#Context.NonShared# #options(error=browser); prod('a')<<>>where<<>>c<<>> Error in prod("a") : invalid 'type' (character) of argument Called from: top level ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testBrowser#Context.NonShared# #{ bar <- function(vbar) do.call(browser, list(), envir = parent.frame(2));baz <- function(vbaz) bar(vbaz);start <- function(vstart) baz(vstart);start(42); }<<>>ls()<<>>c Called from: do.call(browser, list(), envir = parent.frame(2)) [1] "vstart" ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testBrowser#Context.NonShared# #{ foo <- function(x) browser("hello", condition=4+x, expr=x>3); foo(1); } ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testBrowser#Context.NonShared# #{ foo <- function(x) browser("hello", condition=4+x, expr=x>3); foo(5); }<<>>browserText()<<>>browserCondition()<<>>c Called from: foo(5) [1] "hello" [1] 9 ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testConditionalBreakpoint#Context.NonShared# #fun <- function(x) { cat('x='); cat(x); cat('\n') }; trace(fun, quote(if (x > 10) browser())); fun(10)<<>>; fun(11)<<>><<>><<>><<>><<>><<>> [1] "fun" Tracing fun(10) on entry x=10 Error: unexpected ';' in ";" ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testContinue#Context.NonShared#Ignored.OutputFormatting# #fun0 <- function() { print('fun0') }; fun1 <- function() { print('enter fun1'); fun0(); print('exit fun1') }; fun2 <- function() { print('enter fun2'); fun1(); print('exit fun2') }; debug(fun2); fun2()<<>><<>><<>>s<<>>n<<>><<>>s<<>>c<<>>c<<>>c<<>> debugging in: fun2() debug at #1: { print("enter fun2") fun1() print("exit fun2") } debug at #1: print("enter fun2") [1] "enter fun2" debug at #1: fun1() debugging in: fun1() debug at #1: { print("enter fun1") fun0() print("exit fun1") } debug at #1: print("enter fun1") [1] "enter fun1" debug at #1: fun0() debugging in: fun0() debug at #1: { print("fun0") } [1] "fun0" exiting from: fun0() debug at #1: print("exit fun1") [1] "exit fun1" exiting from: fun1() debug at #1: print("exit fun2") [1] "exit fun2" exiting from: fun2() ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testDebugOnce#Context.NonShared#Ignored.OutputFormatting# #fun0 <- function() { print('fun0') }; debugonce(fun0); fun0()<<>>c<<>> debugging in: fun0() debug at #1: { print("fun0") } [1] "fun0" exiting from: fun0() ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testDebugOnce#Context.NonShared#Ignored.OutputFormatting# #fun0 <- function() { print('fun0') }; fun1 <- function() { print('en'); fun0(); fun0(); print('ex') }; debugonce(fun0); fun1()<<>>c<<>> [1] "en" debugging in: fun0() debug at #1: { print("fun0") } [1] "fun0" exiting from: fun0() [1] "fun0" [1] "ex" ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testInvalidName#Context.NonShared# #f <- function(x) {<<>> `123t` <- x + 1<<>> print(`123t`)<<>> `123t`}<<>>debug(f)<<>>f(5)<<>>x<<>>n<<>>n<<>>`123t`<<>>n<<>>n<<>>undebug(f) debugging in: f(5) debug at #1: { `123t` <- x + 1 print(`123t`) `123t` } [1] 5 debug at #2: `123t` <- x + 1 debug at #3: print(`123t`) [1] 6 [1] 6 debug at #4: `123t` exiting from: f(5) [1] 6 ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testLoop#Context.NonShared# #fun <- function(x) { for(i in seq(x)) cat(i); cat(5) }; debug(fun); fun(3)<<>><<>><<>><<>><<>><<>><<>>undebug(fun) debugging in: fun(3) debug at #1: { for (i in seq(x)) cat(i) cat(5) } debug at #1: for (i in seq(x)) cat(i) debug at #1: cat(i) 1debug at #1: cat(i) 2debug at #1: cat(i) 3debug at #1: cat(5) 5exiting from: fun(3) ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testLoop#Context.NonShared# #fun <- function(x) { for(i in seq(x)) { cat(i) }; cat(5) }; debug(fun); fun(3)<<>><<>><<>><<>><<>><<>><<>>undebug(fun) debugging in: fun(3) debug at #1: { for (i in seq(x)) { cat(i) } cat(5) } debug at #1: for (i in seq(x)) { cat(i) } debug at #1: cat(i) 1debug at #1: cat(i) 2debug at #1: cat(i) 3debug at #1: cat(5) 5exiting from: fun(3) ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testLoop#Context.NonShared# #fun <- function(x) { for(i in seq(x)) { cat(i) }; cat(5) }; debug(fun); fun(3)<<>><<>><<>><<>>f<<>><<>>undebug(fun) debugging in: fun(3) debug at #1: { for (i in seq(x)) { cat(i) } cat(5) } debug at #1: for (i in seq(x)) { cat(i) } debug at #1: cat(i) 1debug at #1: cat(i) 23debug at #1: cat(5) 5exiting from: fun(3) ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testLoop#Context.NonShared# #fun <- function(x) { for(j in seq(2)) for(i in seq(x)) cat(i); cat(5) }; debug(fun); fun(3)<<>><<>><<>><<>><<>><<>><<>><<>><<>><<>><<>><<>>undebug(fun) debugging in: fun(3) debug at #1: { for (j in seq(2)) for (i in seq(x)) cat(i) cat(5) } debug at #1: for (j in seq(2)) for (i in seq(x)) cat(i) debug at #1: for (i in seq(x)) cat(i) debug at #1: cat(i) 1debug at #1: cat(i) 2debug at #1: cat(i) 3debug at #1: for (i in seq(x)) cat(i) debug at #1: cat(i) 1debug at #1: cat(i) 2debug at #1: cat(i) 3debug at #1: cat(5) 5exiting from: fun(3) ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testLoop#Context.NonShared# #fun <- function(x) { for(j in seq(2)) for(i in seq(x)) cat(i); cat(5) }; debug(fun); fun(3)<<>><<>><<>><<>>f<<>>f<<>><<>>undebug(fun) debugging in: fun(3) debug at #1: { for (j in seq(2)) for (i in seq(x)) cat(i) cat(5) } debug at #1: for (j in seq(2)) for (i in seq(x)) cat(i) debug at #1: for (i in seq(x)) cat(i) debug at #1: cat(i) 123debug at #1: for (i in seq(x)) cat(i) 123debug at #1: cat(5) 5exiting from: fun(3) ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testNoBracket#Context.NonShared#Ignored.OutputFormatting# #f <- function(x) print(x)<<>>debug(f)<<>>f(5)<<>>x<<>>n<<>>undebug(f) debugging in: f(5) debug at #1: print(x) [1] 5 [1] 5 exiting from: f(5) ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testPromise#Context.NonShared# #fun <- function(x) { cat({ cat(x); cat('<<>>') }) }; debug(fun); fun(3)<<>><<>><<>><<>><<>>undebug(fun) debugging in: fun(3) debug at #1: { cat({ cat(x) cat("\n") }) } debug at #1: cat({ cat(x) cat("\n") }) debug at #1: cat(x) 3debug at #1: cat("\n") exiting from: fun(3) ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testSetBreakpoint#Context.NonShared#Output.IgnoreDebugCallString#Output.IgnoreDebugPath# #source('tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r'); setBreakpoint('tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r', 4, verbose=F); fun(10)<<>><<>><<>><<>><<>><<>><<>><<>> debug.r#4 Called from: fun(10) debug: print("Hello") [1] "Hello" debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: for (i in seq(3)) print(i) debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: print(i) [1] 1 debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: print(i) [1] 2 debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: print(i) [1] 3 debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#6: bar("World") [1] "World" debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#7: print(x) [1] 10 ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testSetBreakpoint#Context.NonShared#Output.IgnoreDebugCallString#Output.IgnoreDebugPath# #source('tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r'); setBreakpoint('tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r', 4, verbose=F); fun(10)<<>><<>><<>><<>><<>><<>><<>><<>><<>>setBreakpoint('tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r', 4, verbose=F, clear=T); fun(10)<<>>setBreakpoint('tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r', 4, verbose=F); invisible(fun(10))<<>><<>><<>><<>><<>><<>><<>><<>><<>> debug.r#4 Called from: fun(10) debug: print("Hello") [1] "Hello" debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: for (i in seq(3)) print(i) debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: print(i) [1] 1 debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: print(i) [1] 2 debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: print(i) [1] 3 debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#6: bar("World") [1] "World" debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#7: print(x) [1] 10 [1] "Hello" [1] 1 [1] 2 [1] 3 [1] "World" [1] 10 debug.r#4 Called from: fun(10) debug: print("Hello") [1] "Hello" debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: for (i in seq(3)) print(i) debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: print(i) [1] 1 debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: print(i) [1] 2 debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#5: print(i) [1] 3 debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#6: bar("World") [1] "World" debug at tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r#7: print(x) [1] 10 ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testSetBreakpoint#Context.NonShared# #source('tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r'); setBreakpoint('tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r', 4, verbose=F); setBreakpoint('tmptest/com.oracle.truffle.r.test.library.utils.rsrc/debug.r', 4, verbose=F, clear=T); fun(10)<<>> [1] "Hello" [1] 1 [1] 2 [1] 3 [1] "World" [1] 10 ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testSimple#Context.NonShared# #f <- function(x) {<<>> t <- x + 1<<>> print(t)<<>> t}<<>>debug(f)<<>>f(5)<<>>x<<>>n<<>>n<<>>t<<>>n<<>>n<<>>undebug(f) debugging in: f(5) debug at #1: { t <- x + 1 print(t) t } [1] 5 debug at #2: t <- x + 1 debug at #3: print(t) [1] 6 [1] 6 debug at #4: t exiting from: f(5) [1] 6 ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testSimple#Context.NonShared# #f <- function(x) {<<>> t <- x + 1<<>> print(t)<<>> t}<<>>debug(f)<<>>f(5)<<>>x<<>>n<<>>n<<>>t<<>>n<<>>n<<>>undebug(f)<<>>f(3)<<>>debug(f)<<>>f(5)<<>>x<<>>n<<>>n<<>>t<<>>n<<>>n debugging in: f(5) debug at #1: { t <- x + 1 print(t) t } [1] 5 debug at #2: t <- x + 1 debug at #3: print(t) [1] 6 [1] 6 debug at #4: t exiting from: f(5) [1] 6 [1] 4 [1] 4 debugging in: f(5) debug at #1: { t <- x + 1 print(t) t } [1] 5 debug at #2: t <- x + 1 debug at #3: print(t) [1] 6 [1] 6 debug at #4: t exiting from: f(5) [1] 6 ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testStepInto#Context.NonShared#Ignored.OutputFormatting# #bar <- function(x) { cat(x); cat('\n') }; foo <- function(x) { cat('foo entry\n'); bar(x); cat('foo exit\n') }; debug(foo); foo(3)<<>><<>><<>>s<<>>n<<>><<>><<>><<>> debugging in: foo(3) debug at #1: { cat("foo entry\n") bar(x) cat("foo exit\n") } debug at #1: cat("foo entry\n") foo entry debug at #1: bar(x) debugging in: bar(x) debug at #1: { cat(x) cat("\n") } debug at #1: cat(x) 3debug at #1: cat("\n") exiting from: bar(x) debug at #1: cat("foo exit\n") foo exit exiting from: foo(3) ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testStepInto#Context.NonShared# #bar <- function(x) { cat(x); cat('\n') }; foo <- function(x) { cat('foo entry\n'); bar(x); cat('foo exit\n') }; debug(foo); foo(3)<<>><<>><<>>s<<>>n<<>>Q<<>> debugging in: foo(3) debug at #1: { cat("foo entry\n") bar(x) cat("foo exit\n") } debug at #1: cat("foo entry\n") foo entry debug at #1: bar(x) debugging in: bar(x) debug at #1: { cat(x) cat("\n") } debug at #1: cat(x) ##com.oracle.truffle.r.test.library.utils.TestInteractiveDebug.testStepInto#Context.NonShared#Ignored.OutputFormatting# #bar <- function(x) { for(i in seq(x)) print(x) }; foo <- function(x) { cat('foo entry\n'); bar(x); cat('foo exit\n') }; debug(foo); foo(5)<<>><<>><<>>s<<>>n<<>><<>><<>>f<<>><<>> debugging in: foo(5) debug at #1: { cat("foo entry\n") bar(x) cat("foo exit\n") } debug at #1: cat("foo entry\n") foo entry debug at #1: bar(x) debugging in: bar(x) debug at #1: { for (i in seq(x)) print(x) } debug at #1: for (i in seq(x)) print(x) debug at #1: print(x) [1] 5 debug at #1: print(x) [1] 5 [1] 5 [1] 5 [1] 5 exiting from: bar(x) debug at #1: cat("foo exit\n") foo exit exiting from: foo(5) ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, allowEscapes=FALSE, text = 'a b c\\nx\n1 2 3\n4 5 6\n') a b c.nx 1 1 2 3 2 4 5 6 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams#Ignored.ReferenceError# #read.table(header = TRUE, allowEscapes=TRUE, text = 'a b c\\nx y z\n1 2 3\n4 5 6\n') a b c 1 a b c 2 x y z 3 1 2 3 4 4 5 6 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, blank.lines.skip=FALSE, text = 'a b c\n\n1 2 3\n4 5 6') a b c 1 NA NA NA 2 1 2 3 3 4 5 6 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, blank.lines.skip=TRUE, text = 'a b c\n\n1 2 3\n4 5 6') a b c 1 1 2 3 2 4 5 6 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, comment.char='/', text = 'a b c /comment\n1 2 3\n4 5 6\n') a b c 1 1 2 3 2 4 5 6 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, comment.char='/', text = 'a b c/"quotes-in-comment"\n1 2 3\n4 5 6\n') a b c 1 1 2 3 2 4 5 6 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, quote='|', text = 'a b c\n1 2 3||x') a b c 1 1 2 3||x ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, quote='|', text = 'a b c\n1 2|x 3') a b c 1 1 2|x 3 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, quote='|', text = 'a b c\n1 |2 22 222| 3\n4 5 6\n') a b c 1 1 2 22 222 3 2 4 5 6 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, quote='|', text = 'a b |c ccc|\n1 2 3\n4 5 6\n') a b c.ccc 1 1 2 3 2 4 5 6 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, text = 'a b "c ccc"\n1 2 3\n4 5 6\n') a b c.ccc 1 1 2 3 2 4 5 6 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, text = 'a b c\n1 "2 22 222" 3\n4 5 6\n') a b c 1 1 2 22 222 3 2 4 5 6 ##com.oracle.truffle.r.test.library.utils.TestReadTable.testParams# #read.table(header = TRUE, text = 'a b\n1 2\n3 4\n') a b 1 1 2 2 3 4 ##com.oracle.truffle.r.test.library.utils.TestTrace.testCondTrace# #f <- function(x) {}; (if (exists('.fastr.trace')) .fastr.trace else trace)(f, tracer=quote(if (x == 3 || x == 7) print(x))); g <- function() for (i in 1:10) f(i); g() [1] "f" Tracing f(i) on entry Tracing f(i) on entry Tracing f(i) on entry [1] 3 Tracing f(i) on entry Tracing f(i) on entry Tracing f(i) on entry Tracing f(i) on entry [1] 7 Tracing f(i) on entry Tracing f(i) on entry Tracing f(i) on entry ##com.oracle.truffle.r.test.library.utils.TestTrace.testCondTrace# #f <- function(x) {}; trace(f, tracer=quote(if (x == 3 || x == 7) print(x))); g <- function() for (i in 1:10) f(i); g() [1] "f" Tracing f(i) on entry Tracing f(i) on entry Tracing f(i) on entry [1] 3 Tracing f(i) on entry Tracing f(i) on entry Tracing f(i) on entry Tracing f(i) on entry [1] 7 Tracing f(i) on entry Tracing f(i) on entry Tracing f(i) on entry ##com.oracle.truffle.r.test.library.utils.TestTrace.testMultiTrace# #f <- function(x) {}; (if (exists('.fastr.trace')) .fastr.trace else trace)(f, tracer=quote(print(x))); g <- function() for (i in 1:10) f(i); g() [1] "f" Tracing f(i) on entry [1] 1 Tracing f(i) on entry [1] 2 Tracing f(i) on entry [1] 3 Tracing f(i) on entry [1] 4 Tracing f(i) on entry [1] 5 Tracing f(i) on entry [1] 6 Tracing f(i) on entry [1] 7 Tracing f(i) on entry [1] 8 Tracing f(i) on entry [1] 9 Tracing f(i) on entry [1] 10 ##com.oracle.truffle.r.test.library.utils.TestTrace.testMultiTrace# #f <- function(x) {}; trace(f, tracer=quote(print(x))); g <- function() for (i in 1:10) f(i); g() [1] "f" Tracing f(i) on entry [1] 1 Tracing f(i) on entry [1] 2 Tracing f(i) on entry [1] 3 Tracing f(i) on entry [1] 4 Tracing f(i) on entry [1] 5 Tracing f(i) on entry [1] 6 Tracing f(i) on entry [1] 7 Tracing f(i) on entry [1] 8 Tracing f(i) on entry [1] 9 Tracing f(i) on entry [1] 10 ##com.oracle.truffle.r.test.library.utils.TestTrace.testSimple# #f <- function(x) {}; (if (exists('.fastr.trace')) .fastr.trace else trace)(f); f() trace: f() NULL ##com.oracle.truffle.r.test.library.utils.TestTrace.testSimple# #f <- function(x) {}; trace(f); f() trace: f() NULL ##com.oracle.truffle.r.test.library.utils.TestTrace.testSimpleTrace# #f <- function(x) {}; (if (exists('.fastr.trace')) .fastr.trace else trace)(f, tracer=quote(print(x))); f(100) [1] "f" Tracing f(100) on entry [1] 100 NULL ##com.oracle.truffle.r.test.library.utils.TestTrace.testSimpleTrace# #f <- function(x) {}; trace(f, tracer=quote(print(x))); f(100) [1] "f" Tracing f(100) on entry [1] 100 NULL ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.basicTests# #csv<-read.csv(stringsAsFactors=TRUE, text='col1,col2\n,1\n2,\n'); typeof(csv$col1); csv$col1; typeof(csv$col2); csv$col2; csv [1] "integer" [1] NA 2 [1] "integer" [1] 1 NA col1 col2 1 NA 1 2 2 NA ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.basicTests# #csv<-read.csv(stringsAsFactors=TRUE, text='col1,col2\n,1\n2,\n,3\n'); typeof(csv$col1); csv$col1; typeof(csv$col2); csv$col2; csv [1] "integer" [1] NA 2 NA [1] "integer" [1] 1 NA 3 col1 col2 1 NA 1 2 2 NA 3 NA 3 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.basicTests# #type.convert('-2147483648') [1] -2147483648 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.basicTests# #type.convert('42') [1] 42 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.basicTests# #type.convert(c('42', '42.42')) [1] 42.00 42.42 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.basicTests# #type.convert(c('NA', '42')) [1] NA 42 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.basicTests# #type.convert(c('NA', '44.5')) [1] NA 44.5 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.basicTests# #type.convert(c('NA', 'NA')) [1] NA NA ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.basicTests# #type.convert(c('NA', 'TRUE')) [1] NA TRUE ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.basicTests# #type.convert(c(NA, '44.5')) [1] NA 44.5 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('+0xFFF') [1] 4095 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('+0xFFFFFFFFFFF') [1] 1.759219e+13 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('+0xFFFFFFFFFFFL') [1] +0xFFFFFFFFFFFL Levels: +0xFFFFFFFFFFFL ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('+0xFFFL') [1] +0xFFFL Levels: +0xFFFL ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('+123') [1] 123 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('+123L') [1] +123L Levels: +123L ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('+2147483648') [1] 2147483648 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('+2147483648L') [1] +2147483648L Levels: +2147483648L ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('-0xFFF') [1] -4095 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('-0xFFFFFFFFFFF') [1] -1.759219e+13 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('-0xFFFFFFFFFFFL') [1] -0xFFFFFFFFFFFL Levels: -0xFFFFFFFFFFFL ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('-0xFFFL') [1] -0xFFFL Levels: -0xFFFL ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('-123') [1] -123 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('-123L') [1] -123L Levels: -123L ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('-2147483648') [1] -2147483648 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('-2147483648L') [1] -2147483648L Levels: -2147483648L ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('0xFFF') [1] 4095 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('0xFFFFFFFFFFF') [1] 1.759219e+13 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('0xFFFFFFFFFFFL') [1] 0xFFFFFFFFFFFL Levels: 0xFFFFFFFFFFFL ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('0xFFFL') [1] 0xFFFL Levels: 0xFFFL ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('123') [1] 123 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('123L') [1] 123L Levels: 123L ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('2147483648') [1] 2147483648 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #type.convert('2147483648L') [1] 2147483648L Levels: 2147483648L ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('+0xFFF')) [1] "double" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('+0xFFFFFFFFFFF')) [1] "double" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('+0xFFFFFFFFFFFL')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('+0xFFFL')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('+123')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('+123L')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('+2147483648')) [1] "double" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('+2147483648L')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('-0xFFF')) [1] "double" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('-0xFFFFFFFFFFF')) [1] "double" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('-0xFFFFFFFFFFFL')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('-0xFFFL')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('-123')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('-123L')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('-2147483648')) [1] "double" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('-2147483648L')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('0xFFF')) [1] "double" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('0xFFFFFFFFFFF')) [1] "double" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('0xFFFFFFFFFFFL')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('0xFFFL')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('123')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('123L')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('2147483648')) [1] "double" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testConvertLiterals# #typeof(type.convert('2147483648L')) [1] "integer" ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.testFirstTypeMustBeOfModeTest# #type.convert('NA', 1) Error in type.convert.default("NA", 1) : invalid 'na.strings' argument ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, NA, 'NA', FALSE, '.', 'allow.loss') Error: the first argument must be of mode character ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, NULL, 'NA', FALSE, '.', 'allow.loss') Error: the first argument must be of mode character ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', 'TRUE', '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', 'abc', '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', 1, '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', 2, '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', FALSE, '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', NA, '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', NULL, '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', c(), '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', c(NULL), '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', environment(), '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', function() {}, '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', list('abc'), '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), 'NA', list(), '.', 'allow.loss') [1] 1 ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), NA, FALSE, '.', 'allow.loss') Error: invalid 'na.strings' argument ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), NULL, FALSE, '.', 'allow.loss') Error: invalid 'na.strings' argument ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), c(), FALSE, '.', 'allow.loss') Error: invalid 'na.strings' argument ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), c(1), FALSE, '.', 'allow.loss') Error: invalid 'na.strings' argument ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c('1'), environment(), FALSE, '.', 'allow.loss') Error: invalid 'na.strings' argument ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c(), 'NA', FALSE, '.', 'allow.loss') Error: the first argument must be of mode character ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c(1), c(1), FALSE, '.', 'allow.loss') Error: the first argument must be of mode character ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c(1, '1'), c(1), FALSE, '.', 'allow.loss') Error: invalid 'na.strings' argument ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c(1, 'TRUE'), c(1), FALSE, '.', 'allow.loss') Error: invalid 'na.strings' argument ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c(1, 'TRUE', 'x'), c(1), FALSE, '.', 'allow.loss') Error: invalid 'na.strings' argument ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c(1, 'x'), c(1), FALSE, '.', 'allow.loss') Error: invalid 'na.strings' argument ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, c(1, TRUE), c(1), FALSE, '.', 'allow.loss') Error: the first argument must be of mode character ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, environment(), 'NA', FALSE, '.', 'allow.loss') Error: the first argument must be of mode character ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, list('1'), list('1'), FALSE, '.', 'allow.loss') Error: the first argument must be of mode character ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, list('1'), list(1), FALSE, '.', 'allow.loss') Error: the first argument must be of mode character ##com.oracle.truffle.r.test.library.utils.TestTypeConvert.typeConvertExternal2Test# #.External2(utils:::C_typeconvert, list(1), list(1), FALSE, '.', 'allow.loss') Error: the first argument must be of mode character ##com.oracle.truffle.r.test.library.utils.TestUtils.testHeadNTail# #{head(letters)} [1] "a" "b" "c" "d" "e" "f" ##com.oracle.truffle.r.test.library.utils.TestUtils.testHeadNTail# #{head(letters, n = -6L)} [1] "a" "b" "c" "d" "e" "f" "g" "h" "i" "j" "k" "l" "m" "n" "o" "p" "q" "r" "s" [20] "t" ##com.oracle.truffle.r.test.library.utils.TestUtils.testHeadNTail# #{head(letters, n = 10L)} [1] "a" "b" "c" "d" "e" "f" "g" "h" "i" "j" ##com.oracle.truffle.r.test.library.utils.TestUtils.testHeadNTail# #{tail(letters)} [1] "u" "v" "w" "x" "y" "z" ##com.oracle.truffle.r.test.library.utils.TestUtils.testHeadNTail# #{tail(letters, n = -6L)} [1] "g" "h" "i" "j" "k" "l" "m" "n" "o" "p" "q" "r" "s" "t" "u" "v" "w" "x" "y" [20] "z" ##com.oracle.truffle.r.test.library.utils.TestUtils.testHeadNTail# #{tail(letters, n = 10L)} [1] "q" "r" "s" "t" "u" "v" "w" "x" "y" "z" ##com.oracle.truffle.r.test.library.utils.TestUtils.testHeadNTail# #{x<-matrix(c(1,2,3,4),2,2); head(x,1);} [,1] [,2] [1,] 1 3 ##com.oracle.truffle.r.test.library.utils.TestUtils.testHeadNTail# #{x<-matrix(c(1,2,3,4),2,2); tail(x,1);} [,1] [,2] [2,] 2 4 ##com.oracle.truffle.r.test.library.utils.TestUtils.testMethods# #testUtilsTestMethod<-function(x) UseMethod('testUtilsTestMethod'); testUtilsTestMethod.default<-function(x) x+1; testUtilsTestMethod.dog<-function(x) x+2; testUtilsTestMethod.bar<-function(x) x+3; methods(testUtilsTestMethod) [1] testUtilsTestMethod.bar testUtilsTestMethod.default [3] testUtilsTestMethod.dog see '?methods' for accessing help and source code ##com.oracle.truffle.r.test.library.utils.TestUtils.testOctSize# #.Call(utils:::C_octsize, 1.0) [1] 30 30 30 30 30 30 30 30 30 30 31 ##com.oracle.truffle.r.test.library.utils.TestUtils.testOctSize# #.Call(utils:::C_octsize, 1L) [1] 30 30 30 30 30 30 30 30 30 30 31 ##com.oracle.truffle.r.test.library.utils.TestUtils.testOctSize# #.Call(utils:::C_octsize, 2147483647) [1] 31 37 37 37 37 37 37 37 37 37 37 ##com.oracle.truffle.r.test.library.utils.TestUtils.testOctSize# #.Call(utils:::C_octsize, NA) [1] 00 00 00 00 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.library.utils.TestUtils.testOctSize# #.Call(utils:::C_octsize, NULL) [1] 00 00 00 00 00 00 00 00 00 00 00 ##com.oracle.truffle.r.test.library.utils.TestWriteTable.testTable# #write.table(data.frame(col=c(1,2,3,4), col2=c(T, F, T, F))) "col" "col2" "1" 1 TRUE "2" 2 FALSE "3" 3 TRUE "4" 4 FALSE ##com.oracle.truffle.r.test.library.utils.TestWriteTable.testValuesFormatting# #write.csv(data.frame(col=as.factor(c('m', 'm', 'f', 'm')))) "","col" "1","m" "2","m" "3","f" "4","m" ##com.oracle.truffle.r.test.library.utils.TestWriteTable.testValuesFormatting# #write.csv(data.frame(double=1231231234.5, bool=TRUE, raw=as.raw(42))) "","double","bool","raw" "1",1231231234.5,TRUE,2a ##com.oracle.truffle.r.test.parser.TestParser.testBraceUnicodeLiterals# #"\u{23}\u{9}\u{723}\u{1234}\U{23}\U{9}\U{723}\U{1234}" [1] "#\tܣሴ#\tܣሴ" ##com.oracle.truffle.r.test.parser.TestParser.testBraceUnicodeLiterals# #'\u{23}\u{9}\u{723}\u{1234}\U{23}\U{9}\U{723}\U{1234}' [1] "#\tܣሴ#\tܣሴ" ##com.oracle.truffle.r.test.parser.TestParser.testDotIdentifiers# #{ .. <- 42; cat(..); } 42 ##com.oracle.truffle.r.test.parser.TestParser.testDotIdentifiers# #{ .... <- 42; cat(....); } 42 ##com.oracle.truffle.r.test.parser.TestParser.testDotIdentifiers# #{ ...... <- 42; cat(......); } 42 ##com.oracle.truffle.r.test.parser.TestParser.testDotIdentifiers# #{ ....x <- 42; cat(....x); } 42 ##com.oracle.truffle.r.test.parser.TestParser.testDoubleLiterals# #0x0p0 [1] 0 ##com.oracle.truffle.r.test.parser.TestParser.testDoubleLiterals# #0x1.1p2 [1] 4.25 ##com.oracle.truffle.r.test.parser.TestParser.testDoubleLiterals# #0x1.aP2 [1] 6.5 ##com.oracle.truffle.r.test.parser.TestParser.testDoubleLiterals# #0x1p2 [1] 4 ##com.oracle.truffle.r.test.parser.TestParser.testDoubleLiterals# #0xa.bp1i [1] 0+21.375i ##com.oracle.truffle.r.test.parser.TestParser.testDoubleLiterals# #0xa.p2 [1] 40 ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #``(1) Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #as.symbol('')) Error: unexpected ')' in "as.symbol(''))" ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #e <- quote(b(f=1,foo)); names(e) <- c('','',''); e b(1, foo) ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #e <- quote(b(f=1,foo)); names(e) <- c('','f',''); e b(f = 1, foo) ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols#Output.IgnoreErrorMessage# #e <- quote(x <- 1); e[[2]] <- as.symbol(''); Error in as.symbol("") : attempt to use zero-length variable name ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols#Output.IgnoreErrorMessage# #f <- function(){ function('') cat(asdf=1) } Error: unexpected string constant in "f <- function(){ function(''" ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #f <- function(){ function() cat(``=1) } Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #f <- function(){ function() cat(asdf=1) } ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #f <- function(){ function(``) cat(asdf=1) } Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #f <- function(){ function(``=1) 1 } Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #f <- function(){ function(``=1) cat(``=1) } Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #names(e) Error: object 'e' not found ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #quote(``(1)) Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #quote(``:::a) Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #quote(a$'') a$"" ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #quote(a$``) Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #quote(a$b) a$b ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #quote(a:::``) Error: attempt to use zero-length variable name ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #quote(a:::a) a:::a ##com.oracle.truffle.r.test.parser.TestParser.testEmptySymbols# #quote(x <- 1) x <- 1 ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #+0xFFF [1] 4095 ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #+0xFFFFFFFFFFF [1] 1.759219e+13 ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #+0xFFFFFFFFFFFL [1] 1.759219e+13 Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #+0xFFFL [1] 4095 ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #-0xFFF [1] -4095 ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #-0xFFFFFFFFFFF [1] -1.759219e+13 ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #-0xFFFFFFFFFFFL [1] -1.759219e+13 Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #-0xFFFL [1] -4095 ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #0xFFF [1] 4095 ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #0xFFFFFFFFFFF [1] 1.759219e+13 ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #0xFFFFFFFFFFFL [1] 1.759219e+13 Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #0xFFFL [1] 4095 ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(+0xFFF) [1] "double" ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(+0xFFFFFFFFFFF) [1] "double" ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(+0xFFFFFFFFFFFL) [1] "double" Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(+0xFFFL) [1] "integer" ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(-0xFFF) [1] "double" ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(-0xFFFFFFFFFFF) [1] "double" ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(-0xFFFFFFFFFFFL) [1] "double" Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(-0xFFFL) [1] "integer" ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(0xFFF) [1] "double" ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(0xFFFFFFFFFFF) [1] "double" ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(0xFFFFFFFFFFFL) [1] "double" Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value ##com.oracle.truffle.r.test.parser.TestParser.testHexLiterals# #typeof(0xFFFL) [1] "integer" ##com.oracle.truffle.r.test.parser.TestParser.testLexerError#Output.IgnoreErrorMessage# #%0 Error: unexpected input in "%0" ##com.oracle.truffle.r.test.parser.TestParser.testNegativePow# #10^(1+1) [1] 100 ##com.oracle.truffle.r.test.parser.TestParser.testNegativePow# #10^+2 [1] 100 ##com.oracle.truffle.r.test.parser.TestParser.testNegativePow# #10^-2 [1] 0.01 ##com.oracle.truffle.r.test.parser.TestParser.testNegativePow# #10^1 [1] 10 ##com.oracle.truffle.r.test.parser.TestParser.testNegativePow# #10^1+1 [1] 11 ##com.oracle.truffle.r.test.parser.TestParser.testNegativePow# #10^1.5 [1] 31.62278 ##com.oracle.truffle.r.test.parser.TestParser.testNegativePow# #10^2^2 [1] 10000 ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesInLiterals# #"foo<<>>baraz" [1] "foo\nbar\baz" ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesInLiterals# #'foo<<>>baraz' [1] "foo\nbar\baz" ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesInLiterals# #`asdf<<>>asdf` <- 1; `asdf<<>>asdf` [1] 1 ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting#Output.IgnoreErrorMessage# #a <- 1:100; y <- 2; z <- 5; x <- (a[[{y <<>> * z}]]) Error: unexpected '*' in: " x <- (a[[{y *" ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #a <- 1:100; y <- 2; z <- 5; x <- ({(a[[y <<>> * z]])}) ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #a <- 1:100; y <- 2; z <- 5; x <- ({(a[y *<<>> z])}) ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #y <- 2; z <- 5; x <- (y <<>> * z) ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #y <- 2; z <- 5; x <- (y <<>> + z) ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #y <- 2; z <- 5; x <- (y *<<>> z) ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #y <- 2; z <- 5; x <- (y +<<>> z) ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #y <- 2; z <- 5; x <- ({(y <<>> * z)}) ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #y <- 2; z <- 5; x <- ({(y *<<>> z)}) ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting#Output.IgnoreErrorMessage# #y <- 2; z <- 5; x <- ({y <<>> * z}) Error: unexpected '*' in: " x <- ({y *" ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #y <- 2; z <- 5; x <- ({y <<>> + z}) ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #y <- 2; z <- 5; x <- ({y *<<>> z}) ##com.oracle.truffle.r.test.parser.TestParser.testNewLinesNesting# #y <- 2; z <- 5; x <- ({y +<<>> z}) ##com.oracle.truffle.r.test.parser.TestParser.testNonIntegerQualifiedWithLWarning#Ignored.OutputFormatting# #0xFFFFFFFFFFFL<<>>0xFFFFFFFFFFFL [1] 1.759219e+13 Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value [1] 1.759219e+13 Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value ##com.oracle.truffle.r.test.parser.TestParser.testNonIntegerQualifiedWithLWarning#Ignored.OutputFormatting# #0xFFFFFFFFFFFL; 0xFFFFFFFFFFFL; 0xFFFFFFFFFFFL [1] 1.759219e+13 Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value [1] 1.759219e+13 Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value [1] 1.759219e+13 Warning message: non-integer value 0xFFFFFFFFFFF qualified with L; using numeric value ##com.oracle.truffle.r.test.parser.TestParser.testNonIntegerQualifiedWithLWarning#Ignored.OutputFormatting# #123456789098765432121L<<>>123456789098765432121L [1] 1.234568e+20 Warning message: non-integer value 123456789098765432121L qualified with L; using numeric value [1] 1.234568e+20 Warning message: non-integer value 123456789098765432121L qualified with L; using numeric value ##com.oracle.truffle.r.test.parser.TestParser.testNonIntegerQualifiedWithLWarning#Ignored.OutputFormatting# #12345678909876543212L; 12345678909876543212L; 12345678909876543212L [1] 1.234568e+19 Warning message: non-integer value 12345678909876543212L qualified with L; using numeric value [1] 1.234568e+19 Warning message: non-integer value 12345678909876543212L qualified with L; using numeric value [1] 1.234568e+19 Warning message: non-integer value 12345678909876543212L qualified with L; using numeric value ##com.oracle.truffle.r.test.parser.TestParser.testOpName# #{ "%??%" <- function(x,y) x + y; 7 %??% 42 } [1] 49 ##com.oracle.truffle.r.test.parser.TestParser.testSpaceEscapeSequence# #"\ " == " " [1] TRUE ##com.oracle.truffle.r.test.parser.TestParser.testSpaceEscapeSequence# #'\ ' == ' ' [1] TRUE ##com.oracle.truffle.r.test.parser.TestParser.testUserOp# #`%!@#$^&*()%` <- function(a,b) 1; 10 %!@#$^&*()% 20 [1] 1 ##com.oracle.truffle.r.test.parser.TestParser.testUserOp# #`%5%` <- function(a,b) 1; 10 %5% 20 [1] 1 ##com.oracle.truffle.r.test.parser.TestParser.testUserOp# #`%foo%` <- function(a,b) 1; 10 %foo% 20 [1] 1 ##com.oracle.truffle.r.test.parser.TestParser.testUserOp# #`%Š%` <- function(a,b) 1; 10 %Š% 20 [1] 1 ##com.oracle.truffle.r.test.rffi.TestUserRNG.testUserRNG# #{ dyn.load("tmptest/userrng/liburand.so"); RNGkind("user"); print(RNGkind()); set.seed(4567); runif(10) } [1] "user-supplied" "Inversion" "Rejection" [1] 0.45336386 0.38848030 0.94576608 0.11726267 0.21542351 0.08672997 [7] 0.35201276 0.16919220 0.93579263 0.26084486 ##com.oracle.truffle.r.test.rng.TestRRNG.testDirectReadingSeed# #invisible(runif(1)); length(.Random.seed) [1] 626 ##com.oracle.truffle.r.test.rng.TestRRNG.testDirectReadingSeed# #set.seed(42); .Random.seed [1] 10403 624 507561766 1260545903 1362917092 -1772566379 [7] -1344458670 1072028587 -1293707536 1708789297 -1333339586 256895399 [13] 998413756 -555191411 -1047547670 -50950813 -1543487672 -1766763351 [19] 32923734 1971684063 1718493076 -1117926011 890393730 -1032174053 [25] 932479648 -1892763103 -1040205458 262148887 -1220643732 1566094973 [31] -137659622 1045161427 -1555709704 178265753 -1033943674 -1034388913 [37] -1721830332 -1749741963 -1137867598 -2065544053 866474576 458187281 [43] 1218274462 -2000447353 199687964 1107998061 590795082 -858760637 [49] -240079192 839017609 -1886488906 -1479389761 1595536628 1848478565 [55] 368165090 -1706758405 -128901632 360384001 2027084750 1372682743 [61] -1578682932 -1716686755 1324659578 1519053491 2044463192 -906549639 [67] 1851192294 -1175847633 -1083563612 -849984427 333580562 1871261035 [73] 1972555184 1756407281 1943215870 -1751074969 1282021500 -1397758131 [79] 518529450 -1421699293 488820232 -413309847 1749794070 441878687 [85] 81427028 1971206469 -1203675838 995493851 -366646944 -810597919 [91] 2006003246 1288196311 -111499476 -280946115 -4973606 75390867 [97] 1671430072 -422306215 -1145056698 -393285617 1823866628 1253337653 [103] 1712504178 1846705739 -1820069616 -990520879 247466334 -1717615033 [109] 1633935836 -246413011 1455137290 -1652210685 741252456 1555715145 [115] 197538678 -1312148609 -687362124 1153947429 286861730 568692923 [121] 1575576768 1925410241 1087549582 1279039415 -1208956788 1317778461 [127] -1306414022 257836147 1550427928 86967865 -1875779418 -520138001 [133] 1989839972 1598521365 1842848210 -1967767765 -1806646160 -1558774351 [139] -1040440386 1215776039 1529633596 -1637672179 -121023894 -992976669 [145] -1867768632 -1273940951 1167448534 786779743 -2131127020 -1987943163 [151] 563160578 1714129307 -1871376352 -1347450463 590308078 -135901545 [157] -2080269844 1678065149 -1705673574 1784846675 -871301512 1157619225 [163] 491069190 301147599 -563099196 -1769503243 -230115790 1806462987 [169] 1792100304 1913393553 35614238 -1176456185 -165968740 -27190035 [175] -1087819062 1583082947 678644776 -1957034999 760393782 778033471 [181] -636999052 757457637 -155102622 -1134562693 -1432327296 862688641 [187] 960447822 1400730999 -1343939764 -1742358563 2020046074 549674547 [193] -2039609896 1111401977 -527331994 -970823505 -779241692 -1209238571 [199] -964822382 1395462379 -170034384 -1664281231 264366206 1603506919 [205] -1702273540 398593741 -269270230 -1017124189 1029450632 -57883671 [211] 647280278 686937119 -443846700 1428836549 -1446924606 1958398811 [217] -1052543264 -1494249119 1771722670 -1095103401 972246188 258286013 [223] -1737515686 1505268499 -883376840 350445017 -1548801082 608508815 [229] -1454615420 -957455947 -913346830 527442379 5070480 -1974335151 [235] -142896418 122151367 1556997980 -1392643923 1564443530 1762940803 [241] -2059486488 -1650363447 -520885002 1934835455 -757373644 1661447845 [247] 1604991778 2071204923 -717868480 -1355580095 1725471246 -179039433 [253] -863752692 -1438942307 -762972742 1484404723 1185490072 1357252025 [259] 2083912230 789790319 -352083484 50673557 -426437806 1252893355 [265] 1090056688 -1651315407 -1847300802 -625631065 -46063428 1015857805 [271] 1696986090 -525257629 569571912 -2138041431 1476940630 1044126175 [277] -45086060 -197788539 1234368386 1489227035 -749691488 -315664095 [283] -1349383058 251890199 -1108361364 86033789 -1966965222 2084588755 [289] 272055288 104766873 -876742522 -985345713 1208721220 -408355467 [295] 346482610 -350383221 1522021712 898089233 -2087422050 1603587975 [301] -398783972 15107181 -239168438 -680623805 -1588532824 860922761 [307] -748033610 -1771805505 -331259916 -500352411 -1533811742 820114939 [313] -1804945152 -35969791 -1906397490 2139123959 277741772 2022506333 [319] -1321388422 1078120883 -1411710120 -1058724487 1071589094 -1584278481 [325] -1648603996 743551829 1457318930 -1292372885 -597481296 -1389853455 [331] 1025749502 2006806119 907256700 -259836339 2032231594 377765411 [337] -47150840 -1076157591 -424628202 1686380447 1392993620 1113942085 [343] -1178271678 -1006203173 -581139360 2049892577 433488174 377669591 [349] 1924592172 418916669 -1039261990 1002030739 158104248 -1999528615 [355] -768506554 1521633039 -177362428 -998811339 -1135665038 -260782773 [361] 1087491088 1533884625 -81126306 1619492167 -1423774500 -1109731283 [367] -43621110 -2094372093 -1687562136 -1406692535 1903470198 1834175103 [373] 284826292 1716946469 -566342494 1852413883 1593704384 -148730687 [379] 881951630 -4026697 1052939148 -1227209955 -984795334 568142707 [385] -2067553768 -503577287 -934472794 1667115503 -2072529052 -544084203 [391] 1612022994 -1916008917 -287563920 -1823613775 -968902978 -1274348505 [397] -1212094916 -681219571 212178282 513345507 1305794504 -97651927 [403] -1622291242 1367991647 829521940 -612854779 1930938626 675483803 [409] -1238947040 95299745 -1926777362 -1023949417 2064180460 -559198979 [415] 1326612378 -1041956781 -440895112 -866362087 -1278619130 172850383 [421] -1405979452 -384207627 1766332722 288732939 962208464 -1547538287 [427] 1929150750 1742727943 2017824668 1738206189 -1057557046 101192899 [433] 1380550440 669401865 -405527754 -1914703809 -339372684 1799590373 [439] -446073502 -2050295429 1806698112 852079745 -1640949682 1138388087 [445] -639506868 -656193827 2138437626 118048051 1612906712 -1008032519 [451] 1916780646 2050506671 -101326300 -2004489515 184475026 -1662396437 [457] 1596184112 -675089295 -1577550978 -843167257 -1257707268 1425235405 [463] -1066236374 1924108707 1386210952 793281257 245344662 2064476959 [469] -1555146028 456097733 -1370795582 -1220980133 -193949216 124596321 [475] -1371166034 -1037925545 -1180330068 -1443221315 42967130 -125699565 [481] -1814349768 -1063330599 759619270 -1177128305 656015236 -1588637515 [487] -2075012622 -283088693 -1961805424 1984391249 -1077172770 -1822549817 [493] -496831908 1105641389 1026573962 -1178108285 1689253352 -2041793847 [499] 591945718 1305105919 -412889036 750017957 1389714978 -2000282821 [505] -1321153216 143694913 -805475058 -645395913 615250188 308808349 [511] 276265146 -1182327053 -1934024808 913376441 1517759782 -1411377809 [517] 418827492 1391306389 542701138 1645308331 -738571024 -1035482063 [523] 84803646 -1032366169 548121532 -1930620531 -179816726 1283971939 [529] 173126984 518705833 -2124003754 382644447 1935537556 491400069 [535] 1679792770 1655264283 -285689696 -1221855199 -504340626 -2117926633 [541] -783480212 -1901800323 1833271578 -1991199789 -1030441224 358161561 [547] -1150768250 252520527 -521909692 -120001419 908872370 -336274805 [553] 1018630224 -88334319 1985448606 -1061026169 1010504988 1350456173 [559] 852645706 -1205295037 828187816 1729815177 -795779914 -1026393153 [565] 781503220 -1503073947 2135033570 1226505467 -428846080 -1875426303 [571] -1900641842 244017143 568380364 1462275677 1762769274 -1021921101 [577] 424017496 -917560199 1572035046 2115349295 -1137018972 713630293 [583] 686018322 520272747 -1273003088 1520198641 -465550082 1341531495 [589] -1385615748 1662158157 -874076246 -1511922397 866796552 1221911145 [595] 73507606 445494943 744509524 -1115121851 1297392450 -598534693 [601] -1132486816 212500449 1290261550 798572247 616512812 1617639485 [607] -537648678 -569299565 -526060104 978000985 -1695598522 1873911311 [613] 340874500 -1149876171 1737982834 695405643 353085200 417372113 [619] -346017954 -1916029881 -1735526436 1461823277 580724746 -622095869 [625] -686746776 705745481 ##com.oracle.truffle.r.test.rng.TestRRNG.testDirectSeedAssignment# #.Random.seed <- c(401, 1, 2); invisible(runif(3)) Warning message: In runif(3) : '.Random.seed' is not an integer vector but of type 'double', so ignored ##com.oracle.truffle.r.test.rng.TestRRNG.testDirectSeedAssignment# #.Random.seed <- c(401L, 1L, 2L); runif(3) [1] 0.5641106 0.2932388 0.6696743 ##com.oracle.truffle.r.test.rng.TestRRNG.testDirectSeedAssignment# #.Random.seed <- c(999, 1, 2); invisible(runif(3)) Warning message: In runif(3) : '.Random.seed' is not an integer vector but of type 'double', so ignored ##com.oracle.truffle.r.test.rng.TestRRNG.testGeneratorChange# #RNGkind('Marsaglia-Multicarry'); RNGkind('Mersenne-Twister'); set.seed(2); runif(5); [1] 0.1848823 0.7023740 0.5733263 0.1680519 0.9438393 ##com.oracle.truffle.r.test.rng.TestRRNG.testGeneratorChange# #invisible(runif(5)); RNGkind('Marsaglia-Multicarry'); set.seed(2); runif(5); [1] 0.8431527 0.5749091 0.1531976 0.3460321 0.2313936 ##com.oracle.truffle.r.test.rng.TestRRNG.testRemoveSeed#Output.IgnoreErrorContext# #{ rm(list = ls(envir = .GlobalEnv, all.names = TRUE)); .Random.seed } Error: object '.Random.seed' not found ##com.oracle.truffle.r.test.rng.TestRRNG.testRemoveSeed# #{ rm(list = ls(envir = .GlobalEnv, all.names = TRUE)); set.seed(1); .Random.seed } [1] 10403 624 -169270483 -442010614 -603558397 -222347416 [7] 1489374793 865871222 1734802815 98005428 268448037 63650722 [13] -1754793285 -2135275840 -779982911 -864886130 1880007095 463784588 [19] 1271615005 1390544442 -544608653 -251475688 -326549447 -1570483546 [25] 1965989103 -784675228 1458985493 2146317266 -1103943381 289023600 [31] -436963407 109630910 69979943 1606475068 1441346829 -662821782 [37] -381252893 -311574840 1918496297 289721302 507975775 -209037548 [43] 1665646341 -466864126 776139675 1704391200 -162823263 -1815571218 [49] 471685271 1503042540 -9316355 773770906 1304642387 1931157624 [55] -1378412519 965775622 19361743 1561398212 1879269365 1049118770 [61] 1191074315 508275152 -1006204015 -639295458 1060781575 -724498788 [67] 257177325 -1004075830 323426243 602271272 1516224009 -111500746 [73] -368663745 1624894580 -1946665755 -305830814 -779330437 1251167616 [79] -2140893311 2068936526 1520009079 -673505972 406802909 -205928710 [85] 1641613363 1751721944 454221817 -2089418906 1121694383 1689254180 [91] -1984604715 -781808494 1892940523 409525552 -1134260367 -2025809282 [97] 823270631 1407180796 1755457741 783947050 -213904221 536857992 [103] 1791983081 -1888114538 -2091016673 -1860292140 -276190523 2041495746 [109] 293352795 -2071504672 1489341281 -1448769106 -885320105 -724939092 [115] -89408579 801828698 -2096939757 1355079480 -1942710311 -1985176122 [121] -1593612913 -2123393404 -410764363 1470169330 1508641739 174702736 [127] 1980138321 1530086622 -412390457 826632540 1682639533 709842314 [133] 1047101827 -678208280 2040606153 -1020403978 2130970879 -206624972 [139] 796133541 -318747358 441089595 1414206528 1684436801 291294222 [145] 1773804855 985411596 -953215587 -93698118 880402931 403064472 [151] -717996103 -1580438490 1582729327 2024268772 149426581 -61889198 [157] -1132557141 -349809680 -1813747919 1851072318 -872535385 1834590908 [163] -1060709235 1425982954 -973382045 -1401381816 -657666647 -803519146 [169] 1303503839 602197140 690968197 -1194194558 -1271974117 -424247392 [175] -2076224735 1896824430 -1915841513 -1610038932 1514233725 -139472870 [181] 359986899 369450488 1175050137 1835887238 -1718805681 1001447748 [187] -1453795467 -158697038 -289178229 -1653172400 -1258931439 -1522652770 [193] -1534961273 -1267430372 -124936595 -656382390 1999481667 1820822440 [199] 1447714185 1037425590 1008676543 -384359948 -164391835 1513879010 [205] 1130520571 1419877120 -1790435583 1398071502 -349144329 1191707340 [211] 1281005917 1471383674 -517178445 244983128 -1431478407 -634939162 [217] 1298079279 -404582748 -1068593835 -1989575150 -487399829 -265123152 [223] 1949564657 -1333369858 -1833961369 1592665468 1108824141 1812739754 [229] 1530423331 1368926984 1007803753 -537550314 1929636255 916334420 [235] -336018875 1515590210 -937690917 -1562089888 1886968545 247837486 [241] -1852321321 504493100 -235748547 -695373606 1859678355 832347320 [247] 1259788121 563279686 1350865167 -963318780 -2126433483 67416690 [253] 658812747 -1640878576 1754641105 214290014 339674951 1897819868 [259] -1881411027 1352283914 -1756130045 25328232 1343966537 -703424394 [265] -149416833 735173812 -1678319579 1312317090 -560725573 -1034493504 [271] -355891519 -973490802 -323184457 -1082223220 1535237405 -1135244998 [277] -1313811085 451200024 -348242119 -918059610 1437955055 1293941092 [283] 1537788181 -1049356590 -437194709 1313702256 622024369 43280574 [289] 48727591 -1688377284 -1873574899 1419929450 1823945187 -1910605368 [295] -731992791 -1950040362 -1458327713 336216596 -744100347 -688203006 [301] -1090356581 -1882125024 -718134623 1737025518 -1000943721 1906697964 [307] 1434445565 -584855142 -1192383917 -766862472 -887384295 -1562557434 [313] -341195057 484161220 -84062475 684698418 -449863413 -1822653232 [319] 950332049 -1500892386 -1805552377 973279644 -1376385555 -767768630 [325] 949698243 1967401256 -2032927479 -1197206218 1169078847 1721718644 [331] -1669469211 -1581938846 1033855867 -735385472 -55923071 -1374991794 [337] 1008629367 652208204 1751441629 -1726985734 -1345917133 -878304552 [343] -1499013383 -873713050 2098825647 52438052 1186383061 -1389400174 [349] -2026323477 -331925456 776105585 -650171010 1516557287 1432840956 [355] 255555533 -1350477782 1949809571 -1597273976 -1586283287 1615371158 [361] 1705063711 -957801260 1006033349 1736467394 -895304613 1144812512 [367] 707471969 538500270 -741634729 2105842092 -660026691 -600640934 [373] -579558381 -422618568 -1244129575 -1374924602 1354546319 -112901756 [379] 1649224373 -844405774 -901492021 -1011508336 -1931222447 1196120030 [385] 1118413511 -1578994596 -1768171091 1585977482 -1262180221 1720489960 [391] -634098487 -766881290 2107842559 71275060 864597925 -311201758 [397] 1917093179 -2132955328 581670465 273260302 1729500215 -1075053812 [403] -1497127779 514050746 -1523660557 1872642456 -1398325575 -19554522 [409] -1991549073 614665956 -1388805995 358320210 1217024939 1890561776 [415] -679393743 1766240830 -1763188313 2144087484 -493933683 -580318998 [421] -1418066589 -2007017656 1661963433 -1438566314 -563316001 435861396 [427] 1084982661 78032002 -591610341 384211616 -1490816479 -1657433746 [433] 766905111 -462549908 -1892848003 1685771034 -2043847213 501930232 [439] -1156819303 -1075831418 628978255 -695104444 -1024407947 458742962 [445] 943899787 905802320 -1928160751 -2083963746 -52981625 -75720932 [451] 1301114221 -1237571254 630182467 874235560 -369320823 -809152842 [457] -1263188545 796036340 1557611365 -1976428318 1313040123 2133800448 [463] 1955347969 -1317751858 -1151110665 -1922904628 173942877 1037044602 [469] 464020147 361570392 -1929421191 1053019110 718127 -1939293788 [475] 2062416981 -2101845742 1806017899 1115088304 680517105 -1486162178 [481] 1982902119 -850677636 -301031603 -15107670 205393699 60417544 [487] -1728865175 1986958614 154501279 -1744891308 -1115426491 1731048770 [493] -1492090917 512721248 1138522593 60753454 -2733865 153239340 [499] 1288557117 -960793638 483907475 -430106696 1249400409 353937990 [505] -810817521 -276785404 -391634379 -90892942 1357575755 -1326184176 [511] 552669649 -1329340066 1621835335 1502706140 -1769291475 1511586314 [517] 1690090499 -55462552 367823945 500501366 -1062917249 -755480652 [523] -735473883 -1867415134 1666975931 1172274368 -905140799 374114446 [529] 1187418039 1376018572 1190423581 -1487598534 1559477363 -1942831336 [535] -1754317255 678869158 655903471 -718199708 1536636949 1040579026 [541] -229984469 -2008228752 -382847567 1215036350 1979661607 -1331301572 [547] -713436403 -179131798 1346623715 -1858390840 -2099286999 -1852788266 [553] -1682160033 -1950995180 1312824581 131431938 -1688338021 838281248 [559] -1206599263 940915438 938231447 241250796 -1521879555 330618010 [565] -885780141 1860572792 -1814292967 -1435109626 1963466191 1053974980 [571] 1597193717 337841714 -167974901 -1151770672 -264287855 -486848994 [577] -874206201 -1897849700 -179055379 -1965126966 202073539 -1626446808 [583] 2110012425 -382105546 926077247 -1718566284 356489957 -642667934 [589] 55470715 195986304 -1158886015 -2087641778 -687903369 -1869565108 [595] -800690211 -873280262 1926288947 1649352152 -608772615 414082406 [601] 70475951 1505513252 -1158401067 1342460562 -1640396565 686920496 [607] -1591980687 -1056325506 -736916761 1553659388 -57620787 1624546090 [613] -246717789 1879262088 546503657 -2006479210 197184543 -2095148 [619] 1319110853 526255810 -345685157 -404910368 2072824161 -547868754 [625] -2085092265 -689249108 ##com.oracle.truffle.r.test.rng.TestRRNG.testRemoveSeed# #{ set.seed(1); rm(list = ls(envir = .GlobalEnv, all.names = TRUE)); set.seed(2); .Random.seed } [1] 10403 624 -1619336578 -714750745 -765106180 158863565 [7] -1093870294 242367651 -1691232888 -1538791959 438890646 -141146593 [13] 721730004 1779208901 575310018 -949789349 329933024 -952437919 [19] 2079445422 1509473879 1815205548 41657277 -401623206 1480549651 [25] 1207494456 759627737 -592321082 -1461318257 -59236732 1681990581 [31] -1162950414 656225227 30328976 -1151997103 1276218590 1527976903 [37] -99684004 -241896787 -146399862 -1339053693 726230248 -926050871 [43] -754637066 1695592703 2019143476 -1662324571 -2030037726 826648123 [49] -1536025536 -1760567487 -1521675250 1556858167 1835513868 -1737294435 [55] -393015366 -985003533 -927052136 -1191532615 -2097826778 218968175 [61] 1333029860 -174524011 1774284114 -272386901 -1534108688 1785188145 [67] 1238853438 2029638311 1650928316 881116301 -1864790550 -1739225501 [73] -625826744 -676514391 -1223258794 1335004127 -1252830060 -1013301627 [79] -1237986942 1983799067 971081632 1427946273 1487111790 -818660329 [85] -805811860 1861830525 -843278310 -338092333 37840376 -2038153319 [91] -1363496314 420987727 272722244 -1073889419 1616921010 1377609099 [97] -622616752 1991090961 2103734686 -187563641 -1211755492 1287620205 [103] -1247859126 -1273244861 2001048488 -1629567607 1307911094 64214719 [109] -1454790156 -141394843 755219938 -91912197 -321871104 -564558079 [115] 546121934 1693065975 -700740916 512131421 -945532806 -2027641933 [121] -1202049704 1641793401 1301864678 -943864273 1547114148 -1159236267 [127] -509393390 1080034923 1940099760 2065655537 -1756320770 -262954905 [133] 1384361340 1891448909 464453290 213553187 987378440 1750746473 [139] 1798892054 -1433628257 1200926548 -1907643835 1954667074 -1101848357 [145] -1038651808 197018337 1403124526 765819351 1854503980 -74273987 [151] -1839056678 1852086419 450929848 -1829159079 -1725415610 -273204977 [157] 2091742212 432937781 1017281138 1220925259 698824208 246749905 [163] 338957918 -382292153 922220252 -1829381587 86048522 -949371645 [169] -884440472 -99109559 779739254 1215609983 -1349753676 423479333 [175] 566765218 1574906299 -1433540160 -1304236351 343539086 -1793179465 [181] 859446668 378914077 1980649786 -1798242957 -978531304 -573266119 [187] 385928614 1136401391 -419659420 1277800725 -864690478 -1786374101 [193] -1547269776 -999899471 1017557182 -1187828185 360378428 1642163213 [199] 1074605930 627136995 979927496 -1777396439 55576278 -1102817441 [205] 747162132 1709233669 -705780990 291611291 -2096360160 -1562408287 [211] 1370304494 1661761431 1789226732 1007144701 1187027354 161600083 [217] -1063869576 -2107244775 -1732604922 1384410831 1014775492 -42846475 [223] -130714830 -321337077 1960414416 724325009 624982814 -1778311929 [229] 1248106908 1207430637 646680522 -2082904381 101855528 -96967415 [235] -1588372170 -927768001 903995252 2108478437 1041059682 -1391293573 [241] 342487168 -1433659775 -975990194 -1154998665 119763020 -194983715 [247] 1687228922 -133228749 2138450648 1017464569 1005419110 -2033700433 [253] 1250208804 354397397 855193490 -1326061077 465059888 -839002511 [259] -1365674626 291011559 -569576708 1806786509 -1632362454 1544151971 [265] 404590728 1619764457 203154326 7986463 1861199060 -1508261435 [271] 322710466 -1591090085 327121888 -1841261983 -142269266 489239895 [277] -1492377172 -2078756163 -1147684262 -1487877101 -500997576 1149927129 [283] 1781635270 658465935 174967172 -1230368075 -69653518 -535463221 [289] 54174608 869485137 -2058772514 418466503 -2067006372 -1350188627 [295] 446619786 1126879363 -966615064 2130760905 -1824417290 -632305665 [301] -1492510156 1621073829 445855778 -102781637 556054336 519372353 [307] 962193166 1690811447 -1799912692 -341341027 -1007906118 2057236723 [313] 880167320 1309517497 -652286170 1453459311 -1584425244 1099524245 [319] -571649966 342850475 -2110212368 -542855631 568916542 -159151705 [325] -1627802180 -1309863027 -1738288918 -361484957 -759603384 -2020608855 [331] -765689770 -1494408481 -645316716 1790340485 623539330 1600906779 [337] -902716768 295787041 -1444292242 -910445801 -964848532 -410691971 [343] -2119722214 -248412717 776397048 -1993949543 -1974639226 329783887 [349] 1631720516 1362472565 1884136626 -2076447605 -611681712 1349124625 [355] -921729890 1338456199 955129628 -849390227 -1575292598 522058307 [361] 1794756264 674301065 -1325099338 -1828065857 767890676 -1110037659 [367] 270131426 369528571 -2021769728 658351617 869071822 -541255177 [373] -558475828 -265678755 -2065640582 -1505719629 -210950056 -1580349831 [379] -883616794 956931375 -958578268 -1121524651 1444030738 28495211 [385] 1040706992 18564593 -1957347586 645158759 184629372 408192845 [391] 1306280362 -899664093 687599112 -1965292439 1657920790 -1487001441 [397] -149579180 -1888036539 -998671038 -35149861 -1109227168 415359457 [403] -1919201746 -1769738025 733595436 973978173 -374326310 1359216531 [409] 331423672 -1074086311 902689350 2105446415 2075729668 -1730868683 [415] 1045618034 -83091893 -997650160 1756395985 1163012446 -666704313 [421] 2039153116 1698998573 1035977226 -244128765 311934312 1435038793 [427] 1734103926 -928918657 -1261252684 1360033573 929122722 -1824051013 [433] -1103723328 -1692004927 971821198 969422775 -1478498164 -1247259619 [439] 1479398458 -994843533 -1961179368 -2019187143 -1353711450 1941893871 [445] 1429056612 867704853 -467156526 2055200555 1978000496 -98460239 [451] -1617017922 518710567 -1797031108 1118288653 -1612877206 -1248984861 [457] -1717224248 -1439706071 -1975780906 -1215500705 307541268 -1340406523 [463] 1776895490 -295884389 -984469472 1600268705 -2024176914 1900146327 [469] -109004308 259120637 74554522 -259507885 -1051582856 415661593 [475] 1769160454 -1971141169 1418914244 424158709 245945906 642125835 [481] 1156999120 610709905 248614430 270816263 425895068 -84558611 [487] 776819402 1407815107 -1677956056 650683401 -485961674 282556735 [493] -420263308 -1777433883 1764323938 -1017015685 -66221184 309212545 [499] -1871092402 1084822903 1928608588 -1344120867 -1366059782 -541524429 [505] -1975573032 257246713 -506483354 209848495 -1488922844 285023189 [511] -1863443822 1083617515 278043440 1383576945 -746321794 497496807 [517] 1868594684 -1801015603 791110442 633178787 1668631432 -448044055 [523] -715467114 1295610911 906399700 677572805 1312411330 1653369691 [529] 2000721632 1564619105 1004828590 129346647 311585964 -1150172739 [535] -1565803174 -1182911725 632937784 -2092302887 -503493690 544521103 [541] -1500547964 508494261 1242533618 -1482047029 -1550680432 -347297455 [547] -95571234 355172807 -1422588068 -768438099 1954784138 -1606289533 [553] -1511531800 2075136969 281677046 -1049960705 786859316 -930066779 [559] 1043487522 -1206537157 935547456 -455729855 1009957390 -2111851721 [565] -2102178292 311958429 -1194191430 -1055926285 1067074712 144483769 [571] 2140412454 -921510289 -673791516 -2135566443 623194962 -709410133 [577] -1261563408 1373474097 1539738942 543768743 -1925693252 840000141 [583] 1551504362 1420743779 -2060707256 -68242519 -1863421098 -1641825825 [589] 753609364 336501893 1781208962 1278569755 711835040 1243740449 [595] 268184686 -945870313 430890860 1372415357 1428069914 1436937427 [601] -273130504 -1354416743 472651910 -451645105 -328286396 -1280729739 [607] 424085426 -520670325 -417508016 -450731759 -1668900962 -988254329 [613] -2117981668 -289725331 -786254774 -264494781 -1894119000 -201374839 [619] -1654650442 -266599233 -1217626124 -464135579 255591394 1126405627 [625] 672651520 706594049 ##com.oracle.truffle.r.test.rng.TestRRNG.testRemoveSeed#Ignored.ImplementationError# #{ set.seed(1); rm(list = ls(envir = .GlobalEnv, all.names = TRUE)); set.seed(2, sample.kind='Rejection'); sample(1:10, 3); .Random.seed } [1] 10403 4 241038711 -724551010 -982165160 -1828904773 [7] 1219649113 639708648 -249104362 -1532738671 -205493181 1178813266 [13] 334776292 619230759 -943223171 845950836 574669658 1135228325 [19] 1324937663 -225314234 -259712816 1901458163 760603665 1517777472 [25] -353409506 333918441 1007243803 1823191594 -1096755892 2047555343 [31] 36174405 -1271550980 -709741998 1365872589 667289991 -2093876114 [37] 2061812808 1112530507 -120106071 -226796808 147205670 833570625 [43] 791874771 -1221193598 282619572 -321910217 -1307274963 1192534596 [49] -516456598 -1233040427 -1928163985 1129724022 1863340960 -338181021 [55] -448311039 -256091024 -2016258034 -559437703 1778395147 -1105262278 [61] 166402108 -19181697 426083541 1074993388 1545622082 1292039581 [67] 1261006871 -194927234 -601294024 -1892334565 -1536975495 -1797657656 [73] -38799370 1610275377 239717475 -604261326 -536620668 845797319 [79] 1754618525 1214392852 -1429288774 586749189 -1730887969 587875174 [85] -904748304 672121363 -54498383 1480726112 1623135230 2031094665 [91] -2039817029 -1814243190 -1606497428 -1824984849 -1596875995 -880638500 [97] 1951458226 1469794989 1610621543 -1477541490 -315013528 -1967721877 [103] -2085860343 156693144 965051846 -932641503 1197057459 -1633947358 [109] -309015788 -1219595369 -1463256179 -785873244 -421959542 -1062695179 [115] -336916145 999251542 -2076424960 -262791101 -952249375 860711760 [121] 2101607854 166400857 -1620321941 225362138 1630562716 -1517587041 [127] -1274951691 265766540 -1931087006 1167170365 -2085811273 503398494 [133] -65790568 909314299 -1730128743 268399912 374625238 -1757951919 [139] 892390147 1181977234 493131812 -1682069785 -1504339139 -947600460 [145] -1030189030 1675588453 678678015 -1797865338 1334660112 -1283674445 [151] -82739887 -1505405696 1111932894 941079593 1318247387 -609132310 [157] -295719284 245051855 2080408965 976559676 1455584018 875057165 [163] 361124679 1824041262 1956921480 2124596619 950263145 -417919176 [169] -157584922 -269556351 2084387091 677148354 -586485388 1869613431 [175] 2130049645 -1030736636 1083969578 1863962005 1177604655 -313319626 [181] -1012932768 1623303587 -1291219263 -269605200 -973897266 402289977 [187] -327653045 -1236116742 83024892 -1227580353 1307051285 2097704492 [193] -281709822 880299997 -911979817 1624294846 -472252424 804961243 [199] 1277638201 77242248 -1010671818 347512177 -745572445 -1174651150 [205] 79554116 920340743 883691741 -303516204 2077157626 1905365061 [211] 1215936671 -766516698 1646868144 -1075389613 1488991857 -1584825440 [217] 914451262 -1652559287 7775995 -1859905846 1414457388 -512053201 [223] 528011493 -855590500 1758151666 496778861 -785667161 1294308814 [229] -1863417048 488125074 1278490912 -2038677044 921281248 404484290 [235] -613405656 -1412032596 58366652 -322515982 -909986256 1505804196 [241] -1465512520 -1523693734 -152006512 1641118588 -527245036 1018198338 [247] 1470021888 -1891758660 -166731440 816011554 -1071916472 -1884475380 [253] -2141170084 628476370 -304482816 -209914540 -973247256 1433092346 [259] 1704011472 -88847572 -1111912204 681318802 1950203232 1995049996 [265] -352142112 -19226014 1800340648 1068629068 -1146415236 1722620210 [271] 1051349616 1499976516 2096690136 -908721286 -1870100432 -223252548 [277] 1837474388 -791064510 -1980305760 503440060 278547408 -799040158 [283] 2049662696 -2098938676 1559892476 401391090 1461519488 1215711732 [289] 2117753480 465652538 -1788670640 1581624428 -2084002412 107348050 [295] 1291615712 -15092532 1774034592 -1379708542 1626781928 -1372914964 [301] -1229085380 50352242 2115818096 -1332639196 -1541728200 1949935898 [307] -485931824 -1600845508 -836607084 -115148926 -951219264 -802585028 [313] -1778278000 -800122846 -1441028856 1886967948 -2133061860 -1466141550 [319] 1088673152 -1591570412 1709315880 -265951686 1774973392 992754028 [325] -1771736140 741460498 1272719328 -2073695796 1350154464 -360575966 [331] -1020734680 1430329868 607814460 1439473650 673624816 -930342332 [337] 1721134680 -1136879814 754839536 -2048417092 711103764 -1422336830 [343] -635491232 -752929412 1842204624 -2112134878 -476981592 1306720140 [349] -1199999812 -1488123086 -1770289600 217404596 1421263944 -1870264902 [355] -247698928 -1869415188 -97091244 -761236718 -930673248 -915866932 [361] -1155319200 -2141052990 -546098392 1085725100 282357052 2101099378 [367] -730301136 517703460 1361823032 -1078728998 1901264784 -1379681540 [373] -2101163116 1778623554 1593718016 909891644 2056453456 -1631849310 [379] 1674128200 1630019340 -7569700 630968146 1113634432 -245606316 [385] -1759632408 2041191162 -267942576 1396895532 -1593138316 862483346 [391] -796917152 551139212 -490440864 1238053858 1840294824 -1928217396 [397] 828193276 503416754 -811133456 -2080655932 -1172813480 2016959866 [403] 282688944 356578236 -350773164 1927860162 484069408 -897625924 [409] -432780720 -370182174 1213849192 -131133876 -2103951108 -1286535182 [415] 316466432 1723224948 1535381512 1866535354 -937316912 -1812925460 [421] -1613583468 -679760942 -1050605728 -1433263796 -1674153696 2139692930 [427] -1178417432 -1716832020 -449440196 -935341198 693573232 1537647652 [433] -499056840 1750759578 1745100496 1747000508 -1303573868 611275394 [439] 1763614912 665081148 1698478224 258487842 1096725000 471317772 [445] 497767068 845497874 1964198272 1857821204 1164103208 1354232122 [451] 461208528 1656421996 -439921868 -557509998 -1897257632 -600040116 [457] -788043687 153732555 1152550460 2143549546 -1726037345 -1350267095 [463] 99627966 1641251500 444559357 -898730169 -1201080272 -1805233842 [469] 2073958779 -188195107 -1063397622 -2143556056 -371460463 1663524483 [475] 326623108 -1673095758 -1525679353 -951078575 92702934 -1575262796 [481] -1370611259 -357486321 1650880392 -917750106 -250007981 850890677 [487] 1246248210 -1337481504 -487523511 1169806715 -1484193716 -663021094 [493] 752178127 534494617 -2029419090 -978464068 -1231899859 915857623 [499] -1606686432 1166208638 1194301515 -943635891 73769082 681193656 [505] 242958945 -1190053869 -1052223948 54140994 19505239 1918653345 [511] 2074563686 1421040740 -1478502507 2128543935 -1616027560 1233806454 [517] -2003129213 -1024410427 -711730718 -1301151664 -1379204743 642848427 [523] 9289244 1925110090 553294143 1206542217 107249566 -1927418292 [529] -1263929315 1676601767 709094608 -1387123090 -259393253 -1302553987 [535] 1696768106 -1661039352 1636743601 -1212994013 421227300 -2059002926 [541] 106965031 -1893965199 -89880394 -787140524 1144164581 1036324079 [547] 1925177384 1886950534 3415731 327819285 -1308331406 -996761920 [553] -924749015 1136206235 1037579884 118159994 1472371631 -1674445127 [559] -800886578 2145069596 -22077043 1983901687 1351316224 667928926 [565] 1819814443 815064365 2087254426 1974450008 914243265 -439017101 [571] 1855908500 103198498 1531525687 -1325183231 -30284282 -501318588 [577] 1454079349 -1147617057 -2050407368 1378542614 1350960163 -553557019 [583] 600647170 -123696016 912235033 -2131741685 527537916 -313086166 [589] 325968223 -362366743 -5971970 98743276 -1054574787 -746165497 [595] -1541627152 503097998 241034427 1541255325 505019466 -1256266136 [601] -1532392879 283654467 -1648799676 212181746 1583844039 795519121 [607] -933546474 -1945971596 -838709499 203685199 181985096 -671140122 [613] -1744881645 -1734942859 -1303097518 -427317344 -744529271 -1641019717 [619] -1042348788 -1183692646 -1561760241 707701337 898156270 626447740 [625] -1844980243 1367433108 ##com.oracle.truffle.r.test.rng.TestRRNG.testRemoveSeed#Ignored.ImplementationError# #{ set.seed(1); rm(list = ls(envir = .GlobalEnv, all.names = TRUE)); set.seed(2, sample.kind='Rounding'); sample(1:10, 3); .Random.seed } [1] 403 3 241038711 -724551010 -982165160 -1828904773 [7] 1219649113 639708648 -249104362 -1532738671 -205493181 1178813266 [13] 334776292 619230759 -943223171 845950836 574669658 1135228325 [19] 1324937663 -225314234 -259712816 1901458163 760603665 1517777472 [25] -353409506 333918441 1007243803 1823191594 -1096755892 2047555343 [31] 36174405 -1271550980 -709741998 1365872589 667289991 -2093876114 [37] 2061812808 1112530507 -120106071 -226796808 147205670 833570625 [43] 791874771 -1221193598 282619572 -321910217 -1307274963 1192534596 [49] -516456598 -1233040427 -1928163985 1129724022 1863340960 -338181021 [55] -448311039 -256091024 -2016258034 -559437703 1778395147 -1105262278 [61] 166402108 -19181697 426083541 1074993388 1545622082 1292039581 [67] 1261006871 -194927234 -601294024 -1892334565 -1536975495 -1797657656 [73] -38799370 1610275377 239717475 -604261326 -536620668 845797319 [79] 1754618525 1214392852 -1429288774 586749189 -1730887969 587875174 [85] -904748304 672121363 -54498383 1480726112 1623135230 2031094665 [91] -2039817029 -1814243190 -1606497428 -1824984849 -1596875995 -880638500 [97] 1951458226 1469794989 1610621543 -1477541490 -315013528 -1967721877 [103] -2085860343 156693144 965051846 -932641503 1197057459 -1633947358 [109] -309015788 -1219595369 -1463256179 -785873244 -421959542 -1062695179 [115] -336916145 999251542 -2076424960 -262791101 -952249375 860711760 [121] 2101607854 166400857 -1620321941 225362138 1630562716 -1517587041 [127] -1274951691 265766540 -1931087006 1167170365 -2085811273 503398494 [133] -65790568 909314299 -1730128743 268399912 374625238 -1757951919 [139] 892390147 1181977234 493131812 -1682069785 -1504339139 -947600460 [145] -1030189030 1675588453 678678015 -1797865338 1334660112 -1283674445 [151] -82739887 -1505405696 1111932894 941079593 1318247387 -609132310 [157] -295719284 245051855 2080408965 976559676 1455584018 875057165 [163] 361124679 1824041262 1956921480 2124596619 950263145 -417919176 [169] -157584922 -269556351 2084387091 677148354 -586485388 1869613431 [175] 2130049645 -1030736636 1083969578 1863962005 1177604655 -313319626 [181] -1012932768 1623303587 -1291219263 -269605200 -973897266 402289977 [187] -327653045 -1236116742 83024892 -1227580353 1307051285 2097704492 [193] -281709822 880299997 -911979817 1624294846 -472252424 804961243 [199] 1277638201 77242248 -1010671818 347512177 -745572445 -1174651150 [205] 79554116 920340743 883691741 -303516204 2077157626 1905365061 [211] 1215936671 -766516698 1646868144 -1075389613 1488991857 -1584825440 [217] 914451262 -1652559287 7775995 -1859905846 1414457388 -512053201 [223] 528011493 -855590500 1758151666 496778861 -785667161 1294308814 [229] -1863417048 488125074 1278490912 -2038677044 921281248 404484290 [235] -613405656 -1412032596 58366652 -322515982 -909986256 1505804196 [241] -1465512520 -1523693734 -152006512 1641118588 -527245036 1018198338 [247] 1470021888 -1891758660 -166731440 816011554 -1071916472 -1884475380 [253] -2141170084 628476370 -304482816 -209914540 -973247256 1433092346 [259] 1704011472 -88847572 -1111912204 681318802 1950203232 1995049996 [265] -352142112 -19226014 1800340648 1068629068 -1146415236 1722620210 [271] 1051349616 1499976516 2096690136 -908721286 -1870100432 -223252548 [277] 1837474388 -791064510 -1980305760 503440060 278547408 -799040158 [283] 2049662696 -2098938676 1559892476 401391090 1461519488 1215711732 [289] 2117753480 465652538 -1788670640 1581624428 -2084002412 107348050 [295] 1291615712 -15092532 1774034592 -1379708542 1626781928 -1372914964 [301] -1229085380 50352242 2115818096 -1332639196 -1541728200 1949935898 [307] -485931824 -1600845508 -836607084 -115148926 -951219264 -802585028 [313] -1778278000 -800122846 -1441028856 1886967948 -2133061860 -1466141550 [319] 1088673152 -1591570412 1709315880 -265951686 1774973392 992754028 [325] -1771736140 741460498 1272719328 -2073695796 1350154464 -360575966 [331] -1020734680 1430329868 607814460 1439473650 673624816 -930342332 [337] 1721134680 -1136879814 754839536 -2048417092 711103764 -1422336830 [343] -635491232 -752929412 1842204624 -2112134878 -476981592 1306720140 [349] -1199999812 -1488123086 -1770289600 217404596 1421263944 -1870264902 [355] -247698928 -1869415188 -97091244 -761236718 -930673248 -915866932 [361] -1155319200 -2141052990 -546098392 1085725100 282357052 2101099378 [367] -730301136 517703460 1361823032 -1078728998 1901264784 -1379681540 [373] -2101163116 1778623554 1593718016 909891644 2056453456 -1631849310 [379] 1674128200 1630019340 -7569700 630968146 1113634432 -245606316 [385] -1759632408 2041191162 -267942576 1396895532 -1593138316 862483346 [391] -796917152 551139212 -490440864 1238053858 1840294824 -1928217396 [397] 828193276 503416754 -811133456 -2080655932 -1172813480 2016959866 [403] 282688944 356578236 -350773164 1927860162 484069408 -897625924 [409] -432780720 -370182174 1213849192 -131133876 -2103951108 -1286535182 [415] 316466432 1723224948 1535381512 1866535354 -937316912 -1812925460 [421] -1613583468 -679760942 -1050605728 -1433263796 -1674153696 2139692930 [427] -1178417432 -1716832020 -449440196 -935341198 693573232 1537647652 [433] -499056840 1750759578 1745100496 1747000508 -1303573868 611275394 [439] 1763614912 665081148 1698478224 258487842 1096725000 471317772 [445] 497767068 845497874 1964198272 1857821204 1164103208 1354232122 [451] 461208528 1656421996 -439921868 -557509998 -1897257632 -600040116 [457] -788043687 153732555 1152550460 2143549546 -1726037345 -1350267095 [463] 99627966 1641251500 444559357 -898730169 -1201080272 -1805233842 [469] 2073958779 -188195107 -1063397622 -2143556056 -371460463 1663524483 [475] 326623108 -1673095758 -1525679353 -951078575 92702934 -1575262796 [481] -1370611259 -357486321 1650880392 -917750106 -250007981 850890677 [487] 1246248210 -1337481504 -487523511 1169806715 -1484193716 -663021094 [493] 752178127 534494617 -2029419090 -978464068 -1231899859 915857623 [499] -1606686432 1166208638 1194301515 -943635891 73769082 681193656 [505] 242958945 -1190053869 -1052223948 54140994 19505239 1918653345 [511] 2074563686 1421040740 -1478502507 2128543935 -1616027560 1233806454 [517] -2003129213 -1024410427 -711730718 -1301151664 -1379204743 642848427 [523] 9289244 1925110090 553294143 1206542217 107249566 -1927418292 [529] -1263929315 1676601767 709094608 -1387123090 -259393253 -1302553987 [535] 1696768106 -1661039352 1636743601 -1212994013 421227300 -2059002926 [541] 106965031 -1893965199 -89880394 -787140524 1144164581 1036324079 [547] 1925177384 1886950534 3415731 327819285 -1308331406 -996761920 [553] -924749015 1136206235 1037579884 118159994 1472371631 -1674445127 [559] -800886578 2145069596 -22077043 1983901687 1351316224 667928926 [565] 1819814443 815064365 2087254426 1974450008 914243265 -439017101 [571] 1855908500 103198498 1531525687 -1325183231 -30284282 -501318588 [577] 1454079349 -1147617057 -2050407368 1378542614 1350960163 -553557019 [583] 600647170 -123696016 912235033 -2131741685 527537916 -313086166 [589] 325968223 -362366743 -5971970 98743276 -1054574787 -746165497 [595] -1541627152 503097998 241034427 1541255325 505019466 -1256266136 [601] -1532392879 283654467 -1648799676 212181746 1583844039 795519121 [607] -933546474 -1945971596 -838709499 203685199 181985096 -671140122 [613] -1744881645 -1734942859 -1303097518 -427317344 -744529271 -1641019717 [619] -1042348788 -1183692646 -1561760241 707701337 898156270 626447740 [625] -1844980243 1367433108 Warning message: In set.seed(2, sample.kind = "Rounding") : non-uniform 'Rounding' sampler used